From 041fc9514a2aee0d9e4ce6d2602aa4f63fc77a42 Mon Sep 17 00:00:00 2001 From: martinbruckner Date: Tue, 23 Jul 2019 15:12:33 +0000 Subject: [PATCH] make index --- fabio_SPA.R | 42 +- input/index.csv | 34958 +++++++++++++++++++++++++++++++++++++++++ input/items_exio.csv | 201 + 3 files changed, 35193 insertions(+), 8 deletions(-) create mode 100644 input/index.csv create mode 100644 input/items_exio.csv diff --git a/fabio_SPA.R b/fabio_SPA.R index 348ac3a..90068eb 100644 --- a/fabio_SPA.R +++ b/fabio_SPA.R @@ -9,26 +9,39 @@ exiopath <- "/home/bruckner/wu_share/WU/Projekte/GRU/04_Daten/MRIO/IO data/EXIOB library(Matrix) countries <- readODS::read_ods("./input/fabio-exiobase.ods", sheet = 3) -# countries_exio <- read.csv2("./input/Regions_FAO-EXIO.csv", stringsAsFactors = FALSE) +countries_exio <- read.csv2("./input/Regions_FAO-EXIO.csv", stringsAsFactors = FALSE) +countries_exio <- unique(countries_exio[,-(1:2)]) +countries_exio$EXIOcode <- as.integer(countries_exio$EXIOcode) +countries_exio <- countries_exio[is.finite(countries_exio$EXIOcode),] +countries_exio <- countries_exio[order(countries_exio$EXIOcode),] items <- read.csv2("./input/Items.csv", stringsAsFactors = FALSE) +items_exio <- read.csv2("./input/items_exio.csv", stringsAsFactors = FALSE) index <- rbind(data.frame(country = rep(countries$ISO, each=130), item = rep(items$Item, 192), model = "fabio"), data.frame(country = as.character(rep(1:49, each=200)), item = as.character(rep(1:200, 49)), model = "exio")) +index <- rbind(data.frame(country = rep(countries$Country, each=130), + ISO = rep(countries$ISO, each=130), + item = rep(items$Item, 192), + model = "fabio"), + data.frame(country = rep(countries_exio$EXIOregion, each=200), + ISO = rep(countries_exio$EXIO2digit, each=200), + item = rep(items_exio$Item, 49), + model = "exio")) agg <- function(x) { x <- as.matrix(x) %*% sapply(unique(colnames(x)),"==",colnames(x)) return(x) } -get_L2 <- function(fname, aL0, aL1, A, L1, cutoff){ - if(A[aL1,aL0] < cutoff) return(0) - temp <- (extension * A)[,aL1] * A[aL1,aL0] * Y[aL0,country] - temp <- data.frame(country = unique(class.col$Country)[country], L0 = aL0, L1 = aL1, L2 = 1:length(temp), L3 = 0, value = temp) - try(fwrite(temp[abs(temp$value) > cutoff, ], file = fname, row.names = FALSE, col.names = FALSE, append = TRUE)) -} +# get_L2 <- function(fname, aL0, aL1, A, L1, cutoff){ +# if(A[aL1,aL0] < cutoff) return(0) +# temp <- (extension * A)[,aL1] * A[aL1,aL0] * Y[aL0,country] +# temp <- data.frame(country = unique(class.col$Country)[country], L0 = aL0, L1 = aL1, L2 = 1:length(temp), L3 = 0, value = temp) +# try(fwrite(temp[abs(temp$value) > cutoff, ], file = fname, row.names = FALSE, col.names = FALSE, append = TRUE)) +# } # --- Non-recursive approach, functions --- @@ -179,8 +192,21 @@ cutoff <- 0.001 #---------------------------------------- -p <- which(index$country==country & index$item==product) +p <- which(index$ISO==country & index$item==product) results <- spa5(p,x,D,cutoff) data.table::fwrite(results, paste0("./output/results_spa_",year,"_",country,"_",product,".csv")) + + +index <- rbind(index, + data.frame(country = countries$Country[countries$ISO == colnames(Y_fabio)[1:192]], + ISO = colnames(Y_fabio)[1:192], + item = "", + model = "fabio"), + data.frame(country = countries_exio$EXIOregion[45:49], + ISO = countries_exio$EXIO2digit[45:49], + item = "", + model = "exio")) + +write.csv(index,"./input/index.csv") diff --git a/input/index.csv b/input/index.csv new file mode 100644 index 0000000..711f341 --- /dev/null +++ b/input/index.csv @@ -0,0 +1,34958 @@ +"","country","ISO","item","model" +"1","Armenia","ARM","Rice (Milled Equivalent)","fabio" +"2","Armenia","ARM","Wheat and products","fabio" +"3","Armenia","ARM","Barley and products","fabio" +"4","Armenia","ARM","Maize and products","fabio" +"5","Armenia","ARM","Rye and products","fabio" +"6","Armenia","ARM","Oats","fabio" +"7","Armenia","ARM","Millet and products","fabio" +"8","Armenia","ARM","Sorghum and products","fabio" +"9","Armenia","ARM","Cereals, Other","fabio" +"10","Armenia","ARM","Potatoes and products","fabio" +"11","Armenia","ARM","Cassava and products","fabio" +"12","Armenia","ARM","Sweet potatoes","fabio" +"13","Armenia","ARM","Roots, Other","fabio" +"14","Armenia","ARM","Yams","fabio" +"15","Armenia","ARM","Sugar cane","fabio" +"16","Armenia","ARM","Sugar beet","fabio" +"17","Armenia","ARM","Beans","fabio" +"18","Armenia","ARM","Peas","fabio" +"19","Armenia","ARM","Pulses, Other and products","fabio" +"20","Armenia","ARM","Nuts and products","fabio" +"21","Armenia","ARM","Soyabeans","fabio" +"22","Armenia","ARM","Groundnuts (Shelled Eq)","fabio" +"23","Armenia","ARM","Sunflower seed","fabio" +"24","Armenia","ARM","Rape and Mustardseed","fabio" +"25","Armenia","ARM","Seed cotton","fabio" +"26","Armenia","ARM","Coconuts - Incl Copra","fabio" +"27","Armenia","ARM","Sesame seed","fabio" +"28","Armenia","ARM","Oil, palm fruit","fabio" +"29","Armenia","ARM","Olives (including preserved)","fabio" +"30","Armenia","ARM","Oilcrops, Other","fabio" +"31","Armenia","ARM","Tomatoes and products","fabio" +"32","Armenia","ARM","Onions","fabio" +"33","Armenia","ARM","Vegetables, Other","fabio" +"34","Armenia","ARM","Oranges, Mandarines","fabio" +"35","Armenia","ARM","Lemons, Limes and products","fabio" +"36","Armenia","ARM","Grapefruit and products","fabio" +"37","Armenia","ARM","Citrus, Other","fabio" +"38","Armenia","ARM","Bananas","fabio" +"39","Armenia","ARM","Plantains","fabio" +"40","Armenia","ARM","Apples and products","fabio" +"41","Armenia","ARM","Pineapples and products","fabio" +"42","Armenia","ARM","Dates","fabio" +"43","Armenia","ARM","Grapes and products (excl wine)","fabio" +"44","Armenia","ARM","Fruits, Other","fabio" +"45","Armenia","ARM","Coffee and products","fabio" +"46","Armenia","ARM","Cocoa Beans and products","fabio" +"47","Armenia","ARM","Tea (including mate)","fabio" +"48","Armenia","ARM","Hops","fabio" +"49","Armenia","ARM","Pepper","fabio" +"50","Armenia","ARM","Pimento","fabio" +"51","Armenia","ARM","Cloves","fabio" +"52","Armenia","ARM","Spices, Other","fabio" +"53","Armenia","ARM","Jute","fabio" +"54","Armenia","ARM","Jute-Like Fibres","fabio" +"55","Armenia","ARM","Soft-Fibres, Other","fabio" +"56","Armenia","ARM","Sisal","fabio" +"57","Armenia","ARM","Abaca","fabio" +"58","Armenia","ARM","Hard Fibres, Other","fabio" +"59","Armenia","ARM","Tobacco","fabio" +"60","Armenia","ARM","Rubber","fabio" +"61","Armenia","ARM","Fodder crops","fabio" +"62","Armenia","ARM","Grazing","fabio" +"63","Armenia","ARM","Cottonseed","fabio" +"64","Armenia","ARM","Palm kernels","fabio" +"65","Armenia","ARM","Sugar non-centrifugal","fabio" +"66","Armenia","ARM","Molasses","fabio" +"67","Armenia","ARM","Sugar, Refined Equiv","fabio" +"68","Armenia","ARM","Sweeteners, Other","fabio" +"69","Armenia","ARM","Soyabean Oil","fabio" +"70","Armenia","ARM","Groundnut Oil","fabio" +"71","Armenia","ARM","Sunflowerseed Oil","fabio" +"72","Armenia","ARM","Rape and Mustard Oil","fabio" +"73","Armenia","ARM","Cottonseed Oil","fabio" +"74","Armenia","ARM","Palmkernel Oil","fabio" +"75","Armenia","ARM","Palm Oil","fabio" +"76","Armenia","ARM","Coconut Oil","fabio" +"77","Armenia","ARM","Sesameseed Oil","fabio" +"78","Armenia","ARM","Olive Oil","fabio" +"79","Armenia","ARM","Ricebran Oil","fabio" +"80","Armenia","ARM","Maize Germ Oil","fabio" +"81","Armenia","ARM","Oilcrops Oil, Other","fabio" +"82","Armenia","ARM","Soyabean Cake","fabio" +"83","Armenia","ARM","Groundnut Cake","fabio" +"84","Armenia","ARM","Sunflowerseed Cake","fabio" +"85","Armenia","ARM","Rape and Mustard Cake","fabio" +"86","Armenia","ARM","Cottonseed Cake","fabio" +"87","Armenia","ARM","Palmkernel Cake","fabio" +"88","Armenia","ARM","Copra Cake","fabio" +"89","Armenia","ARM","Sesameseed Cake","fabio" +"90","Armenia","ARM","Oilseed Cakes, Other","fabio" +"91","Armenia","ARM","Wine","fabio" +"92","Armenia","ARM","Beer","fabio" +"93","Armenia","ARM","Beverages, Fermented","fabio" +"94","Armenia","ARM","Beverages, Alcoholic","fabio" +"95","Armenia","ARM","Alcohol, Non-Food","fabio" +"96","Armenia","ARM","Cotton lint","fabio" +"97","Armenia","ARM","Cattle","fabio" +"98","Armenia","ARM","Buffaloes","fabio" +"99","Armenia","ARM","Sheep","fabio" +"100","Armenia","ARM","Goats","fabio" +"101","Armenia","ARM","Pigs","fabio" +"102","Armenia","ARM","Poultry Birds","fabio" +"103","Armenia","ARM","Horses","fabio" +"104","Armenia","ARM","Asses","fabio" +"105","Armenia","ARM","Mules","fabio" +"106","Armenia","ARM","Camels","fabio" +"107","Armenia","ARM","Camelids, other","fabio" +"108","Armenia","ARM","Rabbits and hares","fabio" +"109","Armenia","ARM","Rodents, other","fabio" +"110","Armenia","ARM","Live animals, other","fabio" +"111","Armenia","ARM","Milk - Excluding Butter","fabio" +"112","Armenia","ARM","Butter, Ghee","fabio" +"113","Armenia","ARM","Eggs","fabio" +"114","Armenia","ARM","Wool (Clean Eq.)","fabio" +"115","Armenia","ARM","Bovine Meat","fabio" +"116","Armenia","ARM","Mutton & Goat Meat","fabio" +"117","Armenia","ARM","Pigmeat","fabio" +"118","Armenia","ARM","Poultry Meat","fabio" +"119","Armenia","ARM","Meat, Other","fabio" +"120","Armenia","ARM","Offals, Edible","fabio" +"121","Armenia","ARM","Fats, Animals, Raw","fabio" +"122","Armenia","ARM","Hides and skins","fabio" +"123","Armenia","ARM","Meat Meal","fabio" +"124","Armenia","ARM","Pet food","fabio" +"125","Armenia","ARM","Honey","fabio" +"126","Armenia","ARM","Silk","fabio" +"127","Armenia","ARM","Fish, Seafood","fabio" +"128","Armenia","ARM","Wood fuel","fabio" +"129","Armenia","ARM","Industrial roundwood, coniferous","fabio" +"130","Armenia","ARM","Industrial roundwood, non-coniferous","fabio" +"131","Afghanistan","AFG","Rice (Milled Equivalent)","fabio" +"132","Afghanistan","AFG","Wheat and products","fabio" +"133","Afghanistan","AFG","Barley and products","fabio" +"134","Afghanistan","AFG","Maize and products","fabio" +"135","Afghanistan","AFG","Rye and products","fabio" +"136","Afghanistan","AFG","Oats","fabio" +"137","Afghanistan","AFG","Millet and products","fabio" +"138","Afghanistan","AFG","Sorghum and products","fabio" +"139","Afghanistan","AFG","Cereals, Other","fabio" +"140","Afghanistan","AFG","Potatoes and products","fabio" +"141","Afghanistan","AFG","Cassava and products","fabio" +"142","Afghanistan","AFG","Sweet potatoes","fabio" +"143","Afghanistan","AFG","Roots, Other","fabio" +"144","Afghanistan","AFG","Yams","fabio" +"145","Afghanistan","AFG","Sugar cane","fabio" +"146","Afghanistan","AFG","Sugar beet","fabio" +"147","Afghanistan","AFG","Beans","fabio" +"148","Afghanistan","AFG","Peas","fabio" +"149","Afghanistan","AFG","Pulses, Other and products","fabio" +"150","Afghanistan","AFG","Nuts and products","fabio" +"151","Afghanistan","AFG","Soyabeans","fabio" +"152","Afghanistan","AFG","Groundnuts (Shelled Eq)","fabio" +"153","Afghanistan","AFG","Sunflower seed","fabio" +"154","Afghanistan","AFG","Rape and Mustardseed","fabio" +"155","Afghanistan","AFG","Seed cotton","fabio" +"156","Afghanistan","AFG","Coconuts - Incl Copra","fabio" +"157","Afghanistan","AFG","Sesame seed","fabio" +"158","Afghanistan","AFG","Oil, palm fruit","fabio" +"159","Afghanistan","AFG","Olives (including preserved)","fabio" +"160","Afghanistan","AFG","Oilcrops, Other","fabio" +"161","Afghanistan","AFG","Tomatoes and products","fabio" +"162","Afghanistan","AFG","Onions","fabio" +"163","Afghanistan","AFG","Vegetables, Other","fabio" +"164","Afghanistan","AFG","Oranges, Mandarines","fabio" +"165","Afghanistan","AFG","Lemons, Limes and products","fabio" +"166","Afghanistan","AFG","Grapefruit and products","fabio" +"167","Afghanistan","AFG","Citrus, Other","fabio" +"168","Afghanistan","AFG","Bananas","fabio" +"169","Afghanistan","AFG","Plantains","fabio" +"170","Afghanistan","AFG","Apples and products","fabio" +"171","Afghanistan","AFG","Pineapples and products","fabio" +"172","Afghanistan","AFG","Dates","fabio" +"173","Afghanistan","AFG","Grapes and products (excl wine)","fabio" +"174","Afghanistan","AFG","Fruits, Other","fabio" +"175","Afghanistan","AFG","Coffee and products","fabio" +"176","Afghanistan","AFG","Cocoa Beans and products","fabio" +"177","Afghanistan","AFG","Tea (including mate)","fabio" +"178","Afghanistan","AFG","Hops","fabio" +"179","Afghanistan","AFG","Pepper","fabio" +"180","Afghanistan","AFG","Pimento","fabio" +"181","Afghanistan","AFG","Cloves","fabio" +"182","Afghanistan","AFG","Spices, Other","fabio" +"183","Afghanistan","AFG","Jute","fabio" +"184","Afghanistan","AFG","Jute-Like Fibres","fabio" +"185","Afghanistan","AFG","Soft-Fibres, Other","fabio" +"186","Afghanistan","AFG","Sisal","fabio" +"187","Afghanistan","AFG","Abaca","fabio" +"188","Afghanistan","AFG","Hard Fibres, Other","fabio" +"189","Afghanistan","AFG","Tobacco","fabio" +"190","Afghanistan","AFG","Rubber","fabio" +"191","Afghanistan","AFG","Fodder crops","fabio" +"192","Afghanistan","AFG","Grazing","fabio" +"193","Afghanistan","AFG","Cottonseed","fabio" +"194","Afghanistan","AFG","Palm kernels","fabio" +"195","Afghanistan","AFG","Sugar non-centrifugal","fabio" +"196","Afghanistan","AFG","Molasses","fabio" +"197","Afghanistan","AFG","Sugar, Refined Equiv","fabio" +"198","Afghanistan","AFG","Sweeteners, Other","fabio" +"199","Afghanistan","AFG","Soyabean Oil","fabio" +"200","Afghanistan","AFG","Groundnut Oil","fabio" +"201","Afghanistan","AFG","Sunflowerseed Oil","fabio" +"202","Afghanistan","AFG","Rape and Mustard Oil","fabio" +"203","Afghanistan","AFG","Cottonseed Oil","fabio" +"204","Afghanistan","AFG","Palmkernel Oil","fabio" +"205","Afghanistan","AFG","Palm Oil","fabio" +"206","Afghanistan","AFG","Coconut Oil","fabio" +"207","Afghanistan","AFG","Sesameseed Oil","fabio" +"208","Afghanistan","AFG","Olive Oil","fabio" +"209","Afghanistan","AFG","Ricebran Oil","fabio" +"210","Afghanistan","AFG","Maize Germ Oil","fabio" +"211","Afghanistan","AFG","Oilcrops Oil, Other","fabio" +"212","Afghanistan","AFG","Soyabean Cake","fabio" +"213","Afghanistan","AFG","Groundnut Cake","fabio" +"214","Afghanistan","AFG","Sunflowerseed Cake","fabio" +"215","Afghanistan","AFG","Rape and Mustard Cake","fabio" +"216","Afghanistan","AFG","Cottonseed Cake","fabio" +"217","Afghanistan","AFG","Palmkernel Cake","fabio" +"218","Afghanistan","AFG","Copra Cake","fabio" +"219","Afghanistan","AFG","Sesameseed Cake","fabio" +"220","Afghanistan","AFG","Oilseed Cakes, Other","fabio" +"221","Afghanistan","AFG","Wine","fabio" +"222","Afghanistan","AFG","Beer","fabio" +"223","Afghanistan","AFG","Beverages, Fermented","fabio" +"224","Afghanistan","AFG","Beverages, Alcoholic","fabio" +"225","Afghanistan","AFG","Alcohol, Non-Food","fabio" +"226","Afghanistan","AFG","Cotton lint","fabio" +"227","Afghanistan","AFG","Cattle","fabio" +"228","Afghanistan","AFG","Buffaloes","fabio" +"229","Afghanistan","AFG","Sheep","fabio" +"230","Afghanistan","AFG","Goats","fabio" +"231","Afghanistan","AFG","Pigs","fabio" +"232","Afghanistan","AFG","Poultry Birds","fabio" +"233","Afghanistan","AFG","Horses","fabio" +"234","Afghanistan","AFG","Asses","fabio" +"235","Afghanistan","AFG","Mules","fabio" +"236","Afghanistan","AFG","Camels","fabio" +"237","Afghanistan","AFG","Camelids, other","fabio" +"238","Afghanistan","AFG","Rabbits and hares","fabio" +"239","Afghanistan","AFG","Rodents, other","fabio" +"240","Afghanistan","AFG","Live animals, other","fabio" +"241","Afghanistan","AFG","Milk - Excluding Butter","fabio" +"242","Afghanistan","AFG","Butter, Ghee","fabio" +"243","Afghanistan","AFG","Eggs","fabio" +"244","Afghanistan","AFG","Wool (Clean Eq.)","fabio" +"245","Afghanistan","AFG","Bovine Meat","fabio" +"246","Afghanistan","AFG","Mutton & Goat Meat","fabio" +"247","Afghanistan","AFG","Pigmeat","fabio" +"248","Afghanistan","AFG","Poultry Meat","fabio" +"249","Afghanistan","AFG","Meat, Other","fabio" +"250","Afghanistan","AFG","Offals, Edible","fabio" +"251","Afghanistan","AFG","Fats, Animals, Raw","fabio" +"252","Afghanistan","AFG","Hides and skins","fabio" +"253","Afghanistan","AFG","Meat Meal","fabio" +"254","Afghanistan","AFG","Pet food","fabio" +"255","Afghanistan","AFG","Honey","fabio" +"256","Afghanistan","AFG","Silk","fabio" +"257","Afghanistan","AFG","Fish, Seafood","fabio" +"258","Afghanistan","AFG","Wood fuel","fabio" +"259","Afghanistan","AFG","Industrial roundwood, coniferous","fabio" +"260","Afghanistan","AFG","Industrial roundwood, non-coniferous","fabio" +"261","Albania","ALB","Rice (Milled Equivalent)","fabio" +"262","Albania","ALB","Wheat and products","fabio" +"263","Albania","ALB","Barley and products","fabio" +"264","Albania","ALB","Maize and products","fabio" +"265","Albania","ALB","Rye and products","fabio" +"266","Albania","ALB","Oats","fabio" +"267","Albania","ALB","Millet and products","fabio" +"268","Albania","ALB","Sorghum and products","fabio" +"269","Albania","ALB","Cereals, Other","fabio" +"270","Albania","ALB","Potatoes and products","fabio" +"271","Albania","ALB","Cassava and products","fabio" +"272","Albania","ALB","Sweet potatoes","fabio" +"273","Albania","ALB","Roots, Other","fabio" +"274","Albania","ALB","Yams","fabio" +"275","Albania","ALB","Sugar cane","fabio" +"276","Albania","ALB","Sugar beet","fabio" +"277","Albania","ALB","Beans","fabio" +"278","Albania","ALB","Peas","fabio" +"279","Albania","ALB","Pulses, Other and products","fabio" +"280","Albania","ALB","Nuts and products","fabio" +"281","Albania","ALB","Soyabeans","fabio" +"282","Albania","ALB","Groundnuts (Shelled Eq)","fabio" +"283","Albania","ALB","Sunflower seed","fabio" +"284","Albania","ALB","Rape and Mustardseed","fabio" +"285","Albania","ALB","Seed cotton","fabio" +"286","Albania","ALB","Coconuts - Incl Copra","fabio" +"287","Albania","ALB","Sesame seed","fabio" +"288","Albania","ALB","Oil, palm fruit","fabio" +"289","Albania","ALB","Olives (including preserved)","fabio" +"290","Albania","ALB","Oilcrops, Other","fabio" +"291","Albania","ALB","Tomatoes and products","fabio" +"292","Albania","ALB","Onions","fabio" +"293","Albania","ALB","Vegetables, Other","fabio" +"294","Albania","ALB","Oranges, Mandarines","fabio" +"295","Albania","ALB","Lemons, Limes and products","fabio" +"296","Albania","ALB","Grapefruit and products","fabio" +"297","Albania","ALB","Citrus, Other","fabio" +"298","Albania","ALB","Bananas","fabio" +"299","Albania","ALB","Plantains","fabio" +"300","Albania","ALB","Apples and products","fabio" +"301","Albania","ALB","Pineapples and products","fabio" +"302","Albania","ALB","Dates","fabio" +"303","Albania","ALB","Grapes and products (excl wine)","fabio" +"304","Albania","ALB","Fruits, Other","fabio" +"305","Albania","ALB","Coffee and products","fabio" +"306","Albania","ALB","Cocoa Beans and products","fabio" +"307","Albania","ALB","Tea (including mate)","fabio" +"308","Albania","ALB","Hops","fabio" +"309","Albania","ALB","Pepper","fabio" +"310","Albania","ALB","Pimento","fabio" +"311","Albania","ALB","Cloves","fabio" +"312","Albania","ALB","Spices, Other","fabio" +"313","Albania","ALB","Jute","fabio" +"314","Albania","ALB","Jute-Like Fibres","fabio" +"315","Albania","ALB","Soft-Fibres, Other","fabio" +"316","Albania","ALB","Sisal","fabio" +"317","Albania","ALB","Abaca","fabio" +"318","Albania","ALB","Hard Fibres, Other","fabio" +"319","Albania","ALB","Tobacco","fabio" +"320","Albania","ALB","Rubber","fabio" +"321","Albania","ALB","Fodder crops","fabio" +"322","Albania","ALB","Grazing","fabio" +"323","Albania","ALB","Cottonseed","fabio" +"324","Albania","ALB","Palm kernels","fabio" +"325","Albania","ALB","Sugar non-centrifugal","fabio" +"326","Albania","ALB","Molasses","fabio" +"327","Albania","ALB","Sugar, Refined Equiv","fabio" +"328","Albania","ALB","Sweeteners, Other","fabio" +"329","Albania","ALB","Soyabean Oil","fabio" +"330","Albania","ALB","Groundnut Oil","fabio" +"331","Albania","ALB","Sunflowerseed Oil","fabio" +"332","Albania","ALB","Rape and Mustard Oil","fabio" +"333","Albania","ALB","Cottonseed Oil","fabio" +"334","Albania","ALB","Palmkernel Oil","fabio" +"335","Albania","ALB","Palm Oil","fabio" +"336","Albania","ALB","Coconut Oil","fabio" +"337","Albania","ALB","Sesameseed Oil","fabio" +"338","Albania","ALB","Olive Oil","fabio" +"339","Albania","ALB","Ricebran Oil","fabio" +"340","Albania","ALB","Maize Germ Oil","fabio" +"341","Albania","ALB","Oilcrops Oil, Other","fabio" +"342","Albania","ALB","Soyabean Cake","fabio" +"343","Albania","ALB","Groundnut Cake","fabio" +"344","Albania","ALB","Sunflowerseed Cake","fabio" +"345","Albania","ALB","Rape and Mustard Cake","fabio" +"346","Albania","ALB","Cottonseed Cake","fabio" +"347","Albania","ALB","Palmkernel Cake","fabio" +"348","Albania","ALB","Copra Cake","fabio" +"349","Albania","ALB","Sesameseed Cake","fabio" +"350","Albania","ALB","Oilseed Cakes, Other","fabio" +"351","Albania","ALB","Wine","fabio" +"352","Albania","ALB","Beer","fabio" +"353","Albania","ALB","Beverages, Fermented","fabio" +"354","Albania","ALB","Beverages, Alcoholic","fabio" +"355","Albania","ALB","Alcohol, Non-Food","fabio" +"356","Albania","ALB","Cotton lint","fabio" +"357","Albania","ALB","Cattle","fabio" +"358","Albania","ALB","Buffaloes","fabio" +"359","Albania","ALB","Sheep","fabio" +"360","Albania","ALB","Goats","fabio" +"361","Albania","ALB","Pigs","fabio" +"362","Albania","ALB","Poultry Birds","fabio" +"363","Albania","ALB","Horses","fabio" +"364","Albania","ALB","Asses","fabio" +"365","Albania","ALB","Mules","fabio" +"366","Albania","ALB","Camels","fabio" +"367","Albania","ALB","Camelids, other","fabio" +"368","Albania","ALB","Rabbits and hares","fabio" +"369","Albania","ALB","Rodents, other","fabio" +"370","Albania","ALB","Live animals, other","fabio" +"371","Albania","ALB","Milk - Excluding Butter","fabio" +"372","Albania","ALB","Butter, Ghee","fabio" +"373","Albania","ALB","Eggs","fabio" +"374","Albania","ALB","Wool (Clean Eq.)","fabio" +"375","Albania","ALB","Bovine Meat","fabio" +"376","Albania","ALB","Mutton & Goat Meat","fabio" +"377","Albania","ALB","Pigmeat","fabio" +"378","Albania","ALB","Poultry Meat","fabio" +"379","Albania","ALB","Meat, Other","fabio" +"380","Albania","ALB","Offals, Edible","fabio" +"381","Albania","ALB","Fats, Animals, Raw","fabio" +"382","Albania","ALB","Hides and skins","fabio" +"383","Albania","ALB","Meat Meal","fabio" +"384","Albania","ALB","Pet food","fabio" +"385","Albania","ALB","Honey","fabio" +"386","Albania","ALB","Silk","fabio" +"387","Albania","ALB","Fish, Seafood","fabio" +"388","Albania","ALB","Wood fuel","fabio" +"389","Albania","ALB","Industrial roundwood, coniferous","fabio" +"390","Albania","ALB","Industrial roundwood, non-coniferous","fabio" +"391","Algeria","DZA","Rice (Milled Equivalent)","fabio" +"392","Algeria","DZA","Wheat and products","fabio" +"393","Algeria","DZA","Barley and products","fabio" +"394","Algeria","DZA","Maize and products","fabio" +"395","Algeria","DZA","Rye and products","fabio" +"396","Algeria","DZA","Oats","fabio" +"397","Algeria","DZA","Millet and products","fabio" +"398","Algeria","DZA","Sorghum and products","fabio" +"399","Algeria","DZA","Cereals, Other","fabio" +"400","Algeria","DZA","Potatoes and products","fabio" +"401","Algeria","DZA","Cassava and products","fabio" +"402","Algeria","DZA","Sweet potatoes","fabio" +"403","Algeria","DZA","Roots, Other","fabio" +"404","Algeria","DZA","Yams","fabio" +"405","Algeria","DZA","Sugar cane","fabio" +"406","Algeria","DZA","Sugar beet","fabio" +"407","Algeria","DZA","Beans","fabio" +"408","Algeria","DZA","Peas","fabio" +"409","Algeria","DZA","Pulses, Other and products","fabio" +"410","Algeria","DZA","Nuts and products","fabio" +"411","Algeria","DZA","Soyabeans","fabio" +"412","Algeria","DZA","Groundnuts (Shelled Eq)","fabio" +"413","Algeria","DZA","Sunflower seed","fabio" +"414","Algeria","DZA","Rape and Mustardseed","fabio" +"415","Algeria","DZA","Seed cotton","fabio" +"416","Algeria","DZA","Coconuts - Incl Copra","fabio" +"417","Algeria","DZA","Sesame seed","fabio" +"418","Algeria","DZA","Oil, palm fruit","fabio" +"419","Algeria","DZA","Olives (including preserved)","fabio" +"420","Algeria","DZA","Oilcrops, Other","fabio" +"421","Algeria","DZA","Tomatoes and products","fabio" +"422","Algeria","DZA","Onions","fabio" +"423","Algeria","DZA","Vegetables, Other","fabio" +"424","Algeria","DZA","Oranges, Mandarines","fabio" +"425","Algeria","DZA","Lemons, Limes and products","fabio" +"426","Algeria","DZA","Grapefruit and products","fabio" +"427","Algeria","DZA","Citrus, Other","fabio" +"428","Algeria","DZA","Bananas","fabio" +"429","Algeria","DZA","Plantains","fabio" +"430","Algeria","DZA","Apples and products","fabio" +"431","Algeria","DZA","Pineapples and products","fabio" +"432","Algeria","DZA","Dates","fabio" +"433","Algeria","DZA","Grapes and products (excl wine)","fabio" +"434","Algeria","DZA","Fruits, Other","fabio" +"435","Algeria","DZA","Coffee and products","fabio" +"436","Algeria","DZA","Cocoa Beans and products","fabio" +"437","Algeria","DZA","Tea (including mate)","fabio" +"438","Algeria","DZA","Hops","fabio" +"439","Algeria","DZA","Pepper","fabio" +"440","Algeria","DZA","Pimento","fabio" +"441","Algeria","DZA","Cloves","fabio" +"442","Algeria","DZA","Spices, Other","fabio" +"443","Algeria","DZA","Jute","fabio" +"444","Algeria","DZA","Jute-Like Fibres","fabio" +"445","Algeria","DZA","Soft-Fibres, Other","fabio" +"446","Algeria","DZA","Sisal","fabio" +"447","Algeria","DZA","Abaca","fabio" +"448","Algeria","DZA","Hard Fibres, Other","fabio" +"449","Algeria","DZA","Tobacco","fabio" +"450","Algeria","DZA","Rubber","fabio" +"451","Algeria","DZA","Fodder crops","fabio" +"452","Algeria","DZA","Grazing","fabio" +"453","Algeria","DZA","Cottonseed","fabio" +"454","Algeria","DZA","Palm kernels","fabio" +"455","Algeria","DZA","Sugar non-centrifugal","fabio" +"456","Algeria","DZA","Molasses","fabio" +"457","Algeria","DZA","Sugar, Refined Equiv","fabio" +"458","Algeria","DZA","Sweeteners, Other","fabio" +"459","Algeria","DZA","Soyabean Oil","fabio" +"460","Algeria","DZA","Groundnut Oil","fabio" +"461","Algeria","DZA","Sunflowerseed Oil","fabio" +"462","Algeria","DZA","Rape and Mustard Oil","fabio" +"463","Algeria","DZA","Cottonseed Oil","fabio" +"464","Algeria","DZA","Palmkernel Oil","fabio" +"465","Algeria","DZA","Palm Oil","fabio" +"466","Algeria","DZA","Coconut Oil","fabio" +"467","Algeria","DZA","Sesameseed Oil","fabio" +"468","Algeria","DZA","Olive Oil","fabio" +"469","Algeria","DZA","Ricebran Oil","fabio" +"470","Algeria","DZA","Maize Germ Oil","fabio" +"471","Algeria","DZA","Oilcrops Oil, Other","fabio" +"472","Algeria","DZA","Soyabean Cake","fabio" +"473","Algeria","DZA","Groundnut Cake","fabio" +"474","Algeria","DZA","Sunflowerseed Cake","fabio" +"475","Algeria","DZA","Rape and Mustard Cake","fabio" +"476","Algeria","DZA","Cottonseed Cake","fabio" +"477","Algeria","DZA","Palmkernel Cake","fabio" +"478","Algeria","DZA","Copra Cake","fabio" +"479","Algeria","DZA","Sesameseed Cake","fabio" +"480","Algeria","DZA","Oilseed Cakes, Other","fabio" +"481","Algeria","DZA","Wine","fabio" +"482","Algeria","DZA","Beer","fabio" +"483","Algeria","DZA","Beverages, Fermented","fabio" +"484","Algeria","DZA","Beverages, Alcoholic","fabio" +"485","Algeria","DZA","Alcohol, Non-Food","fabio" +"486","Algeria","DZA","Cotton lint","fabio" +"487","Algeria","DZA","Cattle","fabio" +"488","Algeria","DZA","Buffaloes","fabio" +"489","Algeria","DZA","Sheep","fabio" +"490","Algeria","DZA","Goats","fabio" +"491","Algeria","DZA","Pigs","fabio" +"492","Algeria","DZA","Poultry Birds","fabio" +"493","Algeria","DZA","Horses","fabio" +"494","Algeria","DZA","Asses","fabio" +"495","Algeria","DZA","Mules","fabio" +"496","Algeria","DZA","Camels","fabio" +"497","Algeria","DZA","Camelids, other","fabio" +"498","Algeria","DZA","Rabbits and hares","fabio" +"499","Algeria","DZA","Rodents, other","fabio" +"500","Algeria","DZA","Live animals, other","fabio" +"501","Algeria","DZA","Milk - Excluding Butter","fabio" +"502","Algeria","DZA","Butter, Ghee","fabio" +"503","Algeria","DZA","Eggs","fabio" +"504","Algeria","DZA","Wool (Clean Eq.)","fabio" +"505","Algeria","DZA","Bovine Meat","fabio" +"506","Algeria","DZA","Mutton & Goat Meat","fabio" +"507","Algeria","DZA","Pigmeat","fabio" +"508","Algeria","DZA","Poultry Meat","fabio" +"509","Algeria","DZA","Meat, Other","fabio" +"510","Algeria","DZA","Offals, Edible","fabio" +"511","Algeria","DZA","Fats, Animals, Raw","fabio" +"512","Algeria","DZA","Hides and skins","fabio" +"513","Algeria","DZA","Meat Meal","fabio" +"514","Algeria","DZA","Pet food","fabio" +"515","Algeria","DZA","Honey","fabio" +"516","Algeria","DZA","Silk","fabio" +"517","Algeria","DZA","Fish, Seafood","fabio" +"518","Algeria","DZA","Wood fuel","fabio" +"519","Algeria","DZA","Industrial roundwood, coniferous","fabio" +"520","Algeria","DZA","Industrial roundwood, non-coniferous","fabio" +"521","Angola","AGO","Rice (Milled Equivalent)","fabio" +"522","Angola","AGO","Wheat and products","fabio" +"523","Angola","AGO","Barley and products","fabio" +"524","Angola","AGO","Maize and products","fabio" +"525","Angola","AGO","Rye and products","fabio" +"526","Angola","AGO","Oats","fabio" +"527","Angola","AGO","Millet and products","fabio" +"528","Angola","AGO","Sorghum and products","fabio" +"529","Angola","AGO","Cereals, Other","fabio" +"530","Angola","AGO","Potatoes and products","fabio" +"531","Angola","AGO","Cassava and products","fabio" +"532","Angola","AGO","Sweet potatoes","fabio" +"533","Angola","AGO","Roots, Other","fabio" +"534","Angola","AGO","Yams","fabio" +"535","Angola","AGO","Sugar cane","fabio" +"536","Angola","AGO","Sugar beet","fabio" +"537","Angola","AGO","Beans","fabio" +"538","Angola","AGO","Peas","fabio" +"539","Angola","AGO","Pulses, Other and products","fabio" +"540","Angola","AGO","Nuts and products","fabio" +"541","Angola","AGO","Soyabeans","fabio" +"542","Angola","AGO","Groundnuts (Shelled Eq)","fabio" +"543","Angola","AGO","Sunflower seed","fabio" +"544","Angola","AGO","Rape and Mustardseed","fabio" +"545","Angola","AGO","Seed cotton","fabio" +"546","Angola","AGO","Coconuts - Incl Copra","fabio" +"547","Angola","AGO","Sesame seed","fabio" +"548","Angola","AGO","Oil, palm fruit","fabio" +"549","Angola","AGO","Olives (including preserved)","fabio" +"550","Angola","AGO","Oilcrops, Other","fabio" +"551","Angola","AGO","Tomatoes and products","fabio" +"552","Angola","AGO","Onions","fabio" +"553","Angola","AGO","Vegetables, Other","fabio" +"554","Angola","AGO","Oranges, Mandarines","fabio" +"555","Angola","AGO","Lemons, Limes and products","fabio" +"556","Angola","AGO","Grapefruit and products","fabio" +"557","Angola","AGO","Citrus, Other","fabio" +"558","Angola","AGO","Bananas","fabio" +"559","Angola","AGO","Plantains","fabio" +"560","Angola","AGO","Apples and products","fabio" +"561","Angola","AGO","Pineapples and products","fabio" +"562","Angola","AGO","Dates","fabio" +"563","Angola","AGO","Grapes and products (excl wine)","fabio" +"564","Angola","AGO","Fruits, Other","fabio" +"565","Angola","AGO","Coffee and products","fabio" +"566","Angola","AGO","Cocoa Beans and products","fabio" +"567","Angola","AGO","Tea (including mate)","fabio" +"568","Angola","AGO","Hops","fabio" +"569","Angola","AGO","Pepper","fabio" +"570","Angola","AGO","Pimento","fabio" +"571","Angola","AGO","Cloves","fabio" +"572","Angola","AGO","Spices, Other","fabio" +"573","Angola","AGO","Jute","fabio" +"574","Angola","AGO","Jute-Like Fibres","fabio" +"575","Angola","AGO","Soft-Fibres, Other","fabio" +"576","Angola","AGO","Sisal","fabio" +"577","Angola","AGO","Abaca","fabio" +"578","Angola","AGO","Hard Fibres, Other","fabio" +"579","Angola","AGO","Tobacco","fabio" +"580","Angola","AGO","Rubber","fabio" +"581","Angola","AGO","Fodder crops","fabio" +"582","Angola","AGO","Grazing","fabio" +"583","Angola","AGO","Cottonseed","fabio" +"584","Angola","AGO","Palm kernels","fabio" +"585","Angola","AGO","Sugar non-centrifugal","fabio" +"586","Angola","AGO","Molasses","fabio" +"587","Angola","AGO","Sugar, Refined Equiv","fabio" +"588","Angola","AGO","Sweeteners, Other","fabio" +"589","Angola","AGO","Soyabean Oil","fabio" +"590","Angola","AGO","Groundnut Oil","fabio" +"591","Angola","AGO","Sunflowerseed Oil","fabio" +"592","Angola","AGO","Rape and Mustard Oil","fabio" +"593","Angola","AGO","Cottonseed Oil","fabio" +"594","Angola","AGO","Palmkernel Oil","fabio" +"595","Angola","AGO","Palm Oil","fabio" +"596","Angola","AGO","Coconut Oil","fabio" +"597","Angola","AGO","Sesameseed Oil","fabio" +"598","Angola","AGO","Olive Oil","fabio" +"599","Angola","AGO","Ricebran Oil","fabio" +"600","Angola","AGO","Maize Germ Oil","fabio" +"601","Angola","AGO","Oilcrops Oil, Other","fabio" +"602","Angola","AGO","Soyabean Cake","fabio" +"603","Angola","AGO","Groundnut Cake","fabio" +"604","Angola","AGO","Sunflowerseed Cake","fabio" +"605","Angola","AGO","Rape and Mustard Cake","fabio" +"606","Angola","AGO","Cottonseed Cake","fabio" +"607","Angola","AGO","Palmkernel Cake","fabio" +"608","Angola","AGO","Copra Cake","fabio" +"609","Angola","AGO","Sesameseed Cake","fabio" +"610","Angola","AGO","Oilseed Cakes, Other","fabio" +"611","Angola","AGO","Wine","fabio" +"612","Angola","AGO","Beer","fabio" +"613","Angola","AGO","Beverages, Fermented","fabio" +"614","Angola","AGO","Beverages, Alcoholic","fabio" +"615","Angola","AGO","Alcohol, Non-Food","fabio" +"616","Angola","AGO","Cotton lint","fabio" +"617","Angola","AGO","Cattle","fabio" +"618","Angola","AGO","Buffaloes","fabio" +"619","Angola","AGO","Sheep","fabio" +"620","Angola","AGO","Goats","fabio" +"621","Angola","AGO","Pigs","fabio" +"622","Angola","AGO","Poultry Birds","fabio" +"623","Angola","AGO","Horses","fabio" +"624","Angola","AGO","Asses","fabio" +"625","Angola","AGO","Mules","fabio" +"626","Angola","AGO","Camels","fabio" +"627","Angola","AGO","Camelids, other","fabio" +"628","Angola","AGO","Rabbits and hares","fabio" +"629","Angola","AGO","Rodents, other","fabio" +"630","Angola","AGO","Live animals, other","fabio" +"631","Angola","AGO","Milk - Excluding Butter","fabio" +"632","Angola","AGO","Butter, Ghee","fabio" +"633","Angola","AGO","Eggs","fabio" +"634","Angola","AGO","Wool (Clean Eq.)","fabio" +"635","Angola","AGO","Bovine Meat","fabio" +"636","Angola","AGO","Mutton & Goat Meat","fabio" +"637","Angola","AGO","Pigmeat","fabio" +"638","Angola","AGO","Poultry Meat","fabio" +"639","Angola","AGO","Meat, Other","fabio" +"640","Angola","AGO","Offals, Edible","fabio" +"641","Angola","AGO","Fats, Animals, Raw","fabio" +"642","Angola","AGO","Hides and skins","fabio" +"643","Angola","AGO","Meat Meal","fabio" +"644","Angola","AGO","Pet food","fabio" +"645","Angola","AGO","Honey","fabio" +"646","Angola","AGO","Silk","fabio" +"647","Angola","AGO","Fish, Seafood","fabio" +"648","Angola","AGO","Wood fuel","fabio" +"649","Angola","AGO","Industrial roundwood, coniferous","fabio" +"650","Angola","AGO","Industrial roundwood, non-coniferous","fabio" +"651","Antigua and Barbuda","ATG","Rice (Milled Equivalent)","fabio" +"652","Antigua and Barbuda","ATG","Wheat and products","fabio" +"653","Antigua and Barbuda","ATG","Barley and products","fabio" +"654","Antigua and Barbuda","ATG","Maize and products","fabio" +"655","Antigua and Barbuda","ATG","Rye and products","fabio" +"656","Antigua and Barbuda","ATG","Oats","fabio" +"657","Antigua and Barbuda","ATG","Millet and products","fabio" +"658","Antigua and Barbuda","ATG","Sorghum and products","fabio" +"659","Antigua and Barbuda","ATG","Cereals, Other","fabio" +"660","Antigua and Barbuda","ATG","Potatoes and products","fabio" +"661","Antigua and Barbuda","ATG","Cassava and products","fabio" +"662","Antigua and Barbuda","ATG","Sweet potatoes","fabio" +"663","Antigua and Barbuda","ATG","Roots, Other","fabio" +"664","Antigua and Barbuda","ATG","Yams","fabio" +"665","Antigua and Barbuda","ATG","Sugar cane","fabio" +"666","Antigua and Barbuda","ATG","Sugar beet","fabio" +"667","Antigua and Barbuda","ATG","Beans","fabio" +"668","Antigua and Barbuda","ATG","Peas","fabio" +"669","Antigua and Barbuda","ATG","Pulses, Other and products","fabio" +"670","Antigua and Barbuda","ATG","Nuts and products","fabio" +"671","Antigua and Barbuda","ATG","Soyabeans","fabio" +"672","Antigua and Barbuda","ATG","Groundnuts (Shelled Eq)","fabio" +"673","Antigua and Barbuda","ATG","Sunflower seed","fabio" +"674","Antigua and Barbuda","ATG","Rape and Mustardseed","fabio" +"675","Antigua and Barbuda","ATG","Seed cotton","fabio" +"676","Antigua and Barbuda","ATG","Coconuts - Incl Copra","fabio" +"677","Antigua and Barbuda","ATG","Sesame seed","fabio" +"678","Antigua and Barbuda","ATG","Oil, palm fruit","fabio" +"679","Antigua and Barbuda","ATG","Olives (including preserved)","fabio" +"680","Antigua and Barbuda","ATG","Oilcrops, Other","fabio" +"681","Antigua and Barbuda","ATG","Tomatoes and products","fabio" +"682","Antigua and Barbuda","ATG","Onions","fabio" +"683","Antigua and Barbuda","ATG","Vegetables, Other","fabio" +"684","Antigua and Barbuda","ATG","Oranges, Mandarines","fabio" +"685","Antigua and Barbuda","ATG","Lemons, Limes and products","fabio" +"686","Antigua and Barbuda","ATG","Grapefruit and products","fabio" +"687","Antigua and Barbuda","ATG","Citrus, Other","fabio" +"688","Antigua and Barbuda","ATG","Bananas","fabio" +"689","Antigua and Barbuda","ATG","Plantains","fabio" +"690","Antigua and Barbuda","ATG","Apples and products","fabio" +"691","Antigua and Barbuda","ATG","Pineapples and products","fabio" +"692","Antigua and Barbuda","ATG","Dates","fabio" +"693","Antigua and Barbuda","ATG","Grapes and products (excl wine)","fabio" +"694","Antigua and Barbuda","ATG","Fruits, Other","fabio" +"695","Antigua and Barbuda","ATG","Coffee and products","fabio" +"696","Antigua and Barbuda","ATG","Cocoa Beans and products","fabio" +"697","Antigua and Barbuda","ATG","Tea (including mate)","fabio" +"698","Antigua and Barbuda","ATG","Hops","fabio" +"699","Antigua and Barbuda","ATG","Pepper","fabio" +"700","Antigua and Barbuda","ATG","Pimento","fabio" +"701","Antigua and Barbuda","ATG","Cloves","fabio" +"702","Antigua and Barbuda","ATG","Spices, Other","fabio" +"703","Antigua and Barbuda","ATG","Jute","fabio" +"704","Antigua and Barbuda","ATG","Jute-Like Fibres","fabio" +"705","Antigua and Barbuda","ATG","Soft-Fibres, Other","fabio" +"706","Antigua and Barbuda","ATG","Sisal","fabio" +"707","Antigua and Barbuda","ATG","Abaca","fabio" +"708","Antigua and Barbuda","ATG","Hard Fibres, Other","fabio" +"709","Antigua and Barbuda","ATG","Tobacco","fabio" +"710","Antigua and Barbuda","ATG","Rubber","fabio" +"711","Antigua and Barbuda","ATG","Fodder crops","fabio" +"712","Antigua and Barbuda","ATG","Grazing","fabio" +"713","Antigua and Barbuda","ATG","Cottonseed","fabio" +"714","Antigua and Barbuda","ATG","Palm kernels","fabio" +"715","Antigua and Barbuda","ATG","Sugar non-centrifugal","fabio" +"716","Antigua and Barbuda","ATG","Molasses","fabio" +"717","Antigua and Barbuda","ATG","Sugar, Refined Equiv","fabio" +"718","Antigua and Barbuda","ATG","Sweeteners, Other","fabio" +"719","Antigua and Barbuda","ATG","Soyabean Oil","fabio" +"720","Antigua and Barbuda","ATG","Groundnut Oil","fabio" +"721","Antigua and Barbuda","ATG","Sunflowerseed Oil","fabio" +"722","Antigua and Barbuda","ATG","Rape and Mustard Oil","fabio" +"723","Antigua and Barbuda","ATG","Cottonseed Oil","fabio" +"724","Antigua and Barbuda","ATG","Palmkernel Oil","fabio" +"725","Antigua and Barbuda","ATG","Palm Oil","fabio" +"726","Antigua and Barbuda","ATG","Coconut Oil","fabio" +"727","Antigua and Barbuda","ATG","Sesameseed Oil","fabio" +"728","Antigua and Barbuda","ATG","Olive Oil","fabio" +"729","Antigua and Barbuda","ATG","Ricebran Oil","fabio" +"730","Antigua and Barbuda","ATG","Maize Germ Oil","fabio" +"731","Antigua and Barbuda","ATG","Oilcrops Oil, Other","fabio" +"732","Antigua and Barbuda","ATG","Soyabean Cake","fabio" +"733","Antigua and Barbuda","ATG","Groundnut Cake","fabio" +"734","Antigua and Barbuda","ATG","Sunflowerseed Cake","fabio" +"735","Antigua and Barbuda","ATG","Rape and Mustard Cake","fabio" +"736","Antigua and Barbuda","ATG","Cottonseed Cake","fabio" +"737","Antigua and Barbuda","ATG","Palmkernel Cake","fabio" +"738","Antigua and Barbuda","ATG","Copra Cake","fabio" +"739","Antigua and Barbuda","ATG","Sesameseed Cake","fabio" +"740","Antigua and Barbuda","ATG","Oilseed Cakes, Other","fabio" +"741","Antigua and Barbuda","ATG","Wine","fabio" +"742","Antigua and Barbuda","ATG","Beer","fabio" +"743","Antigua and Barbuda","ATG","Beverages, Fermented","fabio" +"744","Antigua and Barbuda","ATG","Beverages, Alcoholic","fabio" +"745","Antigua and Barbuda","ATG","Alcohol, Non-Food","fabio" +"746","Antigua and Barbuda","ATG","Cotton lint","fabio" +"747","Antigua and Barbuda","ATG","Cattle","fabio" +"748","Antigua and Barbuda","ATG","Buffaloes","fabio" +"749","Antigua and Barbuda","ATG","Sheep","fabio" +"750","Antigua and Barbuda","ATG","Goats","fabio" +"751","Antigua and Barbuda","ATG","Pigs","fabio" +"752","Antigua and Barbuda","ATG","Poultry Birds","fabio" +"753","Antigua and Barbuda","ATG","Horses","fabio" +"754","Antigua and Barbuda","ATG","Asses","fabio" +"755","Antigua and Barbuda","ATG","Mules","fabio" +"756","Antigua and Barbuda","ATG","Camels","fabio" +"757","Antigua and Barbuda","ATG","Camelids, other","fabio" +"758","Antigua and Barbuda","ATG","Rabbits and hares","fabio" +"759","Antigua and Barbuda","ATG","Rodents, other","fabio" +"760","Antigua and Barbuda","ATG","Live animals, other","fabio" +"761","Antigua and Barbuda","ATG","Milk - Excluding Butter","fabio" +"762","Antigua and Barbuda","ATG","Butter, Ghee","fabio" +"763","Antigua and Barbuda","ATG","Eggs","fabio" +"764","Antigua and Barbuda","ATG","Wool (Clean Eq.)","fabio" +"765","Antigua and Barbuda","ATG","Bovine Meat","fabio" +"766","Antigua and Barbuda","ATG","Mutton & Goat Meat","fabio" +"767","Antigua and Barbuda","ATG","Pigmeat","fabio" +"768","Antigua and Barbuda","ATG","Poultry Meat","fabio" +"769","Antigua and Barbuda","ATG","Meat, Other","fabio" +"770","Antigua and Barbuda","ATG","Offals, Edible","fabio" +"771","Antigua and Barbuda","ATG","Fats, Animals, Raw","fabio" +"772","Antigua and Barbuda","ATG","Hides and skins","fabio" +"773","Antigua and Barbuda","ATG","Meat Meal","fabio" +"774","Antigua and Barbuda","ATG","Pet food","fabio" +"775","Antigua and Barbuda","ATG","Honey","fabio" +"776","Antigua and Barbuda","ATG","Silk","fabio" +"777","Antigua and Barbuda","ATG","Fish, Seafood","fabio" +"778","Antigua and Barbuda","ATG","Wood fuel","fabio" +"779","Antigua and Barbuda","ATG","Industrial roundwood, coniferous","fabio" +"780","Antigua and Barbuda","ATG","Industrial roundwood, non-coniferous","fabio" +"781","Argentina","ARG","Rice (Milled Equivalent)","fabio" +"782","Argentina","ARG","Wheat and products","fabio" +"783","Argentina","ARG","Barley and products","fabio" +"784","Argentina","ARG","Maize and products","fabio" +"785","Argentina","ARG","Rye and products","fabio" +"786","Argentina","ARG","Oats","fabio" +"787","Argentina","ARG","Millet and products","fabio" +"788","Argentina","ARG","Sorghum and products","fabio" +"789","Argentina","ARG","Cereals, Other","fabio" +"790","Argentina","ARG","Potatoes and products","fabio" +"791","Argentina","ARG","Cassava and products","fabio" +"792","Argentina","ARG","Sweet potatoes","fabio" +"793","Argentina","ARG","Roots, Other","fabio" +"794","Argentina","ARG","Yams","fabio" +"795","Argentina","ARG","Sugar cane","fabio" +"796","Argentina","ARG","Sugar beet","fabio" +"797","Argentina","ARG","Beans","fabio" +"798","Argentina","ARG","Peas","fabio" +"799","Argentina","ARG","Pulses, Other and products","fabio" +"800","Argentina","ARG","Nuts and products","fabio" +"801","Argentina","ARG","Soyabeans","fabio" +"802","Argentina","ARG","Groundnuts (Shelled Eq)","fabio" +"803","Argentina","ARG","Sunflower seed","fabio" +"804","Argentina","ARG","Rape and Mustardseed","fabio" +"805","Argentina","ARG","Seed cotton","fabio" +"806","Argentina","ARG","Coconuts - Incl Copra","fabio" +"807","Argentina","ARG","Sesame seed","fabio" +"808","Argentina","ARG","Oil, palm fruit","fabio" +"809","Argentina","ARG","Olives (including preserved)","fabio" +"810","Argentina","ARG","Oilcrops, Other","fabio" +"811","Argentina","ARG","Tomatoes and products","fabio" +"812","Argentina","ARG","Onions","fabio" +"813","Argentina","ARG","Vegetables, Other","fabio" +"814","Argentina","ARG","Oranges, Mandarines","fabio" +"815","Argentina","ARG","Lemons, Limes and products","fabio" +"816","Argentina","ARG","Grapefruit and products","fabio" +"817","Argentina","ARG","Citrus, Other","fabio" +"818","Argentina","ARG","Bananas","fabio" +"819","Argentina","ARG","Plantains","fabio" +"820","Argentina","ARG","Apples and products","fabio" +"821","Argentina","ARG","Pineapples and products","fabio" +"822","Argentina","ARG","Dates","fabio" +"823","Argentina","ARG","Grapes and products (excl wine)","fabio" +"824","Argentina","ARG","Fruits, Other","fabio" +"825","Argentina","ARG","Coffee and products","fabio" +"826","Argentina","ARG","Cocoa Beans and products","fabio" +"827","Argentina","ARG","Tea (including mate)","fabio" +"828","Argentina","ARG","Hops","fabio" +"829","Argentina","ARG","Pepper","fabio" +"830","Argentina","ARG","Pimento","fabio" +"831","Argentina","ARG","Cloves","fabio" +"832","Argentina","ARG","Spices, Other","fabio" +"833","Argentina","ARG","Jute","fabio" +"834","Argentina","ARG","Jute-Like Fibres","fabio" +"835","Argentina","ARG","Soft-Fibres, Other","fabio" +"836","Argentina","ARG","Sisal","fabio" +"837","Argentina","ARG","Abaca","fabio" +"838","Argentina","ARG","Hard Fibres, Other","fabio" +"839","Argentina","ARG","Tobacco","fabio" +"840","Argentina","ARG","Rubber","fabio" +"841","Argentina","ARG","Fodder crops","fabio" +"842","Argentina","ARG","Grazing","fabio" +"843","Argentina","ARG","Cottonseed","fabio" +"844","Argentina","ARG","Palm kernels","fabio" +"845","Argentina","ARG","Sugar non-centrifugal","fabio" +"846","Argentina","ARG","Molasses","fabio" +"847","Argentina","ARG","Sugar, Refined Equiv","fabio" +"848","Argentina","ARG","Sweeteners, Other","fabio" +"849","Argentina","ARG","Soyabean Oil","fabio" +"850","Argentina","ARG","Groundnut Oil","fabio" +"851","Argentina","ARG","Sunflowerseed Oil","fabio" +"852","Argentina","ARG","Rape and Mustard Oil","fabio" +"853","Argentina","ARG","Cottonseed Oil","fabio" +"854","Argentina","ARG","Palmkernel Oil","fabio" +"855","Argentina","ARG","Palm Oil","fabio" +"856","Argentina","ARG","Coconut Oil","fabio" +"857","Argentina","ARG","Sesameseed Oil","fabio" +"858","Argentina","ARG","Olive Oil","fabio" +"859","Argentina","ARG","Ricebran Oil","fabio" +"860","Argentina","ARG","Maize Germ Oil","fabio" +"861","Argentina","ARG","Oilcrops Oil, Other","fabio" +"862","Argentina","ARG","Soyabean Cake","fabio" +"863","Argentina","ARG","Groundnut Cake","fabio" +"864","Argentina","ARG","Sunflowerseed Cake","fabio" +"865","Argentina","ARG","Rape and Mustard Cake","fabio" +"866","Argentina","ARG","Cottonseed Cake","fabio" +"867","Argentina","ARG","Palmkernel Cake","fabio" +"868","Argentina","ARG","Copra Cake","fabio" +"869","Argentina","ARG","Sesameseed Cake","fabio" +"870","Argentina","ARG","Oilseed Cakes, Other","fabio" +"871","Argentina","ARG","Wine","fabio" +"872","Argentina","ARG","Beer","fabio" +"873","Argentina","ARG","Beverages, Fermented","fabio" +"874","Argentina","ARG","Beverages, Alcoholic","fabio" +"875","Argentina","ARG","Alcohol, Non-Food","fabio" +"876","Argentina","ARG","Cotton lint","fabio" +"877","Argentina","ARG","Cattle","fabio" +"878","Argentina","ARG","Buffaloes","fabio" +"879","Argentina","ARG","Sheep","fabio" +"880","Argentina","ARG","Goats","fabio" +"881","Argentina","ARG","Pigs","fabio" +"882","Argentina","ARG","Poultry Birds","fabio" +"883","Argentina","ARG","Horses","fabio" +"884","Argentina","ARG","Asses","fabio" +"885","Argentina","ARG","Mules","fabio" +"886","Argentina","ARG","Camels","fabio" +"887","Argentina","ARG","Camelids, other","fabio" +"888","Argentina","ARG","Rabbits and hares","fabio" +"889","Argentina","ARG","Rodents, other","fabio" +"890","Argentina","ARG","Live animals, other","fabio" +"891","Argentina","ARG","Milk - Excluding Butter","fabio" +"892","Argentina","ARG","Butter, Ghee","fabio" +"893","Argentina","ARG","Eggs","fabio" +"894","Argentina","ARG","Wool (Clean Eq.)","fabio" +"895","Argentina","ARG","Bovine Meat","fabio" +"896","Argentina","ARG","Mutton & Goat Meat","fabio" +"897","Argentina","ARG","Pigmeat","fabio" +"898","Argentina","ARG","Poultry Meat","fabio" +"899","Argentina","ARG","Meat, Other","fabio" +"900","Argentina","ARG","Offals, Edible","fabio" +"901","Argentina","ARG","Fats, Animals, Raw","fabio" +"902","Argentina","ARG","Hides and skins","fabio" +"903","Argentina","ARG","Meat Meal","fabio" +"904","Argentina","ARG","Pet food","fabio" +"905","Argentina","ARG","Honey","fabio" +"906","Argentina","ARG","Silk","fabio" +"907","Argentina","ARG","Fish, Seafood","fabio" +"908","Argentina","ARG","Wood fuel","fabio" +"909","Argentina","ARG","Industrial roundwood, coniferous","fabio" +"910","Argentina","ARG","Industrial roundwood, non-coniferous","fabio" +"911","Australia","AUS","Rice (Milled Equivalent)","fabio" +"912","Australia","AUS","Wheat and products","fabio" +"913","Australia","AUS","Barley and products","fabio" +"914","Australia","AUS","Maize and products","fabio" +"915","Australia","AUS","Rye and products","fabio" +"916","Australia","AUS","Oats","fabio" +"917","Australia","AUS","Millet and products","fabio" +"918","Australia","AUS","Sorghum and products","fabio" +"919","Australia","AUS","Cereals, Other","fabio" +"920","Australia","AUS","Potatoes and products","fabio" +"921","Australia","AUS","Cassava and products","fabio" +"922","Australia","AUS","Sweet potatoes","fabio" +"923","Australia","AUS","Roots, Other","fabio" +"924","Australia","AUS","Yams","fabio" +"925","Australia","AUS","Sugar cane","fabio" +"926","Australia","AUS","Sugar beet","fabio" +"927","Australia","AUS","Beans","fabio" +"928","Australia","AUS","Peas","fabio" +"929","Australia","AUS","Pulses, Other and products","fabio" +"930","Australia","AUS","Nuts and products","fabio" +"931","Australia","AUS","Soyabeans","fabio" +"932","Australia","AUS","Groundnuts (Shelled Eq)","fabio" +"933","Australia","AUS","Sunflower seed","fabio" +"934","Australia","AUS","Rape and Mustardseed","fabio" +"935","Australia","AUS","Seed cotton","fabio" +"936","Australia","AUS","Coconuts - Incl Copra","fabio" +"937","Australia","AUS","Sesame seed","fabio" +"938","Australia","AUS","Oil, palm fruit","fabio" +"939","Australia","AUS","Olives (including preserved)","fabio" +"940","Australia","AUS","Oilcrops, Other","fabio" +"941","Australia","AUS","Tomatoes and products","fabio" +"942","Australia","AUS","Onions","fabio" +"943","Australia","AUS","Vegetables, Other","fabio" +"944","Australia","AUS","Oranges, Mandarines","fabio" +"945","Australia","AUS","Lemons, Limes and products","fabio" +"946","Australia","AUS","Grapefruit and products","fabio" +"947","Australia","AUS","Citrus, Other","fabio" +"948","Australia","AUS","Bananas","fabio" +"949","Australia","AUS","Plantains","fabio" +"950","Australia","AUS","Apples and products","fabio" +"951","Australia","AUS","Pineapples and products","fabio" +"952","Australia","AUS","Dates","fabio" +"953","Australia","AUS","Grapes and products (excl wine)","fabio" +"954","Australia","AUS","Fruits, Other","fabio" +"955","Australia","AUS","Coffee and products","fabio" +"956","Australia","AUS","Cocoa Beans and products","fabio" +"957","Australia","AUS","Tea (including mate)","fabio" +"958","Australia","AUS","Hops","fabio" +"959","Australia","AUS","Pepper","fabio" +"960","Australia","AUS","Pimento","fabio" +"961","Australia","AUS","Cloves","fabio" +"962","Australia","AUS","Spices, Other","fabio" +"963","Australia","AUS","Jute","fabio" +"964","Australia","AUS","Jute-Like Fibres","fabio" +"965","Australia","AUS","Soft-Fibres, Other","fabio" +"966","Australia","AUS","Sisal","fabio" +"967","Australia","AUS","Abaca","fabio" +"968","Australia","AUS","Hard Fibres, Other","fabio" +"969","Australia","AUS","Tobacco","fabio" +"970","Australia","AUS","Rubber","fabio" +"971","Australia","AUS","Fodder crops","fabio" +"972","Australia","AUS","Grazing","fabio" +"973","Australia","AUS","Cottonseed","fabio" +"974","Australia","AUS","Palm kernels","fabio" +"975","Australia","AUS","Sugar non-centrifugal","fabio" +"976","Australia","AUS","Molasses","fabio" +"977","Australia","AUS","Sugar, Refined Equiv","fabio" +"978","Australia","AUS","Sweeteners, Other","fabio" +"979","Australia","AUS","Soyabean Oil","fabio" +"980","Australia","AUS","Groundnut Oil","fabio" +"981","Australia","AUS","Sunflowerseed Oil","fabio" +"982","Australia","AUS","Rape and Mustard Oil","fabio" +"983","Australia","AUS","Cottonseed Oil","fabio" +"984","Australia","AUS","Palmkernel Oil","fabio" +"985","Australia","AUS","Palm Oil","fabio" +"986","Australia","AUS","Coconut Oil","fabio" +"987","Australia","AUS","Sesameseed Oil","fabio" +"988","Australia","AUS","Olive Oil","fabio" +"989","Australia","AUS","Ricebran Oil","fabio" +"990","Australia","AUS","Maize Germ Oil","fabio" +"991","Australia","AUS","Oilcrops Oil, Other","fabio" +"992","Australia","AUS","Soyabean Cake","fabio" +"993","Australia","AUS","Groundnut Cake","fabio" +"994","Australia","AUS","Sunflowerseed Cake","fabio" +"995","Australia","AUS","Rape and Mustard Cake","fabio" +"996","Australia","AUS","Cottonseed Cake","fabio" +"997","Australia","AUS","Palmkernel Cake","fabio" +"998","Australia","AUS","Copra Cake","fabio" +"999","Australia","AUS","Sesameseed Cake","fabio" +"1000","Australia","AUS","Oilseed Cakes, Other","fabio" +"1001","Australia","AUS","Wine","fabio" +"1002","Australia","AUS","Beer","fabio" +"1003","Australia","AUS","Beverages, Fermented","fabio" +"1004","Australia","AUS","Beverages, Alcoholic","fabio" +"1005","Australia","AUS","Alcohol, Non-Food","fabio" +"1006","Australia","AUS","Cotton lint","fabio" +"1007","Australia","AUS","Cattle","fabio" +"1008","Australia","AUS","Buffaloes","fabio" +"1009","Australia","AUS","Sheep","fabio" +"1010","Australia","AUS","Goats","fabio" +"1011","Australia","AUS","Pigs","fabio" +"1012","Australia","AUS","Poultry Birds","fabio" +"1013","Australia","AUS","Horses","fabio" +"1014","Australia","AUS","Asses","fabio" +"1015","Australia","AUS","Mules","fabio" +"1016","Australia","AUS","Camels","fabio" +"1017","Australia","AUS","Camelids, other","fabio" +"1018","Australia","AUS","Rabbits and hares","fabio" +"1019","Australia","AUS","Rodents, other","fabio" +"1020","Australia","AUS","Live animals, other","fabio" +"1021","Australia","AUS","Milk - Excluding Butter","fabio" +"1022","Australia","AUS","Butter, Ghee","fabio" +"1023","Australia","AUS","Eggs","fabio" +"1024","Australia","AUS","Wool (Clean Eq.)","fabio" +"1025","Australia","AUS","Bovine Meat","fabio" +"1026","Australia","AUS","Mutton & Goat Meat","fabio" +"1027","Australia","AUS","Pigmeat","fabio" +"1028","Australia","AUS","Poultry Meat","fabio" +"1029","Australia","AUS","Meat, Other","fabio" +"1030","Australia","AUS","Offals, Edible","fabio" +"1031","Australia","AUS","Fats, Animals, Raw","fabio" +"1032","Australia","AUS","Hides and skins","fabio" +"1033","Australia","AUS","Meat Meal","fabio" +"1034","Australia","AUS","Pet food","fabio" +"1035","Australia","AUS","Honey","fabio" +"1036","Australia","AUS","Silk","fabio" +"1037","Australia","AUS","Fish, Seafood","fabio" +"1038","Australia","AUS","Wood fuel","fabio" +"1039","Australia","AUS","Industrial roundwood, coniferous","fabio" +"1040","Australia","AUS","Industrial roundwood, non-coniferous","fabio" +"1041","Austria","AUT","Rice (Milled Equivalent)","fabio" +"1042","Austria","AUT","Wheat and products","fabio" +"1043","Austria","AUT","Barley and products","fabio" +"1044","Austria","AUT","Maize and products","fabio" +"1045","Austria","AUT","Rye and products","fabio" +"1046","Austria","AUT","Oats","fabio" +"1047","Austria","AUT","Millet and products","fabio" +"1048","Austria","AUT","Sorghum and products","fabio" +"1049","Austria","AUT","Cereals, Other","fabio" +"1050","Austria","AUT","Potatoes and products","fabio" +"1051","Austria","AUT","Cassava and products","fabio" +"1052","Austria","AUT","Sweet potatoes","fabio" +"1053","Austria","AUT","Roots, Other","fabio" +"1054","Austria","AUT","Yams","fabio" +"1055","Austria","AUT","Sugar cane","fabio" +"1056","Austria","AUT","Sugar beet","fabio" +"1057","Austria","AUT","Beans","fabio" +"1058","Austria","AUT","Peas","fabio" +"1059","Austria","AUT","Pulses, Other and products","fabio" +"1060","Austria","AUT","Nuts and products","fabio" +"1061","Austria","AUT","Soyabeans","fabio" +"1062","Austria","AUT","Groundnuts (Shelled Eq)","fabio" +"1063","Austria","AUT","Sunflower seed","fabio" +"1064","Austria","AUT","Rape and Mustardseed","fabio" +"1065","Austria","AUT","Seed cotton","fabio" +"1066","Austria","AUT","Coconuts - Incl Copra","fabio" +"1067","Austria","AUT","Sesame seed","fabio" +"1068","Austria","AUT","Oil, palm fruit","fabio" +"1069","Austria","AUT","Olives (including preserved)","fabio" +"1070","Austria","AUT","Oilcrops, Other","fabio" +"1071","Austria","AUT","Tomatoes and products","fabio" +"1072","Austria","AUT","Onions","fabio" +"1073","Austria","AUT","Vegetables, Other","fabio" +"1074","Austria","AUT","Oranges, Mandarines","fabio" +"1075","Austria","AUT","Lemons, Limes and products","fabio" +"1076","Austria","AUT","Grapefruit and products","fabio" +"1077","Austria","AUT","Citrus, Other","fabio" +"1078","Austria","AUT","Bananas","fabio" +"1079","Austria","AUT","Plantains","fabio" +"1080","Austria","AUT","Apples and products","fabio" +"1081","Austria","AUT","Pineapples and products","fabio" +"1082","Austria","AUT","Dates","fabio" +"1083","Austria","AUT","Grapes and products (excl wine)","fabio" +"1084","Austria","AUT","Fruits, Other","fabio" +"1085","Austria","AUT","Coffee and products","fabio" +"1086","Austria","AUT","Cocoa Beans and products","fabio" +"1087","Austria","AUT","Tea (including mate)","fabio" +"1088","Austria","AUT","Hops","fabio" +"1089","Austria","AUT","Pepper","fabio" +"1090","Austria","AUT","Pimento","fabio" +"1091","Austria","AUT","Cloves","fabio" +"1092","Austria","AUT","Spices, Other","fabio" +"1093","Austria","AUT","Jute","fabio" +"1094","Austria","AUT","Jute-Like Fibres","fabio" +"1095","Austria","AUT","Soft-Fibres, Other","fabio" +"1096","Austria","AUT","Sisal","fabio" +"1097","Austria","AUT","Abaca","fabio" +"1098","Austria","AUT","Hard Fibres, Other","fabio" +"1099","Austria","AUT","Tobacco","fabio" +"1100","Austria","AUT","Rubber","fabio" +"1101","Austria","AUT","Fodder crops","fabio" +"1102","Austria","AUT","Grazing","fabio" +"1103","Austria","AUT","Cottonseed","fabio" +"1104","Austria","AUT","Palm kernels","fabio" +"1105","Austria","AUT","Sugar non-centrifugal","fabio" +"1106","Austria","AUT","Molasses","fabio" +"1107","Austria","AUT","Sugar, Refined Equiv","fabio" +"1108","Austria","AUT","Sweeteners, Other","fabio" +"1109","Austria","AUT","Soyabean Oil","fabio" +"1110","Austria","AUT","Groundnut Oil","fabio" +"1111","Austria","AUT","Sunflowerseed Oil","fabio" +"1112","Austria","AUT","Rape and Mustard Oil","fabio" +"1113","Austria","AUT","Cottonseed Oil","fabio" +"1114","Austria","AUT","Palmkernel Oil","fabio" +"1115","Austria","AUT","Palm Oil","fabio" +"1116","Austria","AUT","Coconut Oil","fabio" +"1117","Austria","AUT","Sesameseed Oil","fabio" +"1118","Austria","AUT","Olive Oil","fabio" +"1119","Austria","AUT","Ricebran Oil","fabio" +"1120","Austria","AUT","Maize Germ Oil","fabio" +"1121","Austria","AUT","Oilcrops Oil, Other","fabio" +"1122","Austria","AUT","Soyabean Cake","fabio" +"1123","Austria","AUT","Groundnut Cake","fabio" +"1124","Austria","AUT","Sunflowerseed Cake","fabio" +"1125","Austria","AUT","Rape and Mustard Cake","fabio" +"1126","Austria","AUT","Cottonseed Cake","fabio" +"1127","Austria","AUT","Palmkernel Cake","fabio" +"1128","Austria","AUT","Copra Cake","fabio" +"1129","Austria","AUT","Sesameseed Cake","fabio" +"1130","Austria","AUT","Oilseed Cakes, Other","fabio" +"1131","Austria","AUT","Wine","fabio" +"1132","Austria","AUT","Beer","fabio" +"1133","Austria","AUT","Beverages, Fermented","fabio" +"1134","Austria","AUT","Beverages, Alcoholic","fabio" +"1135","Austria","AUT","Alcohol, Non-Food","fabio" +"1136","Austria","AUT","Cotton lint","fabio" +"1137","Austria","AUT","Cattle","fabio" +"1138","Austria","AUT","Buffaloes","fabio" +"1139","Austria","AUT","Sheep","fabio" +"1140","Austria","AUT","Goats","fabio" +"1141","Austria","AUT","Pigs","fabio" +"1142","Austria","AUT","Poultry Birds","fabio" +"1143","Austria","AUT","Horses","fabio" +"1144","Austria","AUT","Asses","fabio" +"1145","Austria","AUT","Mules","fabio" +"1146","Austria","AUT","Camels","fabio" +"1147","Austria","AUT","Camelids, other","fabio" +"1148","Austria","AUT","Rabbits and hares","fabio" +"1149","Austria","AUT","Rodents, other","fabio" +"1150","Austria","AUT","Live animals, other","fabio" +"1151","Austria","AUT","Milk - Excluding Butter","fabio" +"1152","Austria","AUT","Butter, Ghee","fabio" +"1153","Austria","AUT","Eggs","fabio" +"1154","Austria","AUT","Wool (Clean Eq.)","fabio" +"1155","Austria","AUT","Bovine Meat","fabio" +"1156","Austria","AUT","Mutton & Goat Meat","fabio" +"1157","Austria","AUT","Pigmeat","fabio" +"1158","Austria","AUT","Poultry Meat","fabio" +"1159","Austria","AUT","Meat, Other","fabio" +"1160","Austria","AUT","Offals, Edible","fabio" +"1161","Austria","AUT","Fats, Animals, Raw","fabio" +"1162","Austria","AUT","Hides and skins","fabio" +"1163","Austria","AUT","Meat Meal","fabio" +"1164","Austria","AUT","Pet food","fabio" +"1165","Austria","AUT","Honey","fabio" +"1166","Austria","AUT","Silk","fabio" +"1167","Austria","AUT","Fish, Seafood","fabio" +"1168","Austria","AUT","Wood fuel","fabio" +"1169","Austria","AUT","Industrial roundwood, coniferous","fabio" +"1170","Austria","AUT","Industrial roundwood, non-coniferous","fabio" +"1171","Bahamas","BHS","Rice (Milled Equivalent)","fabio" +"1172","Bahamas","BHS","Wheat and products","fabio" +"1173","Bahamas","BHS","Barley and products","fabio" +"1174","Bahamas","BHS","Maize and products","fabio" +"1175","Bahamas","BHS","Rye and products","fabio" +"1176","Bahamas","BHS","Oats","fabio" +"1177","Bahamas","BHS","Millet and products","fabio" +"1178","Bahamas","BHS","Sorghum and products","fabio" +"1179","Bahamas","BHS","Cereals, Other","fabio" +"1180","Bahamas","BHS","Potatoes and products","fabio" +"1181","Bahamas","BHS","Cassava and products","fabio" +"1182","Bahamas","BHS","Sweet potatoes","fabio" +"1183","Bahamas","BHS","Roots, Other","fabio" +"1184","Bahamas","BHS","Yams","fabio" +"1185","Bahamas","BHS","Sugar cane","fabio" +"1186","Bahamas","BHS","Sugar beet","fabio" +"1187","Bahamas","BHS","Beans","fabio" +"1188","Bahamas","BHS","Peas","fabio" +"1189","Bahamas","BHS","Pulses, Other and products","fabio" +"1190","Bahamas","BHS","Nuts and products","fabio" +"1191","Bahamas","BHS","Soyabeans","fabio" +"1192","Bahamas","BHS","Groundnuts (Shelled Eq)","fabio" +"1193","Bahamas","BHS","Sunflower seed","fabio" +"1194","Bahamas","BHS","Rape and Mustardseed","fabio" +"1195","Bahamas","BHS","Seed cotton","fabio" +"1196","Bahamas","BHS","Coconuts - Incl Copra","fabio" +"1197","Bahamas","BHS","Sesame seed","fabio" +"1198","Bahamas","BHS","Oil, palm fruit","fabio" +"1199","Bahamas","BHS","Olives (including preserved)","fabio" +"1200","Bahamas","BHS","Oilcrops, Other","fabio" +"1201","Bahamas","BHS","Tomatoes and products","fabio" +"1202","Bahamas","BHS","Onions","fabio" +"1203","Bahamas","BHS","Vegetables, Other","fabio" +"1204","Bahamas","BHS","Oranges, Mandarines","fabio" +"1205","Bahamas","BHS","Lemons, Limes and products","fabio" +"1206","Bahamas","BHS","Grapefruit and products","fabio" +"1207","Bahamas","BHS","Citrus, Other","fabio" +"1208","Bahamas","BHS","Bananas","fabio" +"1209","Bahamas","BHS","Plantains","fabio" +"1210","Bahamas","BHS","Apples and products","fabio" +"1211","Bahamas","BHS","Pineapples and products","fabio" +"1212","Bahamas","BHS","Dates","fabio" +"1213","Bahamas","BHS","Grapes and products (excl wine)","fabio" +"1214","Bahamas","BHS","Fruits, Other","fabio" +"1215","Bahamas","BHS","Coffee and products","fabio" +"1216","Bahamas","BHS","Cocoa Beans and products","fabio" +"1217","Bahamas","BHS","Tea (including mate)","fabio" +"1218","Bahamas","BHS","Hops","fabio" +"1219","Bahamas","BHS","Pepper","fabio" +"1220","Bahamas","BHS","Pimento","fabio" +"1221","Bahamas","BHS","Cloves","fabio" +"1222","Bahamas","BHS","Spices, Other","fabio" +"1223","Bahamas","BHS","Jute","fabio" +"1224","Bahamas","BHS","Jute-Like Fibres","fabio" +"1225","Bahamas","BHS","Soft-Fibres, Other","fabio" +"1226","Bahamas","BHS","Sisal","fabio" +"1227","Bahamas","BHS","Abaca","fabio" +"1228","Bahamas","BHS","Hard Fibres, Other","fabio" +"1229","Bahamas","BHS","Tobacco","fabio" +"1230","Bahamas","BHS","Rubber","fabio" +"1231","Bahamas","BHS","Fodder crops","fabio" +"1232","Bahamas","BHS","Grazing","fabio" +"1233","Bahamas","BHS","Cottonseed","fabio" +"1234","Bahamas","BHS","Palm kernels","fabio" +"1235","Bahamas","BHS","Sugar non-centrifugal","fabio" +"1236","Bahamas","BHS","Molasses","fabio" +"1237","Bahamas","BHS","Sugar, Refined Equiv","fabio" +"1238","Bahamas","BHS","Sweeteners, Other","fabio" +"1239","Bahamas","BHS","Soyabean Oil","fabio" +"1240","Bahamas","BHS","Groundnut Oil","fabio" +"1241","Bahamas","BHS","Sunflowerseed Oil","fabio" +"1242","Bahamas","BHS","Rape and Mustard Oil","fabio" +"1243","Bahamas","BHS","Cottonseed Oil","fabio" +"1244","Bahamas","BHS","Palmkernel Oil","fabio" +"1245","Bahamas","BHS","Palm Oil","fabio" +"1246","Bahamas","BHS","Coconut Oil","fabio" +"1247","Bahamas","BHS","Sesameseed Oil","fabio" +"1248","Bahamas","BHS","Olive Oil","fabio" +"1249","Bahamas","BHS","Ricebran Oil","fabio" +"1250","Bahamas","BHS","Maize Germ Oil","fabio" +"1251","Bahamas","BHS","Oilcrops Oil, Other","fabio" +"1252","Bahamas","BHS","Soyabean Cake","fabio" +"1253","Bahamas","BHS","Groundnut Cake","fabio" +"1254","Bahamas","BHS","Sunflowerseed Cake","fabio" +"1255","Bahamas","BHS","Rape and Mustard Cake","fabio" +"1256","Bahamas","BHS","Cottonseed Cake","fabio" +"1257","Bahamas","BHS","Palmkernel Cake","fabio" +"1258","Bahamas","BHS","Copra Cake","fabio" +"1259","Bahamas","BHS","Sesameseed Cake","fabio" +"1260","Bahamas","BHS","Oilseed Cakes, Other","fabio" +"1261","Bahamas","BHS","Wine","fabio" +"1262","Bahamas","BHS","Beer","fabio" +"1263","Bahamas","BHS","Beverages, Fermented","fabio" +"1264","Bahamas","BHS","Beverages, Alcoholic","fabio" +"1265","Bahamas","BHS","Alcohol, Non-Food","fabio" +"1266","Bahamas","BHS","Cotton lint","fabio" +"1267","Bahamas","BHS","Cattle","fabio" +"1268","Bahamas","BHS","Buffaloes","fabio" +"1269","Bahamas","BHS","Sheep","fabio" +"1270","Bahamas","BHS","Goats","fabio" +"1271","Bahamas","BHS","Pigs","fabio" +"1272","Bahamas","BHS","Poultry Birds","fabio" +"1273","Bahamas","BHS","Horses","fabio" +"1274","Bahamas","BHS","Asses","fabio" +"1275","Bahamas","BHS","Mules","fabio" +"1276","Bahamas","BHS","Camels","fabio" +"1277","Bahamas","BHS","Camelids, other","fabio" +"1278","Bahamas","BHS","Rabbits and hares","fabio" +"1279","Bahamas","BHS","Rodents, other","fabio" +"1280","Bahamas","BHS","Live animals, other","fabio" +"1281","Bahamas","BHS","Milk - Excluding Butter","fabio" +"1282","Bahamas","BHS","Butter, Ghee","fabio" +"1283","Bahamas","BHS","Eggs","fabio" +"1284","Bahamas","BHS","Wool (Clean Eq.)","fabio" +"1285","Bahamas","BHS","Bovine Meat","fabio" +"1286","Bahamas","BHS","Mutton & Goat Meat","fabio" +"1287","Bahamas","BHS","Pigmeat","fabio" +"1288","Bahamas","BHS","Poultry Meat","fabio" +"1289","Bahamas","BHS","Meat, Other","fabio" +"1290","Bahamas","BHS","Offals, Edible","fabio" +"1291","Bahamas","BHS","Fats, Animals, Raw","fabio" +"1292","Bahamas","BHS","Hides and skins","fabio" +"1293","Bahamas","BHS","Meat Meal","fabio" +"1294","Bahamas","BHS","Pet food","fabio" +"1295","Bahamas","BHS","Honey","fabio" +"1296","Bahamas","BHS","Silk","fabio" +"1297","Bahamas","BHS","Fish, Seafood","fabio" +"1298","Bahamas","BHS","Wood fuel","fabio" +"1299","Bahamas","BHS","Industrial roundwood, coniferous","fabio" +"1300","Bahamas","BHS","Industrial roundwood, non-coniferous","fabio" +"1301","Bahrain","BHR","Rice (Milled Equivalent)","fabio" +"1302","Bahrain","BHR","Wheat and products","fabio" +"1303","Bahrain","BHR","Barley and products","fabio" +"1304","Bahrain","BHR","Maize and products","fabio" +"1305","Bahrain","BHR","Rye and products","fabio" +"1306","Bahrain","BHR","Oats","fabio" +"1307","Bahrain","BHR","Millet and products","fabio" +"1308","Bahrain","BHR","Sorghum and products","fabio" +"1309","Bahrain","BHR","Cereals, Other","fabio" +"1310","Bahrain","BHR","Potatoes and products","fabio" +"1311","Bahrain","BHR","Cassava and products","fabio" +"1312","Bahrain","BHR","Sweet potatoes","fabio" +"1313","Bahrain","BHR","Roots, Other","fabio" +"1314","Bahrain","BHR","Yams","fabio" +"1315","Bahrain","BHR","Sugar cane","fabio" +"1316","Bahrain","BHR","Sugar beet","fabio" +"1317","Bahrain","BHR","Beans","fabio" +"1318","Bahrain","BHR","Peas","fabio" +"1319","Bahrain","BHR","Pulses, Other and products","fabio" +"1320","Bahrain","BHR","Nuts and products","fabio" +"1321","Bahrain","BHR","Soyabeans","fabio" +"1322","Bahrain","BHR","Groundnuts (Shelled Eq)","fabio" +"1323","Bahrain","BHR","Sunflower seed","fabio" +"1324","Bahrain","BHR","Rape and Mustardseed","fabio" +"1325","Bahrain","BHR","Seed cotton","fabio" +"1326","Bahrain","BHR","Coconuts - Incl Copra","fabio" +"1327","Bahrain","BHR","Sesame seed","fabio" +"1328","Bahrain","BHR","Oil, palm fruit","fabio" +"1329","Bahrain","BHR","Olives (including preserved)","fabio" +"1330","Bahrain","BHR","Oilcrops, Other","fabio" +"1331","Bahrain","BHR","Tomatoes and products","fabio" +"1332","Bahrain","BHR","Onions","fabio" +"1333","Bahrain","BHR","Vegetables, Other","fabio" +"1334","Bahrain","BHR","Oranges, Mandarines","fabio" +"1335","Bahrain","BHR","Lemons, Limes and products","fabio" +"1336","Bahrain","BHR","Grapefruit and products","fabio" +"1337","Bahrain","BHR","Citrus, Other","fabio" +"1338","Bahrain","BHR","Bananas","fabio" +"1339","Bahrain","BHR","Plantains","fabio" +"1340","Bahrain","BHR","Apples and products","fabio" +"1341","Bahrain","BHR","Pineapples and products","fabio" +"1342","Bahrain","BHR","Dates","fabio" +"1343","Bahrain","BHR","Grapes and products (excl wine)","fabio" +"1344","Bahrain","BHR","Fruits, Other","fabio" +"1345","Bahrain","BHR","Coffee and products","fabio" +"1346","Bahrain","BHR","Cocoa Beans and products","fabio" +"1347","Bahrain","BHR","Tea (including mate)","fabio" +"1348","Bahrain","BHR","Hops","fabio" +"1349","Bahrain","BHR","Pepper","fabio" +"1350","Bahrain","BHR","Pimento","fabio" +"1351","Bahrain","BHR","Cloves","fabio" +"1352","Bahrain","BHR","Spices, Other","fabio" +"1353","Bahrain","BHR","Jute","fabio" +"1354","Bahrain","BHR","Jute-Like Fibres","fabio" +"1355","Bahrain","BHR","Soft-Fibres, Other","fabio" +"1356","Bahrain","BHR","Sisal","fabio" +"1357","Bahrain","BHR","Abaca","fabio" +"1358","Bahrain","BHR","Hard Fibres, Other","fabio" +"1359","Bahrain","BHR","Tobacco","fabio" +"1360","Bahrain","BHR","Rubber","fabio" +"1361","Bahrain","BHR","Fodder crops","fabio" +"1362","Bahrain","BHR","Grazing","fabio" +"1363","Bahrain","BHR","Cottonseed","fabio" +"1364","Bahrain","BHR","Palm kernels","fabio" +"1365","Bahrain","BHR","Sugar non-centrifugal","fabio" +"1366","Bahrain","BHR","Molasses","fabio" +"1367","Bahrain","BHR","Sugar, Refined Equiv","fabio" +"1368","Bahrain","BHR","Sweeteners, Other","fabio" +"1369","Bahrain","BHR","Soyabean Oil","fabio" +"1370","Bahrain","BHR","Groundnut Oil","fabio" +"1371","Bahrain","BHR","Sunflowerseed Oil","fabio" +"1372","Bahrain","BHR","Rape and Mustard Oil","fabio" +"1373","Bahrain","BHR","Cottonseed Oil","fabio" +"1374","Bahrain","BHR","Palmkernel Oil","fabio" +"1375","Bahrain","BHR","Palm Oil","fabio" +"1376","Bahrain","BHR","Coconut Oil","fabio" +"1377","Bahrain","BHR","Sesameseed Oil","fabio" +"1378","Bahrain","BHR","Olive Oil","fabio" +"1379","Bahrain","BHR","Ricebran Oil","fabio" +"1380","Bahrain","BHR","Maize Germ Oil","fabio" +"1381","Bahrain","BHR","Oilcrops Oil, Other","fabio" +"1382","Bahrain","BHR","Soyabean Cake","fabio" +"1383","Bahrain","BHR","Groundnut Cake","fabio" +"1384","Bahrain","BHR","Sunflowerseed Cake","fabio" +"1385","Bahrain","BHR","Rape and Mustard Cake","fabio" +"1386","Bahrain","BHR","Cottonseed Cake","fabio" +"1387","Bahrain","BHR","Palmkernel Cake","fabio" +"1388","Bahrain","BHR","Copra Cake","fabio" +"1389","Bahrain","BHR","Sesameseed Cake","fabio" +"1390","Bahrain","BHR","Oilseed Cakes, Other","fabio" +"1391","Bahrain","BHR","Wine","fabio" +"1392","Bahrain","BHR","Beer","fabio" +"1393","Bahrain","BHR","Beverages, Fermented","fabio" +"1394","Bahrain","BHR","Beverages, Alcoholic","fabio" +"1395","Bahrain","BHR","Alcohol, Non-Food","fabio" +"1396","Bahrain","BHR","Cotton lint","fabio" +"1397","Bahrain","BHR","Cattle","fabio" +"1398","Bahrain","BHR","Buffaloes","fabio" +"1399","Bahrain","BHR","Sheep","fabio" +"1400","Bahrain","BHR","Goats","fabio" +"1401","Bahrain","BHR","Pigs","fabio" +"1402","Bahrain","BHR","Poultry Birds","fabio" +"1403","Bahrain","BHR","Horses","fabio" +"1404","Bahrain","BHR","Asses","fabio" +"1405","Bahrain","BHR","Mules","fabio" +"1406","Bahrain","BHR","Camels","fabio" +"1407","Bahrain","BHR","Camelids, other","fabio" +"1408","Bahrain","BHR","Rabbits and hares","fabio" +"1409","Bahrain","BHR","Rodents, other","fabio" +"1410","Bahrain","BHR","Live animals, other","fabio" +"1411","Bahrain","BHR","Milk - Excluding Butter","fabio" +"1412","Bahrain","BHR","Butter, Ghee","fabio" +"1413","Bahrain","BHR","Eggs","fabio" +"1414","Bahrain","BHR","Wool (Clean Eq.)","fabio" +"1415","Bahrain","BHR","Bovine Meat","fabio" +"1416","Bahrain","BHR","Mutton & Goat Meat","fabio" +"1417","Bahrain","BHR","Pigmeat","fabio" +"1418","Bahrain","BHR","Poultry Meat","fabio" +"1419","Bahrain","BHR","Meat, Other","fabio" +"1420","Bahrain","BHR","Offals, Edible","fabio" +"1421","Bahrain","BHR","Fats, Animals, Raw","fabio" +"1422","Bahrain","BHR","Hides and skins","fabio" +"1423","Bahrain","BHR","Meat Meal","fabio" +"1424","Bahrain","BHR","Pet food","fabio" +"1425","Bahrain","BHR","Honey","fabio" +"1426","Bahrain","BHR","Silk","fabio" +"1427","Bahrain","BHR","Fish, Seafood","fabio" +"1428","Bahrain","BHR","Wood fuel","fabio" +"1429","Bahrain","BHR","Industrial roundwood, coniferous","fabio" +"1430","Bahrain","BHR","Industrial roundwood, non-coniferous","fabio" +"1431","Barbados","BRB","Rice (Milled Equivalent)","fabio" +"1432","Barbados","BRB","Wheat and products","fabio" +"1433","Barbados","BRB","Barley and products","fabio" +"1434","Barbados","BRB","Maize and products","fabio" +"1435","Barbados","BRB","Rye and products","fabio" +"1436","Barbados","BRB","Oats","fabio" +"1437","Barbados","BRB","Millet and products","fabio" +"1438","Barbados","BRB","Sorghum and products","fabio" +"1439","Barbados","BRB","Cereals, Other","fabio" +"1440","Barbados","BRB","Potatoes and products","fabio" +"1441","Barbados","BRB","Cassava and products","fabio" +"1442","Barbados","BRB","Sweet potatoes","fabio" +"1443","Barbados","BRB","Roots, Other","fabio" +"1444","Barbados","BRB","Yams","fabio" +"1445","Barbados","BRB","Sugar cane","fabio" +"1446","Barbados","BRB","Sugar beet","fabio" +"1447","Barbados","BRB","Beans","fabio" +"1448","Barbados","BRB","Peas","fabio" +"1449","Barbados","BRB","Pulses, Other and products","fabio" +"1450","Barbados","BRB","Nuts and products","fabio" +"1451","Barbados","BRB","Soyabeans","fabio" +"1452","Barbados","BRB","Groundnuts (Shelled Eq)","fabio" +"1453","Barbados","BRB","Sunflower seed","fabio" +"1454","Barbados","BRB","Rape and Mustardseed","fabio" +"1455","Barbados","BRB","Seed cotton","fabio" +"1456","Barbados","BRB","Coconuts - Incl Copra","fabio" +"1457","Barbados","BRB","Sesame seed","fabio" +"1458","Barbados","BRB","Oil, palm fruit","fabio" +"1459","Barbados","BRB","Olives (including preserved)","fabio" +"1460","Barbados","BRB","Oilcrops, Other","fabio" +"1461","Barbados","BRB","Tomatoes and products","fabio" +"1462","Barbados","BRB","Onions","fabio" +"1463","Barbados","BRB","Vegetables, Other","fabio" +"1464","Barbados","BRB","Oranges, Mandarines","fabio" +"1465","Barbados","BRB","Lemons, Limes and products","fabio" +"1466","Barbados","BRB","Grapefruit and products","fabio" +"1467","Barbados","BRB","Citrus, Other","fabio" +"1468","Barbados","BRB","Bananas","fabio" +"1469","Barbados","BRB","Plantains","fabio" +"1470","Barbados","BRB","Apples and products","fabio" +"1471","Barbados","BRB","Pineapples and products","fabio" +"1472","Barbados","BRB","Dates","fabio" +"1473","Barbados","BRB","Grapes and products (excl wine)","fabio" +"1474","Barbados","BRB","Fruits, Other","fabio" +"1475","Barbados","BRB","Coffee and products","fabio" +"1476","Barbados","BRB","Cocoa Beans and products","fabio" +"1477","Barbados","BRB","Tea (including mate)","fabio" +"1478","Barbados","BRB","Hops","fabio" +"1479","Barbados","BRB","Pepper","fabio" +"1480","Barbados","BRB","Pimento","fabio" +"1481","Barbados","BRB","Cloves","fabio" +"1482","Barbados","BRB","Spices, Other","fabio" +"1483","Barbados","BRB","Jute","fabio" +"1484","Barbados","BRB","Jute-Like Fibres","fabio" +"1485","Barbados","BRB","Soft-Fibres, Other","fabio" +"1486","Barbados","BRB","Sisal","fabio" +"1487","Barbados","BRB","Abaca","fabio" +"1488","Barbados","BRB","Hard Fibres, Other","fabio" +"1489","Barbados","BRB","Tobacco","fabio" +"1490","Barbados","BRB","Rubber","fabio" +"1491","Barbados","BRB","Fodder crops","fabio" +"1492","Barbados","BRB","Grazing","fabio" +"1493","Barbados","BRB","Cottonseed","fabio" +"1494","Barbados","BRB","Palm kernels","fabio" +"1495","Barbados","BRB","Sugar non-centrifugal","fabio" +"1496","Barbados","BRB","Molasses","fabio" +"1497","Barbados","BRB","Sugar, Refined Equiv","fabio" +"1498","Barbados","BRB","Sweeteners, Other","fabio" +"1499","Barbados","BRB","Soyabean Oil","fabio" +"1500","Barbados","BRB","Groundnut Oil","fabio" +"1501","Barbados","BRB","Sunflowerseed Oil","fabio" +"1502","Barbados","BRB","Rape and Mustard Oil","fabio" +"1503","Barbados","BRB","Cottonseed Oil","fabio" +"1504","Barbados","BRB","Palmkernel Oil","fabio" +"1505","Barbados","BRB","Palm Oil","fabio" +"1506","Barbados","BRB","Coconut Oil","fabio" +"1507","Barbados","BRB","Sesameseed Oil","fabio" +"1508","Barbados","BRB","Olive Oil","fabio" +"1509","Barbados","BRB","Ricebran Oil","fabio" +"1510","Barbados","BRB","Maize Germ Oil","fabio" +"1511","Barbados","BRB","Oilcrops Oil, Other","fabio" +"1512","Barbados","BRB","Soyabean Cake","fabio" +"1513","Barbados","BRB","Groundnut Cake","fabio" +"1514","Barbados","BRB","Sunflowerseed Cake","fabio" +"1515","Barbados","BRB","Rape and Mustard Cake","fabio" +"1516","Barbados","BRB","Cottonseed Cake","fabio" +"1517","Barbados","BRB","Palmkernel Cake","fabio" +"1518","Barbados","BRB","Copra Cake","fabio" +"1519","Barbados","BRB","Sesameseed Cake","fabio" +"1520","Barbados","BRB","Oilseed Cakes, Other","fabio" +"1521","Barbados","BRB","Wine","fabio" +"1522","Barbados","BRB","Beer","fabio" +"1523","Barbados","BRB","Beverages, Fermented","fabio" +"1524","Barbados","BRB","Beverages, Alcoholic","fabio" +"1525","Barbados","BRB","Alcohol, Non-Food","fabio" +"1526","Barbados","BRB","Cotton lint","fabio" +"1527","Barbados","BRB","Cattle","fabio" +"1528","Barbados","BRB","Buffaloes","fabio" +"1529","Barbados","BRB","Sheep","fabio" +"1530","Barbados","BRB","Goats","fabio" +"1531","Barbados","BRB","Pigs","fabio" +"1532","Barbados","BRB","Poultry Birds","fabio" +"1533","Barbados","BRB","Horses","fabio" +"1534","Barbados","BRB","Asses","fabio" +"1535","Barbados","BRB","Mules","fabio" +"1536","Barbados","BRB","Camels","fabio" +"1537","Barbados","BRB","Camelids, other","fabio" +"1538","Barbados","BRB","Rabbits and hares","fabio" +"1539","Barbados","BRB","Rodents, other","fabio" +"1540","Barbados","BRB","Live animals, other","fabio" +"1541","Barbados","BRB","Milk - Excluding Butter","fabio" +"1542","Barbados","BRB","Butter, Ghee","fabio" +"1543","Barbados","BRB","Eggs","fabio" +"1544","Barbados","BRB","Wool (Clean Eq.)","fabio" +"1545","Barbados","BRB","Bovine Meat","fabio" +"1546","Barbados","BRB","Mutton & Goat Meat","fabio" +"1547","Barbados","BRB","Pigmeat","fabio" +"1548","Barbados","BRB","Poultry Meat","fabio" +"1549","Barbados","BRB","Meat, Other","fabio" +"1550","Barbados","BRB","Offals, Edible","fabio" +"1551","Barbados","BRB","Fats, Animals, Raw","fabio" +"1552","Barbados","BRB","Hides and skins","fabio" +"1553","Barbados","BRB","Meat Meal","fabio" +"1554","Barbados","BRB","Pet food","fabio" +"1555","Barbados","BRB","Honey","fabio" +"1556","Barbados","BRB","Silk","fabio" +"1557","Barbados","BRB","Fish, Seafood","fabio" +"1558","Barbados","BRB","Wood fuel","fabio" +"1559","Barbados","BRB","Industrial roundwood, coniferous","fabio" +"1560","Barbados","BRB","Industrial roundwood, non-coniferous","fabio" +"1561","Belgium-Luxembourg","BLX","Rice (Milled Equivalent)","fabio" +"1562","Belgium-Luxembourg","BLX","Wheat and products","fabio" +"1563","Belgium-Luxembourg","BLX","Barley and products","fabio" +"1564","Belgium-Luxembourg","BLX","Maize and products","fabio" +"1565","Belgium-Luxembourg","BLX","Rye and products","fabio" +"1566","Belgium-Luxembourg","BLX","Oats","fabio" +"1567","Belgium-Luxembourg","BLX","Millet and products","fabio" +"1568","Belgium-Luxembourg","BLX","Sorghum and products","fabio" +"1569","Belgium-Luxembourg","BLX","Cereals, Other","fabio" +"1570","Belgium-Luxembourg","BLX","Potatoes and products","fabio" +"1571","Belgium-Luxembourg","BLX","Cassava and products","fabio" +"1572","Belgium-Luxembourg","BLX","Sweet potatoes","fabio" +"1573","Belgium-Luxembourg","BLX","Roots, Other","fabio" +"1574","Belgium-Luxembourg","BLX","Yams","fabio" +"1575","Belgium-Luxembourg","BLX","Sugar cane","fabio" +"1576","Belgium-Luxembourg","BLX","Sugar beet","fabio" +"1577","Belgium-Luxembourg","BLX","Beans","fabio" +"1578","Belgium-Luxembourg","BLX","Peas","fabio" +"1579","Belgium-Luxembourg","BLX","Pulses, Other and products","fabio" +"1580","Belgium-Luxembourg","BLX","Nuts and products","fabio" +"1581","Belgium-Luxembourg","BLX","Soyabeans","fabio" +"1582","Belgium-Luxembourg","BLX","Groundnuts (Shelled Eq)","fabio" +"1583","Belgium-Luxembourg","BLX","Sunflower seed","fabio" +"1584","Belgium-Luxembourg","BLX","Rape and Mustardseed","fabio" +"1585","Belgium-Luxembourg","BLX","Seed cotton","fabio" +"1586","Belgium-Luxembourg","BLX","Coconuts - Incl Copra","fabio" +"1587","Belgium-Luxembourg","BLX","Sesame seed","fabio" +"1588","Belgium-Luxembourg","BLX","Oil, palm fruit","fabio" +"1589","Belgium-Luxembourg","BLX","Olives (including preserved)","fabio" +"1590","Belgium-Luxembourg","BLX","Oilcrops, Other","fabio" +"1591","Belgium-Luxembourg","BLX","Tomatoes and products","fabio" +"1592","Belgium-Luxembourg","BLX","Onions","fabio" +"1593","Belgium-Luxembourg","BLX","Vegetables, Other","fabio" +"1594","Belgium-Luxembourg","BLX","Oranges, Mandarines","fabio" +"1595","Belgium-Luxembourg","BLX","Lemons, Limes and products","fabio" +"1596","Belgium-Luxembourg","BLX","Grapefruit and products","fabio" +"1597","Belgium-Luxembourg","BLX","Citrus, Other","fabio" +"1598","Belgium-Luxembourg","BLX","Bananas","fabio" +"1599","Belgium-Luxembourg","BLX","Plantains","fabio" +"1600","Belgium-Luxembourg","BLX","Apples and products","fabio" +"1601","Belgium-Luxembourg","BLX","Pineapples and products","fabio" +"1602","Belgium-Luxembourg","BLX","Dates","fabio" +"1603","Belgium-Luxembourg","BLX","Grapes and products (excl wine)","fabio" +"1604","Belgium-Luxembourg","BLX","Fruits, Other","fabio" +"1605","Belgium-Luxembourg","BLX","Coffee and products","fabio" +"1606","Belgium-Luxembourg","BLX","Cocoa Beans and products","fabio" +"1607","Belgium-Luxembourg","BLX","Tea (including mate)","fabio" +"1608","Belgium-Luxembourg","BLX","Hops","fabio" +"1609","Belgium-Luxembourg","BLX","Pepper","fabio" +"1610","Belgium-Luxembourg","BLX","Pimento","fabio" +"1611","Belgium-Luxembourg","BLX","Cloves","fabio" +"1612","Belgium-Luxembourg","BLX","Spices, Other","fabio" +"1613","Belgium-Luxembourg","BLX","Jute","fabio" +"1614","Belgium-Luxembourg","BLX","Jute-Like Fibres","fabio" +"1615","Belgium-Luxembourg","BLX","Soft-Fibres, Other","fabio" +"1616","Belgium-Luxembourg","BLX","Sisal","fabio" +"1617","Belgium-Luxembourg","BLX","Abaca","fabio" +"1618","Belgium-Luxembourg","BLX","Hard Fibres, Other","fabio" +"1619","Belgium-Luxembourg","BLX","Tobacco","fabio" +"1620","Belgium-Luxembourg","BLX","Rubber","fabio" +"1621","Belgium-Luxembourg","BLX","Fodder crops","fabio" +"1622","Belgium-Luxembourg","BLX","Grazing","fabio" +"1623","Belgium-Luxembourg","BLX","Cottonseed","fabio" +"1624","Belgium-Luxembourg","BLX","Palm kernels","fabio" +"1625","Belgium-Luxembourg","BLX","Sugar non-centrifugal","fabio" +"1626","Belgium-Luxembourg","BLX","Molasses","fabio" +"1627","Belgium-Luxembourg","BLX","Sugar, Refined Equiv","fabio" +"1628","Belgium-Luxembourg","BLX","Sweeteners, Other","fabio" +"1629","Belgium-Luxembourg","BLX","Soyabean Oil","fabio" +"1630","Belgium-Luxembourg","BLX","Groundnut Oil","fabio" +"1631","Belgium-Luxembourg","BLX","Sunflowerseed Oil","fabio" +"1632","Belgium-Luxembourg","BLX","Rape and Mustard Oil","fabio" +"1633","Belgium-Luxembourg","BLX","Cottonseed Oil","fabio" +"1634","Belgium-Luxembourg","BLX","Palmkernel Oil","fabio" +"1635","Belgium-Luxembourg","BLX","Palm Oil","fabio" +"1636","Belgium-Luxembourg","BLX","Coconut Oil","fabio" +"1637","Belgium-Luxembourg","BLX","Sesameseed Oil","fabio" +"1638","Belgium-Luxembourg","BLX","Olive Oil","fabio" +"1639","Belgium-Luxembourg","BLX","Ricebran Oil","fabio" +"1640","Belgium-Luxembourg","BLX","Maize Germ Oil","fabio" +"1641","Belgium-Luxembourg","BLX","Oilcrops Oil, Other","fabio" +"1642","Belgium-Luxembourg","BLX","Soyabean Cake","fabio" +"1643","Belgium-Luxembourg","BLX","Groundnut Cake","fabio" +"1644","Belgium-Luxembourg","BLX","Sunflowerseed Cake","fabio" +"1645","Belgium-Luxembourg","BLX","Rape and Mustard Cake","fabio" +"1646","Belgium-Luxembourg","BLX","Cottonseed Cake","fabio" +"1647","Belgium-Luxembourg","BLX","Palmkernel Cake","fabio" +"1648","Belgium-Luxembourg","BLX","Copra Cake","fabio" +"1649","Belgium-Luxembourg","BLX","Sesameseed Cake","fabio" +"1650","Belgium-Luxembourg","BLX","Oilseed Cakes, Other","fabio" +"1651","Belgium-Luxembourg","BLX","Wine","fabio" +"1652","Belgium-Luxembourg","BLX","Beer","fabio" +"1653","Belgium-Luxembourg","BLX","Beverages, Fermented","fabio" +"1654","Belgium-Luxembourg","BLX","Beverages, Alcoholic","fabio" +"1655","Belgium-Luxembourg","BLX","Alcohol, Non-Food","fabio" +"1656","Belgium-Luxembourg","BLX","Cotton lint","fabio" +"1657","Belgium-Luxembourg","BLX","Cattle","fabio" +"1658","Belgium-Luxembourg","BLX","Buffaloes","fabio" +"1659","Belgium-Luxembourg","BLX","Sheep","fabio" +"1660","Belgium-Luxembourg","BLX","Goats","fabio" +"1661","Belgium-Luxembourg","BLX","Pigs","fabio" +"1662","Belgium-Luxembourg","BLX","Poultry Birds","fabio" +"1663","Belgium-Luxembourg","BLX","Horses","fabio" +"1664","Belgium-Luxembourg","BLX","Asses","fabio" +"1665","Belgium-Luxembourg","BLX","Mules","fabio" +"1666","Belgium-Luxembourg","BLX","Camels","fabio" +"1667","Belgium-Luxembourg","BLX","Camelids, other","fabio" +"1668","Belgium-Luxembourg","BLX","Rabbits and hares","fabio" +"1669","Belgium-Luxembourg","BLX","Rodents, other","fabio" +"1670","Belgium-Luxembourg","BLX","Live animals, other","fabio" +"1671","Belgium-Luxembourg","BLX","Milk - Excluding Butter","fabio" +"1672","Belgium-Luxembourg","BLX","Butter, Ghee","fabio" +"1673","Belgium-Luxembourg","BLX","Eggs","fabio" +"1674","Belgium-Luxembourg","BLX","Wool (Clean Eq.)","fabio" +"1675","Belgium-Luxembourg","BLX","Bovine Meat","fabio" +"1676","Belgium-Luxembourg","BLX","Mutton & Goat Meat","fabio" +"1677","Belgium-Luxembourg","BLX","Pigmeat","fabio" +"1678","Belgium-Luxembourg","BLX","Poultry Meat","fabio" +"1679","Belgium-Luxembourg","BLX","Meat, Other","fabio" +"1680","Belgium-Luxembourg","BLX","Offals, Edible","fabio" +"1681","Belgium-Luxembourg","BLX","Fats, Animals, Raw","fabio" +"1682","Belgium-Luxembourg","BLX","Hides and skins","fabio" +"1683","Belgium-Luxembourg","BLX","Meat Meal","fabio" +"1684","Belgium-Luxembourg","BLX","Pet food","fabio" +"1685","Belgium-Luxembourg","BLX","Honey","fabio" +"1686","Belgium-Luxembourg","BLX","Silk","fabio" +"1687","Belgium-Luxembourg","BLX","Fish, Seafood","fabio" +"1688","Belgium-Luxembourg","BLX","Wood fuel","fabio" +"1689","Belgium-Luxembourg","BLX","Industrial roundwood, coniferous","fabio" +"1690","Belgium-Luxembourg","BLX","Industrial roundwood, non-coniferous","fabio" +"1691","Bangladesh","BGD","Rice (Milled Equivalent)","fabio" +"1692","Bangladesh","BGD","Wheat and products","fabio" +"1693","Bangladesh","BGD","Barley and products","fabio" +"1694","Bangladesh","BGD","Maize and products","fabio" +"1695","Bangladesh","BGD","Rye and products","fabio" +"1696","Bangladesh","BGD","Oats","fabio" +"1697","Bangladesh","BGD","Millet and products","fabio" +"1698","Bangladesh","BGD","Sorghum and products","fabio" +"1699","Bangladesh","BGD","Cereals, Other","fabio" +"1700","Bangladesh","BGD","Potatoes and products","fabio" +"1701","Bangladesh","BGD","Cassava and products","fabio" +"1702","Bangladesh","BGD","Sweet potatoes","fabio" +"1703","Bangladesh","BGD","Roots, Other","fabio" +"1704","Bangladesh","BGD","Yams","fabio" +"1705","Bangladesh","BGD","Sugar cane","fabio" +"1706","Bangladesh","BGD","Sugar beet","fabio" +"1707","Bangladesh","BGD","Beans","fabio" +"1708","Bangladesh","BGD","Peas","fabio" +"1709","Bangladesh","BGD","Pulses, Other and products","fabio" +"1710","Bangladesh","BGD","Nuts and products","fabio" +"1711","Bangladesh","BGD","Soyabeans","fabio" +"1712","Bangladesh","BGD","Groundnuts (Shelled Eq)","fabio" +"1713","Bangladesh","BGD","Sunflower seed","fabio" +"1714","Bangladesh","BGD","Rape and Mustardseed","fabio" +"1715","Bangladesh","BGD","Seed cotton","fabio" +"1716","Bangladesh","BGD","Coconuts - Incl Copra","fabio" +"1717","Bangladesh","BGD","Sesame seed","fabio" +"1718","Bangladesh","BGD","Oil, palm fruit","fabio" +"1719","Bangladesh","BGD","Olives (including preserved)","fabio" +"1720","Bangladesh","BGD","Oilcrops, Other","fabio" +"1721","Bangladesh","BGD","Tomatoes and products","fabio" +"1722","Bangladesh","BGD","Onions","fabio" +"1723","Bangladesh","BGD","Vegetables, Other","fabio" +"1724","Bangladesh","BGD","Oranges, Mandarines","fabio" +"1725","Bangladesh","BGD","Lemons, Limes and products","fabio" +"1726","Bangladesh","BGD","Grapefruit and products","fabio" +"1727","Bangladesh","BGD","Citrus, Other","fabio" +"1728","Bangladesh","BGD","Bananas","fabio" +"1729","Bangladesh","BGD","Plantains","fabio" +"1730","Bangladesh","BGD","Apples and products","fabio" +"1731","Bangladesh","BGD","Pineapples and products","fabio" +"1732","Bangladesh","BGD","Dates","fabio" +"1733","Bangladesh","BGD","Grapes and products (excl wine)","fabio" +"1734","Bangladesh","BGD","Fruits, Other","fabio" +"1735","Bangladesh","BGD","Coffee and products","fabio" +"1736","Bangladesh","BGD","Cocoa Beans and products","fabio" +"1737","Bangladesh","BGD","Tea (including mate)","fabio" +"1738","Bangladesh","BGD","Hops","fabio" +"1739","Bangladesh","BGD","Pepper","fabio" +"1740","Bangladesh","BGD","Pimento","fabio" +"1741","Bangladesh","BGD","Cloves","fabio" +"1742","Bangladesh","BGD","Spices, Other","fabio" +"1743","Bangladesh","BGD","Jute","fabio" +"1744","Bangladesh","BGD","Jute-Like Fibres","fabio" +"1745","Bangladesh","BGD","Soft-Fibres, Other","fabio" +"1746","Bangladesh","BGD","Sisal","fabio" +"1747","Bangladesh","BGD","Abaca","fabio" +"1748","Bangladesh","BGD","Hard Fibres, Other","fabio" +"1749","Bangladesh","BGD","Tobacco","fabio" +"1750","Bangladesh","BGD","Rubber","fabio" +"1751","Bangladesh","BGD","Fodder crops","fabio" +"1752","Bangladesh","BGD","Grazing","fabio" +"1753","Bangladesh","BGD","Cottonseed","fabio" +"1754","Bangladesh","BGD","Palm kernels","fabio" +"1755","Bangladesh","BGD","Sugar non-centrifugal","fabio" +"1756","Bangladesh","BGD","Molasses","fabio" +"1757","Bangladesh","BGD","Sugar, Refined Equiv","fabio" +"1758","Bangladesh","BGD","Sweeteners, Other","fabio" +"1759","Bangladesh","BGD","Soyabean Oil","fabio" +"1760","Bangladesh","BGD","Groundnut Oil","fabio" +"1761","Bangladesh","BGD","Sunflowerseed Oil","fabio" +"1762","Bangladesh","BGD","Rape and Mustard Oil","fabio" +"1763","Bangladesh","BGD","Cottonseed Oil","fabio" +"1764","Bangladesh","BGD","Palmkernel Oil","fabio" +"1765","Bangladesh","BGD","Palm Oil","fabio" +"1766","Bangladesh","BGD","Coconut Oil","fabio" +"1767","Bangladesh","BGD","Sesameseed Oil","fabio" +"1768","Bangladesh","BGD","Olive Oil","fabio" +"1769","Bangladesh","BGD","Ricebran Oil","fabio" +"1770","Bangladesh","BGD","Maize Germ Oil","fabio" +"1771","Bangladesh","BGD","Oilcrops Oil, Other","fabio" +"1772","Bangladesh","BGD","Soyabean Cake","fabio" +"1773","Bangladesh","BGD","Groundnut Cake","fabio" +"1774","Bangladesh","BGD","Sunflowerseed Cake","fabio" +"1775","Bangladesh","BGD","Rape and Mustard Cake","fabio" +"1776","Bangladesh","BGD","Cottonseed Cake","fabio" +"1777","Bangladesh","BGD","Palmkernel Cake","fabio" +"1778","Bangladesh","BGD","Copra Cake","fabio" +"1779","Bangladesh","BGD","Sesameseed Cake","fabio" +"1780","Bangladesh","BGD","Oilseed Cakes, Other","fabio" +"1781","Bangladesh","BGD","Wine","fabio" +"1782","Bangladesh","BGD","Beer","fabio" +"1783","Bangladesh","BGD","Beverages, Fermented","fabio" +"1784","Bangladesh","BGD","Beverages, Alcoholic","fabio" +"1785","Bangladesh","BGD","Alcohol, Non-Food","fabio" +"1786","Bangladesh","BGD","Cotton lint","fabio" +"1787","Bangladesh","BGD","Cattle","fabio" +"1788","Bangladesh","BGD","Buffaloes","fabio" +"1789","Bangladesh","BGD","Sheep","fabio" +"1790","Bangladesh","BGD","Goats","fabio" +"1791","Bangladesh","BGD","Pigs","fabio" +"1792","Bangladesh","BGD","Poultry Birds","fabio" +"1793","Bangladesh","BGD","Horses","fabio" +"1794","Bangladesh","BGD","Asses","fabio" +"1795","Bangladesh","BGD","Mules","fabio" +"1796","Bangladesh","BGD","Camels","fabio" +"1797","Bangladesh","BGD","Camelids, other","fabio" +"1798","Bangladesh","BGD","Rabbits and hares","fabio" +"1799","Bangladesh","BGD","Rodents, other","fabio" +"1800","Bangladesh","BGD","Live animals, other","fabio" +"1801","Bangladesh","BGD","Milk - Excluding Butter","fabio" +"1802","Bangladesh","BGD","Butter, Ghee","fabio" +"1803","Bangladesh","BGD","Eggs","fabio" +"1804","Bangladesh","BGD","Wool (Clean Eq.)","fabio" +"1805","Bangladesh","BGD","Bovine Meat","fabio" +"1806","Bangladesh","BGD","Mutton & Goat Meat","fabio" +"1807","Bangladesh","BGD","Pigmeat","fabio" +"1808","Bangladesh","BGD","Poultry Meat","fabio" +"1809","Bangladesh","BGD","Meat, Other","fabio" +"1810","Bangladesh","BGD","Offals, Edible","fabio" +"1811","Bangladesh","BGD","Fats, Animals, Raw","fabio" +"1812","Bangladesh","BGD","Hides and skins","fabio" +"1813","Bangladesh","BGD","Meat Meal","fabio" +"1814","Bangladesh","BGD","Pet food","fabio" +"1815","Bangladesh","BGD","Honey","fabio" +"1816","Bangladesh","BGD","Silk","fabio" +"1817","Bangladesh","BGD","Fish, Seafood","fabio" +"1818","Bangladesh","BGD","Wood fuel","fabio" +"1819","Bangladesh","BGD","Industrial roundwood, coniferous","fabio" +"1820","Bangladesh","BGD","Industrial roundwood, non-coniferous","fabio" +"1821","Bolivia (Plurinational State of)","BOL","Rice (Milled Equivalent)","fabio" +"1822","Bolivia (Plurinational State of)","BOL","Wheat and products","fabio" +"1823","Bolivia (Plurinational State of)","BOL","Barley and products","fabio" +"1824","Bolivia (Plurinational State of)","BOL","Maize and products","fabio" +"1825","Bolivia (Plurinational State of)","BOL","Rye and products","fabio" +"1826","Bolivia (Plurinational State of)","BOL","Oats","fabio" +"1827","Bolivia (Plurinational State of)","BOL","Millet and products","fabio" +"1828","Bolivia (Plurinational State of)","BOL","Sorghum and products","fabio" +"1829","Bolivia (Plurinational State of)","BOL","Cereals, Other","fabio" +"1830","Bolivia (Plurinational State of)","BOL","Potatoes and products","fabio" +"1831","Bolivia (Plurinational State of)","BOL","Cassava and products","fabio" +"1832","Bolivia (Plurinational State of)","BOL","Sweet potatoes","fabio" +"1833","Bolivia (Plurinational State of)","BOL","Roots, Other","fabio" +"1834","Bolivia (Plurinational State of)","BOL","Yams","fabio" +"1835","Bolivia (Plurinational State of)","BOL","Sugar cane","fabio" +"1836","Bolivia (Plurinational State of)","BOL","Sugar beet","fabio" +"1837","Bolivia (Plurinational State of)","BOL","Beans","fabio" +"1838","Bolivia (Plurinational State of)","BOL","Peas","fabio" +"1839","Bolivia (Plurinational State of)","BOL","Pulses, Other and products","fabio" +"1840","Bolivia (Plurinational State of)","BOL","Nuts and products","fabio" +"1841","Bolivia (Plurinational State of)","BOL","Soyabeans","fabio" +"1842","Bolivia (Plurinational State of)","BOL","Groundnuts (Shelled Eq)","fabio" +"1843","Bolivia (Plurinational State of)","BOL","Sunflower seed","fabio" +"1844","Bolivia (Plurinational State of)","BOL","Rape and Mustardseed","fabio" +"1845","Bolivia (Plurinational State of)","BOL","Seed cotton","fabio" +"1846","Bolivia (Plurinational State of)","BOL","Coconuts - Incl Copra","fabio" +"1847","Bolivia (Plurinational State of)","BOL","Sesame seed","fabio" +"1848","Bolivia (Plurinational State of)","BOL","Oil, palm fruit","fabio" +"1849","Bolivia (Plurinational State of)","BOL","Olives (including preserved)","fabio" +"1850","Bolivia (Plurinational State of)","BOL","Oilcrops, Other","fabio" +"1851","Bolivia (Plurinational State of)","BOL","Tomatoes and products","fabio" +"1852","Bolivia (Plurinational State of)","BOL","Onions","fabio" +"1853","Bolivia (Plurinational State of)","BOL","Vegetables, Other","fabio" +"1854","Bolivia (Plurinational State of)","BOL","Oranges, Mandarines","fabio" +"1855","Bolivia (Plurinational State of)","BOL","Lemons, Limes and products","fabio" +"1856","Bolivia (Plurinational State of)","BOL","Grapefruit and products","fabio" +"1857","Bolivia (Plurinational State of)","BOL","Citrus, Other","fabio" +"1858","Bolivia (Plurinational State of)","BOL","Bananas","fabio" +"1859","Bolivia (Plurinational State of)","BOL","Plantains","fabio" +"1860","Bolivia (Plurinational State of)","BOL","Apples and products","fabio" +"1861","Bolivia (Plurinational State of)","BOL","Pineapples and products","fabio" +"1862","Bolivia (Plurinational State of)","BOL","Dates","fabio" +"1863","Bolivia (Plurinational State of)","BOL","Grapes and products (excl wine)","fabio" +"1864","Bolivia (Plurinational State of)","BOL","Fruits, Other","fabio" +"1865","Bolivia (Plurinational State of)","BOL","Coffee and products","fabio" +"1866","Bolivia (Plurinational State of)","BOL","Cocoa Beans and products","fabio" +"1867","Bolivia (Plurinational State of)","BOL","Tea (including mate)","fabio" +"1868","Bolivia (Plurinational State of)","BOL","Hops","fabio" +"1869","Bolivia (Plurinational State of)","BOL","Pepper","fabio" +"1870","Bolivia (Plurinational State of)","BOL","Pimento","fabio" +"1871","Bolivia (Plurinational State of)","BOL","Cloves","fabio" +"1872","Bolivia (Plurinational State of)","BOL","Spices, Other","fabio" +"1873","Bolivia (Plurinational State of)","BOL","Jute","fabio" +"1874","Bolivia (Plurinational State of)","BOL","Jute-Like Fibres","fabio" +"1875","Bolivia (Plurinational State of)","BOL","Soft-Fibres, Other","fabio" +"1876","Bolivia (Plurinational State of)","BOL","Sisal","fabio" +"1877","Bolivia (Plurinational State of)","BOL","Abaca","fabio" +"1878","Bolivia (Plurinational State of)","BOL","Hard Fibres, Other","fabio" +"1879","Bolivia (Plurinational State of)","BOL","Tobacco","fabio" +"1880","Bolivia (Plurinational State of)","BOL","Rubber","fabio" +"1881","Bolivia (Plurinational State of)","BOL","Fodder crops","fabio" +"1882","Bolivia (Plurinational State of)","BOL","Grazing","fabio" +"1883","Bolivia (Plurinational State of)","BOL","Cottonseed","fabio" +"1884","Bolivia (Plurinational State of)","BOL","Palm kernels","fabio" +"1885","Bolivia (Plurinational State of)","BOL","Sugar non-centrifugal","fabio" +"1886","Bolivia (Plurinational State of)","BOL","Molasses","fabio" +"1887","Bolivia (Plurinational State of)","BOL","Sugar, Refined Equiv","fabio" +"1888","Bolivia (Plurinational State of)","BOL","Sweeteners, Other","fabio" +"1889","Bolivia (Plurinational State of)","BOL","Soyabean Oil","fabio" +"1890","Bolivia (Plurinational State of)","BOL","Groundnut Oil","fabio" +"1891","Bolivia (Plurinational State of)","BOL","Sunflowerseed Oil","fabio" +"1892","Bolivia (Plurinational State of)","BOL","Rape and Mustard Oil","fabio" +"1893","Bolivia (Plurinational State of)","BOL","Cottonseed Oil","fabio" +"1894","Bolivia (Plurinational State of)","BOL","Palmkernel Oil","fabio" +"1895","Bolivia (Plurinational State of)","BOL","Palm Oil","fabio" +"1896","Bolivia (Plurinational State of)","BOL","Coconut Oil","fabio" +"1897","Bolivia (Plurinational State of)","BOL","Sesameseed Oil","fabio" +"1898","Bolivia (Plurinational State of)","BOL","Olive Oil","fabio" +"1899","Bolivia (Plurinational State of)","BOL","Ricebran Oil","fabio" +"1900","Bolivia (Plurinational State of)","BOL","Maize Germ Oil","fabio" +"1901","Bolivia (Plurinational State of)","BOL","Oilcrops Oil, Other","fabio" +"1902","Bolivia (Plurinational State of)","BOL","Soyabean Cake","fabio" +"1903","Bolivia (Plurinational State of)","BOL","Groundnut Cake","fabio" +"1904","Bolivia (Plurinational State of)","BOL","Sunflowerseed Cake","fabio" +"1905","Bolivia (Plurinational State of)","BOL","Rape and Mustard Cake","fabio" +"1906","Bolivia (Plurinational State of)","BOL","Cottonseed Cake","fabio" +"1907","Bolivia (Plurinational State of)","BOL","Palmkernel Cake","fabio" +"1908","Bolivia (Plurinational State of)","BOL","Copra Cake","fabio" +"1909","Bolivia (Plurinational State of)","BOL","Sesameseed Cake","fabio" +"1910","Bolivia (Plurinational State of)","BOL","Oilseed Cakes, Other","fabio" +"1911","Bolivia (Plurinational State of)","BOL","Wine","fabio" +"1912","Bolivia (Plurinational State of)","BOL","Beer","fabio" +"1913","Bolivia (Plurinational State of)","BOL","Beverages, Fermented","fabio" +"1914","Bolivia (Plurinational State of)","BOL","Beverages, Alcoholic","fabio" +"1915","Bolivia (Plurinational State of)","BOL","Alcohol, Non-Food","fabio" +"1916","Bolivia (Plurinational State of)","BOL","Cotton lint","fabio" +"1917","Bolivia (Plurinational State of)","BOL","Cattle","fabio" +"1918","Bolivia (Plurinational State of)","BOL","Buffaloes","fabio" +"1919","Bolivia (Plurinational State of)","BOL","Sheep","fabio" +"1920","Bolivia (Plurinational State of)","BOL","Goats","fabio" +"1921","Bolivia (Plurinational State of)","BOL","Pigs","fabio" +"1922","Bolivia (Plurinational State of)","BOL","Poultry Birds","fabio" +"1923","Bolivia (Plurinational State of)","BOL","Horses","fabio" +"1924","Bolivia (Plurinational State of)","BOL","Asses","fabio" +"1925","Bolivia (Plurinational State of)","BOL","Mules","fabio" +"1926","Bolivia (Plurinational State of)","BOL","Camels","fabio" +"1927","Bolivia (Plurinational State of)","BOL","Camelids, other","fabio" +"1928","Bolivia (Plurinational State of)","BOL","Rabbits and hares","fabio" +"1929","Bolivia (Plurinational State of)","BOL","Rodents, other","fabio" +"1930","Bolivia (Plurinational State of)","BOL","Live animals, other","fabio" +"1931","Bolivia (Plurinational State of)","BOL","Milk - Excluding Butter","fabio" +"1932","Bolivia (Plurinational State of)","BOL","Butter, Ghee","fabio" +"1933","Bolivia (Plurinational State of)","BOL","Eggs","fabio" +"1934","Bolivia (Plurinational State of)","BOL","Wool (Clean Eq.)","fabio" +"1935","Bolivia (Plurinational State of)","BOL","Bovine Meat","fabio" +"1936","Bolivia (Plurinational State of)","BOL","Mutton & Goat Meat","fabio" +"1937","Bolivia (Plurinational State of)","BOL","Pigmeat","fabio" +"1938","Bolivia (Plurinational State of)","BOL","Poultry Meat","fabio" +"1939","Bolivia (Plurinational State of)","BOL","Meat, Other","fabio" +"1940","Bolivia (Plurinational State of)","BOL","Offals, Edible","fabio" +"1941","Bolivia (Plurinational State of)","BOL","Fats, Animals, Raw","fabio" +"1942","Bolivia (Plurinational State of)","BOL","Hides and skins","fabio" +"1943","Bolivia (Plurinational State of)","BOL","Meat Meal","fabio" +"1944","Bolivia (Plurinational State of)","BOL","Pet food","fabio" +"1945","Bolivia (Plurinational State of)","BOL","Honey","fabio" +"1946","Bolivia (Plurinational State of)","BOL","Silk","fabio" +"1947","Bolivia (Plurinational State of)","BOL","Fish, Seafood","fabio" +"1948","Bolivia (Plurinational State of)","BOL","Wood fuel","fabio" +"1949","Bolivia (Plurinational State of)","BOL","Industrial roundwood, coniferous","fabio" +"1950","Bolivia (Plurinational State of)","BOL","Industrial roundwood, non-coniferous","fabio" +"1951","Botswana","BWA","Rice (Milled Equivalent)","fabio" +"1952","Botswana","BWA","Wheat and products","fabio" +"1953","Botswana","BWA","Barley and products","fabio" +"1954","Botswana","BWA","Maize and products","fabio" +"1955","Botswana","BWA","Rye and products","fabio" +"1956","Botswana","BWA","Oats","fabio" +"1957","Botswana","BWA","Millet and products","fabio" +"1958","Botswana","BWA","Sorghum and products","fabio" +"1959","Botswana","BWA","Cereals, Other","fabio" +"1960","Botswana","BWA","Potatoes and products","fabio" +"1961","Botswana","BWA","Cassava and products","fabio" +"1962","Botswana","BWA","Sweet potatoes","fabio" +"1963","Botswana","BWA","Roots, Other","fabio" +"1964","Botswana","BWA","Yams","fabio" +"1965","Botswana","BWA","Sugar cane","fabio" +"1966","Botswana","BWA","Sugar beet","fabio" +"1967","Botswana","BWA","Beans","fabio" +"1968","Botswana","BWA","Peas","fabio" +"1969","Botswana","BWA","Pulses, Other and products","fabio" +"1970","Botswana","BWA","Nuts and products","fabio" +"1971","Botswana","BWA","Soyabeans","fabio" +"1972","Botswana","BWA","Groundnuts (Shelled Eq)","fabio" +"1973","Botswana","BWA","Sunflower seed","fabio" +"1974","Botswana","BWA","Rape and Mustardseed","fabio" +"1975","Botswana","BWA","Seed cotton","fabio" +"1976","Botswana","BWA","Coconuts - Incl Copra","fabio" +"1977","Botswana","BWA","Sesame seed","fabio" +"1978","Botswana","BWA","Oil, palm fruit","fabio" +"1979","Botswana","BWA","Olives (including preserved)","fabio" +"1980","Botswana","BWA","Oilcrops, Other","fabio" +"1981","Botswana","BWA","Tomatoes and products","fabio" +"1982","Botswana","BWA","Onions","fabio" +"1983","Botswana","BWA","Vegetables, Other","fabio" +"1984","Botswana","BWA","Oranges, Mandarines","fabio" +"1985","Botswana","BWA","Lemons, Limes and products","fabio" +"1986","Botswana","BWA","Grapefruit and products","fabio" +"1987","Botswana","BWA","Citrus, Other","fabio" +"1988","Botswana","BWA","Bananas","fabio" +"1989","Botswana","BWA","Plantains","fabio" +"1990","Botswana","BWA","Apples and products","fabio" +"1991","Botswana","BWA","Pineapples and products","fabio" +"1992","Botswana","BWA","Dates","fabio" +"1993","Botswana","BWA","Grapes and products (excl wine)","fabio" +"1994","Botswana","BWA","Fruits, Other","fabio" +"1995","Botswana","BWA","Coffee and products","fabio" +"1996","Botswana","BWA","Cocoa Beans and products","fabio" +"1997","Botswana","BWA","Tea (including mate)","fabio" +"1998","Botswana","BWA","Hops","fabio" +"1999","Botswana","BWA","Pepper","fabio" +"2000","Botswana","BWA","Pimento","fabio" +"2001","Botswana","BWA","Cloves","fabio" +"2002","Botswana","BWA","Spices, Other","fabio" +"2003","Botswana","BWA","Jute","fabio" +"2004","Botswana","BWA","Jute-Like Fibres","fabio" +"2005","Botswana","BWA","Soft-Fibres, Other","fabio" +"2006","Botswana","BWA","Sisal","fabio" +"2007","Botswana","BWA","Abaca","fabio" +"2008","Botswana","BWA","Hard Fibres, Other","fabio" +"2009","Botswana","BWA","Tobacco","fabio" +"2010","Botswana","BWA","Rubber","fabio" +"2011","Botswana","BWA","Fodder crops","fabio" +"2012","Botswana","BWA","Grazing","fabio" +"2013","Botswana","BWA","Cottonseed","fabio" +"2014","Botswana","BWA","Palm kernels","fabio" +"2015","Botswana","BWA","Sugar non-centrifugal","fabio" +"2016","Botswana","BWA","Molasses","fabio" +"2017","Botswana","BWA","Sugar, Refined Equiv","fabio" +"2018","Botswana","BWA","Sweeteners, Other","fabio" +"2019","Botswana","BWA","Soyabean Oil","fabio" +"2020","Botswana","BWA","Groundnut Oil","fabio" +"2021","Botswana","BWA","Sunflowerseed Oil","fabio" +"2022","Botswana","BWA","Rape and Mustard Oil","fabio" +"2023","Botswana","BWA","Cottonseed Oil","fabio" +"2024","Botswana","BWA","Palmkernel Oil","fabio" +"2025","Botswana","BWA","Palm Oil","fabio" +"2026","Botswana","BWA","Coconut Oil","fabio" +"2027","Botswana","BWA","Sesameseed Oil","fabio" +"2028","Botswana","BWA","Olive Oil","fabio" +"2029","Botswana","BWA","Ricebran Oil","fabio" +"2030","Botswana","BWA","Maize Germ Oil","fabio" +"2031","Botswana","BWA","Oilcrops Oil, Other","fabio" +"2032","Botswana","BWA","Soyabean Cake","fabio" +"2033","Botswana","BWA","Groundnut Cake","fabio" +"2034","Botswana","BWA","Sunflowerseed Cake","fabio" +"2035","Botswana","BWA","Rape and Mustard Cake","fabio" +"2036","Botswana","BWA","Cottonseed Cake","fabio" +"2037","Botswana","BWA","Palmkernel Cake","fabio" +"2038","Botswana","BWA","Copra Cake","fabio" +"2039","Botswana","BWA","Sesameseed Cake","fabio" +"2040","Botswana","BWA","Oilseed Cakes, Other","fabio" +"2041","Botswana","BWA","Wine","fabio" +"2042","Botswana","BWA","Beer","fabio" +"2043","Botswana","BWA","Beverages, Fermented","fabio" +"2044","Botswana","BWA","Beverages, Alcoholic","fabio" +"2045","Botswana","BWA","Alcohol, Non-Food","fabio" +"2046","Botswana","BWA","Cotton lint","fabio" +"2047","Botswana","BWA","Cattle","fabio" +"2048","Botswana","BWA","Buffaloes","fabio" +"2049","Botswana","BWA","Sheep","fabio" +"2050","Botswana","BWA","Goats","fabio" +"2051","Botswana","BWA","Pigs","fabio" +"2052","Botswana","BWA","Poultry Birds","fabio" +"2053","Botswana","BWA","Horses","fabio" +"2054","Botswana","BWA","Asses","fabio" +"2055","Botswana","BWA","Mules","fabio" +"2056","Botswana","BWA","Camels","fabio" +"2057","Botswana","BWA","Camelids, other","fabio" +"2058","Botswana","BWA","Rabbits and hares","fabio" +"2059","Botswana","BWA","Rodents, other","fabio" +"2060","Botswana","BWA","Live animals, other","fabio" +"2061","Botswana","BWA","Milk - Excluding Butter","fabio" +"2062","Botswana","BWA","Butter, Ghee","fabio" +"2063","Botswana","BWA","Eggs","fabio" +"2064","Botswana","BWA","Wool (Clean Eq.)","fabio" +"2065","Botswana","BWA","Bovine Meat","fabio" +"2066","Botswana","BWA","Mutton & Goat Meat","fabio" +"2067","Botswana","BWA","Pigmeat","fabio" +"2068","Botswana","BWA","Poultry Meat","fabio" +"2069","Botswana","BWA","Meat, Other","fabio" +"2070","Botswana","BWA","Offals, Edible","fabio" +"2071","Botswana","BWA","Fats, Animals, Raw","fabio" +"2072","Botswana","BWA","Hides and skins","fabio" +"2073","Botswana","BWA","Meat Meal","fabio" +"2074","Botswana","BWA","Pet food","fabio" +"2075","Botswana","BWA","Honey","fabio" +"2076","Botswana","BWA","Silk","fabio" +"2077","Botswana","BWA","Fish, Seafood","fabio" +"2078","Botswana","BWA","Wood fuel","fabio" +"2079","Botswana","BWA","Industrial roundwood, coniferous","fabio" +"2080","Botswana","BWA","Industrial roundwood, non-coniferous","fabio" +"2081","Brazil","BRA","Rice (Milled Equivalent)","fabio" +"2082","Brazil","BRA","Wheat and products","fabio" +"2083","Brazil","BRA","Barley and products","fabio" +"2084","Brazil","BRA","Maize and products","fabio" +"2085","Brazil","BRA","Rye and products","fabio" +"2086","Brazil","BRA","Oats","fabio" +"2087","Brazil","BRA","Millet and products","fabio" +"2088","Brazil","BRA","Sorghum and products","fabio" +"2089","Brazil","BRA","Cereals, Other","fabio" +"2090","Brazil","BRA","Potatoes and products","fabio" +"2091","Brazil","BRA","Cassava and products","fabio" +"2092","Brazil","BRA","Sweet potatoes","fabio" +"2093","Brazil","BRA","Roots, Other","fabio" +"2094","Brazil","BRA","Yams","fabio" +"2095","Brazil","BRA","Sugar cane","fabio" +"2096","Brazil","BRA","Sugar beet","fabio" +"2097","Brazil","BRA","Beans","fabio" +"2098","Brazil","BRA","Peas","fabio" +"2099","Brazil","BRA","Pulses, Other and products","fabio" +"2100","Brazil","BRA","Nuts and products","fabio" +"2101","Brazil","BRA","Soyabeans","fabio" +"2102","Brazil","BRA","Groundnuts (Shelled Eq)","fabio" +"2103","Brazil","BRA","Sunflower seed","fabio" +"2104","Brazil","BRA","Rape and Mustardseed","fabio" +"2105","Brazil","BRA","Seed cotton","fabio" +"2106","Brazil","BRA","Coconuts - Incl Copra","fabio" +"2107","Brazil","BRA","Sesame seed","fabio" +"2108","Brazil","BRA","Oil, palm fruit","fabio" +"2109","Brazil","BRA","Olives (including preserved)","fabio" +"2110","Brazil","BRA","Oilcrops, Other","fabio" +"2111","Brazil","BRA","Tomatoes and products","fabio" +"2112","Brazil","BRA","Onions","fabio" +"2113","Brazil","BRA","Vegetables, Other","fabio" +"2114","Brazil","BRA","Oranges, Mandarines","fabio" +"2115","Brazil","BRA","Lemons, Limes and products","fabio" +"2116","Brazil","BRA","Grapefruit and products","fabio" +"2117","Brazil","BRA","Citrus, Other","fabio" +"2118","Brazil","BRA","Bananas","fabio" +"2119","Brazil","BRA","Plantains","fabio" +"2120","Brazil","BRA","Apples and products","fabio" +"2121","Brazil","BRA","Pineapples and products","fabio" +"2122","Brazil","BRA","Dates","fabio" +"2123","Brazil","BRA","Grapes and products (excl wine)","fabio" +"2124","Brazil","BRA","Fruits, Other","fabio" +"2125","Brazil","BRA","Coffee and products","fabio" +"2126","Brazil","BRA","Cocoa Beans and products","fabio" +"2127","Brazil","BRA","Tea (including mate)","fabio" +"2128","Brazil","BRA","Hops","fabio" +"2129","Brazil","BRA","Pepper","fabio" +"2130","Brazil","BRA","Pimento","fabio" +"2131","Brazil","BRA","Cloves","fabio" +"2132","Brazil","BRA","Spices, Other","fabio" +"2133","Brazil","BRA","Jute","fabio" +"2134","Brazil","BRA","Jute-Like Fibres","fabio" +"2135","Brazil","BRA","Soft-Fibres, Other","fabio" +"2136","Brazil","BRA","Sisal","fabio" +"2137","Brazil","BRA","Abaca","fabio" +"2138","Brazil","BRA","Hard Fibres, Other","fabio" +"2139","Brazil","BRA","Tobacco","fabio" +"2140","Brazil","BRA","Rubber","fabio" +"2141","Brazil","BRA","Fodder crops","fabio" +"2142","Brazil","BRA","Grazing","fabio" +"2143","Brazil","BRA","Cottonseed","fabio" +"2144","Brazil","BRA","Palm kernels","fabio" +"2145","Brazil","BRA","Sugar non-centrifugal","fabio" +"2146","Brazil","BRA","Molasses","fabio" +"2147","Brazil","BRA","Sugar, Refined Equiv","fabio" +"2148","Brazil","BRA","Sweeteners, Other","fabio" +"2149","Brazil","BRA","Soyabean Oil","fabio" +"2150","Brazil","BRA","Groundnut Oil","fabio" +"2151","Brazil","BRA","Sunflowerseed Oil","fabio" +"2152","Brazil","BRA","Rape and Mustard Oil","fabio" +"2153","Brazil","BRA","Cottonseed Oil","fabio" +"2154","Brazil","BRA","Palmkernel Oil","fabio" +"2155","Brazil","BRA","Palm Oil","fabio" +"2156","Brazil","BRA","Coconut Oil","fabio" +"2157","Brazil","BRA","Sesameseed Oil","fabio" +"2158","Brazil","BRA","Olive Oil","fabio" +"2159","Brazil","BRA","Ricebran Oil","fabio" +"2160","Brazil","BRA","Maize Germ Oil","fabio" +"2161","Brazil","BRA","Oilcrops Oil, Other","fabio" +"2162","Brazil","BRA","Soyabean Cake","fabio" +"2163","Brazil","BRA","Groundnut Cake","fabio" +"2164","Brazil","BRA","Sunflowerseed Cake","fabio" +"2165","Brazil","BRA","Rape and Mustard Cake","fabio" +"2166","Brazil","BRA","Cottonseed Cake","fabio" +"2167","Brazil","BRA","Palmkernel Cake","fabio" +"2168","Brazil","BRA","Copra Cake","fabio" +"2169","Brazil","BRA","Sesameseed Cake","fabio" +"2170","Brazil","BRA","Oilseed Cakes, Other","fabio" +"2171","Brazil","BRA","Wine","fabio" +"2172","Brazil","BRA","Beer","fabio" +"2173","Brazil","BRA","Beverages, Fermented","fabio" +"2174","Brazil","BRA","Beverages, Alcoholic","fabio" +"2175","Brazil","BRA","Alcohol, Non-Food","fabio" +"2176","Brazil","BRA","Cotton lint","fabio" +"2177","Brazil","BRA","Cattle","fabio" +"2178","Brazil","BRA","Buffaloes","fabio" +"2179","Brazil","BRA","Sheep","fabio" +"2180","Brazil","BRA","Goats","fabio" +"2181","Brazil","BRA","Pigs","fabio" +"2182","Brazil","BRA","Poultry Birds","fabio" +"2183","Brazil","BRA","Horses","fabio" +"2184","Brazil","BRA","Asses","fabio" +"2185","Brazil","BRA","Mules","fabio" +"2186","Brazil","BRA","Camels","fabio" +"2187","Brazil","BRA","Camelids, other","fabio" +"2188","Brazil","BRA","Rabbits and hares","fabio" +"2189","Brazil","BRA","Rodents, other","fabio" +"2190","Brazil","BRA","Live animals, other","fabio" +"2191","Brazil","BRA","Milk - Excluding Butter","fabio" +"2192","Brazil","BRA","Butter, Ghee","fabio" +"2193","Brazil","BRA","Eggs","fabio" +"2194","Brazil","BRA","Wool (Clean Eq.)","fabio" +"2195","Brazil","BRA","Bovine Meat","fabio" +"2196","Brazil","BRA","Mutton & Goat Meat","fabio" +"2197","Brazil","BRA","Pigmeat","fabio" +"2198","Brazil","BRA","Poultry Meat","fabio" +"2199","Brazil","BRA","Meat, Other","fabio" +"2200","Brazil","BRA","Offals, Edible","fabio" +"2201","Brazil","BRA","Fats, Animals, Raw","fabio" +"2202","Brazil","BRA","Hides and skins","fabio" +"2203","Brazil","BRA","Meat Meal","fabio" +"2204","Brazil","BRA","Pet food","fabio" +"2205","Brazil","BRA","Honey","fabio" +"2206","Brazil","BRA","Silk","fabio" +"2207","Brazil","BRA","Fish, Seafood","fabio" +"2208","Brazil","BRA","Wood fuel","fabio" +"2209","Brazil","BRA","Industrial roundwood, coniferous","fabio" +"2210","Brazil","BRA","Industrial roundwood, non-coniferous","fabio" +"2211","Belize","BLZ","Rice (Milled Equivalent)","fabio" +"2212","Belize","BLZ","Wheat and products","fabio" +"2213","Belize","BLZ","Barley and products","fabio" +"2214","Belize","BLZ","Maize and products","fabio" +"2215","Belize","BLZ","Rye and products","fabio" +"2216","Belize","BLZ","Oats","fabio" +"2217","Belize","BLZ","Millet and products","fabio" +"2218","Belize","BLZ","Sorghum and products","fabio" +"2219","Belize","BLZ","Cereals, Other","fabio" +"2220","Belize","BLZ","Potatoes and products","fabio" +"2221","Belize","BLZ","Cassava and products","fabio" +"2222","Belize","BLZ","Sweet potatoes","fabio" +"2223","Belize","BLZ","Roots, Other","fabio" +"2224","Belize","BLZ","Yams","fabio" +"2225","Belize","BLZ","Sugar cane","fabio" +"2226","Belize","BLZ","Sugar beet","fabio" +"2227","Belize","BLZ","Beans","fabio" +"2228","Belize","BLZ","Peas","fabio" +"2229","Belize","BLZ","Pulses, Other and products","fabio" +"2230","Belize","BLZ","Nuts and products","fabio" +"2231","Belize","BLZ","Soyabeans","fabio" +"2232","Belize","BLZ","Groundnuts (Shelled Eq)","fabio" +"2233","Belize","BLZ","Sunflower seed","fabio" +"2234","Belize","BLZ","Rape and Mustardseed","fabio" +"2235","Belize","BLZ","Seed cotton","fabio" +"2236","Belize","BLZ","Coconuts - Incl Copra","fabio" +"2237","Belize","BLZ","Sesame seed","fabio" +"2238","Belize","BLZ","Oil, palm fruit","fabio" +"2239","Belize","BLZ","Olives (including preserved)","fabio" +"2240","Belize","BLZ","Oilcrops, Other","fabio" +"2241","Belize","BLZ","Tomatoes and products","fabio" +"2242","Belize","BLZ","Onions","fabio" +"2243","Belize","BLZ","Vegetables, Other","fabio" +"2244","Belize","BLZ","Oranges, Mandarines","fabio" +"2245","Belize","BLZ","Lemons, Limes and products","fabio" +"2246","Belize","BLZ","Grapefruit and products","fabio" +"2247","Belize","BLZ","Citrus, Other","fabio" +"2248","Belize","BLZ","Bananas","fabio" +"2249","Belize","BLZ","Plantains","fabio" +"2250","Belize","BLZ","Apples and products","fabio" +"2251","Belize","BLZ","Pineapples and products","fabio" +"2252","Belize","BLZ","Dates","fabio" +"2253","Belize","BLZ","Grapes and products (excl wine)","fabio" +"2254","Belize","BLZ","Fruits, Other","fabio" +"2255","Belize","BLZ","Coffee and products","fabio" +"2256","Belize","BLZ","Cocoa Beans and products","fabio" +"2257","Belize","BLZ","Tea (including mate)","fabio" +"2258","Belize","BLZ","Hops","fabio" +"2259","Belize","BLZ","Pepper","fabio" +"2260","Belize","BLZ","Pimento","fabio" +"2261","Belize","BLZ","Cloves","fabio" +"2262","Belize","BLZ","Spices, Other","fabio" +"2263","Belize","BLZ","Jute","fabio" +"2264","Belize","BLZ","Jute-Like Fibres","fabio" +"2265","Belize","BLZ","Soft-Fibres, Other","fabio" +"2266","Belize","BLZ","Sisal","fabio" +"2267","Belize","BLZ","Abaca","fabio" +"2268","Belize","BLZ","Hard Fibres, Other","fabio" +"2269","Belize","BLZ","Tobacco","fabio" +"2270","Belize","BLZ","Rubber","fabio" +"2271","Belize","BLZ","Fodder crops","fabio" +"2272","Belize","BLZ","Grazing","fabio" +"2273","Belize","BLZ","Cottonseed","fabio" +"2274","Belize","BLZ","Palm kernels","fabio" +"2275","Belize","BLZ","Sugar non-centrifugal","fabio" +"2276","Belize","BLZ","Molasses","fabio" +"2277","Belize","BLZ","Sugar, Refined Equiv","fabio" +"2278","Belize","BLZ","Sweeteners, Other","fabio" +"2279","Belize","BLZ","Soyabean Oil","fabio" +"2280","Belize","BLZ","Groundnut Oil","fabio" +"2281","Belize","BLZ","Sunflowerseed Oil","fabio" +"2282","Belize","BLZ","Rape and Mustard Oil","fabio" +"2283","Belize","BLZ","Cottonseed Oil","fabio" +"2284","Belize","BLZ","Palmkernel Oil","fabio" +"2285","Belize","BLZ","Palm Oil","fabio" +"2286","Belize","BLZ","Coconut Oil","fabio" +"2287","Belize","BLZ","Sesameseed Oil","fabio" +"2288","Belize","BLZ","Olive Oil","fabio" +"2289","Belize","BLZ","Ricebran Oil","fabio" +"2290","Belize","BLZ","Maize Germ Oil","fabio" +"2291","Belize","BLZ","Oilcrops Oil, Other","fabio" +"2292","Belize","BLZ","Soyabean Cake","fabio" +"2293","Belize","BLZ","Groundnut Cake","fabio" +"2294","Belize","BLZ","Sunflowerseed Cake","fabio" +"2295","Belize","BLZ","Rape and Mustard Cake","fabio" +"2296","Belize","BLZ","Cottonseed Cake","fabio" +"2297","Belize","BLZ","Palmkernel Cake","fabio" +"2298","Belize","BLZ","Copra Cake","fabio" +"2299","Belize","BLZ","Sesameseed Cake","fabio" +"2300","Belize","BLZ","Oilseed Cakes, Other","fabio" +"2301","Belize","BLZ","Wine","fabio" +"2302","Belize","BLZ","Beer","fabio" +"2303","Belize","BLZ","Beverages, Fermented","fabio" +"2304","Belize","BLZ","Beverages, Alcoholic","fabio" +"2305","Belize","BLZ","Alcohol, Non-Food","fabio" +"2306","Belize","BLZ","Cotton lint","fabio" +"2307","Belize","BLZ","Cattle","fabio" +"2308","Belize","BLZ","Buffaloes","fabio" +"2309","Belize","BLZ","Sheep","fabio" +"2310","Belize","BLZ","Goats","fabio" +"2311","Belize","BLZ","Pigs","fabio" +"2312","Belize","BLZ","Poultry Birds","fabio" +"2313","Belize","BLZ","Horses","fabio" +"2314","Belize","BLZ","Asses","fabio" +"2315","Belize","BLZ","Mules","fabio" +"2316","Belize","BLZ","Camels","fabio" +"2317","Belize","BLZ","Camelids, other","fabio" +"2318","Belize","BLZ","Rabbits and hares","fabio" +"2319","Belize","BLZ","Rodents, other","fabio" +"2320","Belize","BLZ","Live animals, other","fabio" +"2321","Belize","BLZ","Milk - Excluding Butter","fabio" +"2322","Belize","BLZ","Butter, Ghee","fabio" +"2323","Belize","BLZ","Eggs","fabio" +"2324","Belize","BLZ","Wool (Clean Eq.)","fabio" +"2325","Belize","BLZ","Bovine Meat","fabio" +"2326","Belize","BLZ","Mutton & Goat Meat","fabio" +"2327","Belize","BLZ","Pigmeat","fabio" +"2328","Belize","BLZ","Poultry Meat","fabio" +"2329","Belize","BLZ","Meat, Other","fabio" +"2330","Belize","BLZ","Offals, Edible","fabio" +"2331","Belize","BLZ","Fats, Animals, Raw","fabio" +"2332","Belize","BLZ","Hides and skins","fabio" +"2333","Belize","BLZ","Meat Meal","fabio" +"2334","Belize","BLZ","Pet food","fabio" +"2335","Belize","BLZ","Honey","fabio" +"2336","Belize","BLZ","Silk","fabio" +"2337","Belize","BLZ","Fish, Seafood","fabio" +"2338","Belize","BLZ","Wood fuel","fabio" +"2339","Belize","BLZ","Industrial roundwood, coniferous","fabio" +"2340","Belize","BLZ","Industrial roundwood, non-coniferous","fabio" +"2341","Solomon Islands","SLB","Rice (Milled Equivalent)","fabio" +"2342","Solomon Islands","SLB","Wheat and products","fabio" +"2343","Solomon Islands","SLB","Barley and products","fabio" +"2344","Solomon Islands","SLB","Maize and products","fabio" +"2345","Solomon Islands","SLB","Rye and products","fabio" +"2346","Solomon Islands","SLB","Oats","fabio" +"2347","Solomon Islands","SLB","Millet and products","fabio" +"2348","Solomon Islands","SLB","Sorghum and products","fabio" +"2349","Solomon Islands","SLB","Cereals, Other","fabio" +"2350","Solomon Islands","SLB","Potatoes and products","fabio" +"2351","Solomon Islands","SLB","Cassava and products","fabio" +"2352","Solomon Islands","SLB","Sweet potatoes","fabio" +"2353","Solomon Islands","SLB","Roots, Other","fabio" +"2354","Solomon Islands","SLB","Yams","fabio" +"2355","Solomon Islands","SLB","Sugar cane","fabio" +"2356","Solomon Islands","SLB","Sugar beet","fabio" +"2357","Solomon Islands","SLB","Beans","fabio" +"2358","Solomon Islands","SLB","Peas","fabio" +"2359","Solomon Islands","SLB","Pulses, Other and products","fabio" +"2360","Solomon Islands","SLB","Nuts and products","fabio" +"2361","Solomon Islands","SLB","Soyabeans","fabio" +"2362","Solomon Islands","SLB","Groundnuts (Shelled Eq)","fabio" +"2363","Solomon Islands","SLB","Sunflower seed","fabio" +"2364","Solomon Islands","SLB","Rape and Mustardseed","fabio" +"2365","Solomon Islands","SLB","Seed cotton","fabio" +"2366","Solomon Islands","SLB","Coconuts - Incl Copra","fabio" +"2367","Solomon Islands","SLB","Sesame seed","fabio" +"2368","Solomon Islands","SLB","Oil, palm fruit","fabio" +"2369","Solomon Islands","SLB","Olives (including preserved)","fabio" +"2370","Solomon Islands","SLB","Oilcrops, Other","fabio" +"2371","Solomon Islands","SLB","Tomatoes and products","fabio" +"2372","Solomon Islands","SLB","Onions","fabio" +"2373","Solomon Islands","SLB","Vegetables, Other","fabio" +"2374","Solomon Islands","SLB","Oranges, Mandarines","fabio" +"2375","Solomon Islands","SLB","Lemons, Limes and products","fabio" +"2376","Solomon Islands","SLB","Grapefruit and products","fabio" +"2377","Solomon Islands","SLB","Citrus, Other","fabio" +"2378","Solomon Islands","SLB","Bananas","fabio" +"2379","Solomon Islands","SLB","Plantains","fabio" +"2380","Solomon Islands","SLB","Apples and products","fabio" +"2381","Solomon Islands","SLB","Pineapples and products","fabio" +"2382","Solomon Islands","SLB","Dates","fabio" +"2383","Solomon Islands","SLB","Grapes and products (excl wine)","fabio" +"2384","Solomon Islands","SLB","Fruits, Other","fabio" +"2385","Solomon Islands","SLB","Coffee and products","fabio" +"2386","Solomon Islands","SLB","Cocoa Beans and products","fabio" +"2387","Solomon Islands","SLB","Tea (including mate)","fabio" +"2388","Solomon Islands","SLB","Hops","fabio" +"2389","Solomon Islands","SLB","Pepper","fabio" +"2390","Solomon Islands","SLB","Pimento","fabio" +"2391","Solomon Islands","SLB","Cloves","fabio" +"2392","Solomon Islands","SLB","Spices, Other","fabio" +"2393","Solomon Islands","SLB","Jute","fabio" +"2394","Solomon Islands","SLB","Jute-Like Fibres","fabio" +"2395","Solomon Islands","SLB","Soft-Fibres, Other","fabio" +"2396","Solomon Islands","SLB","Sisal","fabio" +"2397","Solomon Islands","SLB","Abaca","fabio" +"2398","Solomon Islands","SLB","Hard Fibres, Other","fabio" +"2399","Solomon Islands","SLB","Tobacco","fabio" +"2400","Solomon Islands","SLB","Rubber","fabio" +"2401","Solomon Islands","SLB","Fodder crops","fabio" +"2402","Solomon Islands","SLB","Grazing","fabio" +"2403","Solomon Islands","SLB","Cottonseed","fabio" +"2404","Solomon Islands","SLB","Palm kernels","fabio" +"2405","Solomon Islands","SLB","Sugar non-centrifugal","fabio" +"2406","Solomon Islands","SLB","Molasses","fabio" +"2407","Solomon Islands","SLB","Sugar, Refined Equiv","fabio" +"2408","Solomon Islands","SLB","Sweeteners, Other","fabio" +"2409","Solomon Islands","SLB","Soyabean Oil","fabio" +"2410","Solomon Islands","SLB","Groundnut Oil","fabio" +"2411","Solomon Islands","SLB","Sunflowerseed Oil","fabio" +"2412","Solomon Islands","SLB","Rape and Mustard Oil","fabio" +"2413","Solomon Islands","SLB","Cottonseed Oil","fabio" +"2414","Solomon Islands","SLB","Palmkernel Oil","fabio" +"2415","Solomon Islands","SLB","Palm Oil","fabio" +"2416","Solomon Islands","SLB","Coconut Oil","fabio" +"2417","Solomon Islands","SLB","Sesameseed Oil","fabio" +"2418","Solomon Islands","SLB","Olive Oil","fabio" +"2419","Solomon Islands","SLB","Ricebran Oil","fabio" +"2420","Solomon Islands","SLB","Maize Germ Oil","fabio" +"2421","Solomon Islands","SLB","Oilcrops Oil, Other","fabio" +"2422","Solomon Islands","SLB","Soyabean Cake","fabio" +"2423","Solomon Islands","SLB","Groundnut Cake","fabio" +"2424","Solomon Islands","SLB","Sunflowerseed Cake","fabio" +"2425","Solomon Islands","SLB","Rape and Mustard Cake","fabio" +"2426","Solomon Islands","SLB","Cottonseed Cake","fabio" +"2427","Solomon Islands","SLB","Palmkernel Cake","fabio" +"2428","Solomon Islands","SLB","Copra Cake","fabio" +"2429","Solomon Islands","SLB","Sesameseed Cake","fabio" +"2430","Solomon Islands","SLB","Oilseed Cakes, Other","fabio" +"2431","Solomon Islands","SLB","Wine","fabio" +"2432","Solomon Islands","SLB","Beer","fabio" +"2433","Solomon Islands","SLB","Beverages, Fermented","fabio" +"2434","Solomon Islands","SLB","Beverages, Alcoholic","fabio" +"2435","Solomon Islands","SLB","Alcohol, Non-Food","fabio" +"2436","Solomon Islands","SLB","Cotton lint","fabio" +"2437","Solomon Islands","SLB","Cattle","fabio" +"2438","Solomon Islands","SLB","Buffaloes","fabio" +"2439","Solomon Islands","SLB","Sheep","fabio" +"2440","Solomon Islands","SLB","Goats","fabio" +"2441","Solomon Islands","SLB","Pigs","fabio" +"2442","Solomon Islands","SLB","Poultry Birds","fabio" +"2443","Solomon Islands","SLB","Horses","fabio" +"2444","Solomon Islands","SLB","Asses","fabio" +"2445","Solomon Islands","SLB","Mules","fabio" +"2446","Solomon Islands","SLB","Camels","fabio" +"2447","Solomon Islands","SLB","Camelids, other","fabio" +"2448","Solomon Islands","SLB","Rabbits and hares","fabio" +"2449","Solomon Islands","SLB","Rodents, other","fabio" +"2450","Solomon Islands","SLB","Live animals, other","fabio" +"2451","Solomon Islands","SLB","Milk - Excluding Butter","fabio" +"2452","Solomon Islands","SLB","Butter, Ghee","fabio" +"2453","Solomon Islands","SLB","Eggs","fabio" +"2454","Solomon Islands","SLB","Wool (Clean Eq.)","fabio" +"2455","Solomon Islands","SLB","Bovine Meat","fabio" +"2456","Solomon Islands","SLB","Mutton & Goat Meat","fabio" +"2457","Solomon Islands","SLB","Pigmeat","fabio" +"2458","Solomon Islands","SLB","Poultry Meat","fabio" +"2459","Solomon Islands","SLB","Meat, Other","fabio" +"2460","Solomon Islands","SLB","Offals, Edible","fabio" +"2461","Solomon Islands","SLB","Fats, Animals, Raw","fabio" +"2462","Solomon Islands","SLB","Hides and skins","fabio" +"2463","Solomon Islands","SLB","Meat Meal","fabio" +"2464","Solomon Islands","SLB","Pet food","fabio" +"2465","Solomon Islands","SLB","Honey","fabio" +"2466","Solomon Islands","SLB","Silk","fabio" +"2467","Solomon Islands","SLB","Fish, Seafood","fabio" +"2468","Solomon Islands","SLB","Wood fuel","fabio" +"2469","Solomon Islands","SLB","Industrial roundwood, coniferous","fabio" +"2470","Solomon Islands","SLB","Industrial roundwood, non-coniferous","fabio" +"2471","Brunei Darussalam","BRN","Rice (Milled Equivalent)","fabio" +"2472","Brunei Darussalam","BRN","Wheat and products","fabio" +"2473","Brunei Darussalam","BRN","Barley and products","fabio" +"2474","Brunei Darussalam","BRN","Maize and products","fabio" +"2475","Brunei Darussalam","BRN","Rye and products","fabio" +"2476","Brunei Darussalam","BRN","Oats","fabio" +"2477","Brunei Darussalam","BRN","Millet and products","fabio" +"2478","Brunei Darussalam","BRN","Sorghum and products","fabio" +"2479","Brunei Darussalam","BRN","Cereals, Other","fabio" +"2480","Brunei Darussalam","BRN","Potatoes and products","fabio" +"2481","Brunei Darussalam","BRN","Cassava and products","fabio" +"2482","Brunei Darussalam","BRN","Sweet potatoes","fabio" +"2483","Brunei Darussalam","BRN","Roots, Other","fabio" +"2484","Brunei Darussalam","BRN","Yams","fabio" +"2485","Brunei Darussalam","BRN","Sugar cane","fabio" +"2486","Brunei Darussalam","BRN","Sugar beet","fabio" +"2487","Brunei Darussalam","BRN","Beans","fabio" +"2488","Brunei Darussalam","BRN","Peas","fabio" +"2489","Brunei Darussalam","BRN","Pulses, Other and products","fabio" +"2490","Brunei Darussalam","BRN","Nuts and products","fabio" +"2491","Brunei Darussalam","BRN","Soyabeans","fabio" +"2492","Brunei Darussalam","BRN","Groundnuts (Shelled Eq)","fabio" +"2493","Brunei Darussalam","BRN","Sunflower seed","fabio" +"2494","Brunei Darussalam","BRN","Rape and Mustardseed","fabio" +"2495","Brunei Darussalam","BRN","Seed cotton","fabio" +"2496","Brunei Darussalam","BRN","Coconuts - Incl Copra","fabio" +"2497","Brunei Darussalam","BRN","Sesame seed","fabio" +"2498","Brunei Darussalam","BRN","Oil, palm fruit","fabio" +"2499","Brunei Darussalam","BRN","Olives (including preserved)","fabio" +"2500","Brunei Darussalam","BRN","Oilcrops, Other","fabio" +"2501","Brunei Darussalam","BRN","Tomatoes and products","fabio" +"2502","Brunei Darussalam","BRN","Onions","fabio" +"2503","Brunei Darussalam","BRN","Vegetables, Other","fabio" +"2504","Brunei Darussalam","BRN","Oranges, Mandarines","fabio" +"2505","Brunei Darussalam","BRN","Lemons, Limes and products","fabio" +"2506","Brunei Darussalam","BRN","Grapefruit and products","fabio" +"2507","Brunei Darussalam","BRN","Citrus, Other","fabio" +"2508","Brunei Darussalam","BRN","Bananas","fabio" +"2509","Brunei Darussalam","BRN","Plantains","fabio" +"2510","Brunei Darussalam","BRN","Apples and products","fabio" +"2511","Brunei Darussalam","BRN","Pineapples and products","fabio" +"2512","Brunei Darussalam","BRN","Dates","fabio" +"2513","Brunei Darussalam","BRN","Grapes and products (excl wine)","fabio" +"2514","Brunei Darussalam","BRN","Fruits, Other","fabio" +"2515","Brunei Darussalam","BRN","Coffee and products","fabio" +"2516","Brunei Darussalam","BRN","Cocoa Beans and products","fabio" +"2517","Brunei Darussalam","BRN","Tea (including mate)","fabio" +"2518","Brunei Darussalam","BRN","Hops","fabio" +"2519","Brunei Darussalam","BRN","Pepper","fabio" +"2520","Brunei Darussalam","BRN","Pimento","fabio" +"2521","Brunei Darussalam","BRN","Cloves","fabio" +"2522","Brunei Darussalam","BRN","Spices, Other","fabio" +"2523","Brunei Darussalam","BRN","Jute","fabio" +"2524","Brunei Darussalam","BRN","Jute-Like Fibres","fabio" +"2525","Brunei Darussalam","BRN","Soft-Fibres, Other","fabio" +"2526","Brunei Darussalam","BRN","Sisal","fabio" +"2527","Brunei Darussalam","BRN","Abaca","fabio" +"2528","Brunei Darussalam","BRN","Hard Fibres, Other","fabio" +"2529","Brunei Darussalam","BRN","Tobacco","fabio" +"2530","Brunei Darussalam","BRN","Rubber","fabio" +"2531","Brunei Darussalam","BRN","Fodder crops","fabio" +"2532","Brunei Darussalam","BRN","Grazing","fabio" +"2533","Brunei Darussalam","BRN","Cottonseed","fabio" +"2534","Brunei Darussalam","BRN","Palm kernels","fabio" +"2535","Brunei Darussalam","BRN","Sugar non-centrifugal","fabio" +"2536","Brunei Darussalam","BRN","Molasses","fabio" +"2537","Brunei Darussalam","BRN","Sugar, Refined Equiv","fabio" +"2538","Brunei Darussalam","BRN","Sweeteners, Other","fabio" +"2539","Brunei Darussalam","BRN","Soyabean Oil","fabio" +"2540","Brunei Darussalam","BRN","Groundnut Oil","fabio" +"2541","Brunei Darussalam","BRN","Sunflowerseed Oil","fabio" +"2542","Brunei Darussalam","BRN","Rape and Mustard Oil","fabio" +"2543","Brunei Darussalam","BRN","Cottonseed Oil","fabio" +"2544","Brunei Darussalam","BRN","Palmkernel Oil","fabio" +"2545","Brunei Darussalam","BRN","Palm Oil","fabio" +"2546","Brunei Darussalam","BRN","Coconut Oil","fabio" +"2547","Brunei Darussalam","BRN","Sesameseed Oil","fabio" +"2548","Brunei Darussalam","BRN","Olive Oil","fabio" +"2549","Brunei Darussalam","BRN","Ricebran Oil","fabio" +"2550","Brunei Darussalam","BRN","Maize Germ Oil","fabio" +"2551","Brunei Darussalam","BRN","Oilcrops Oil, Other","fabio" +"2552","Brunei Darussalam","BRN","Soyabean Cake","fabio" +"2553","Brunei Darussalam","BRN","Groundnut Cake","fabio" +"2554","Brunei Darussalam","BRN","Sunflowerseed Cake","fabio" +"2555","Brunei Darussalam","BRN","Rape and Mustard Cake","fabio" +"2556","Brunei Darussalam","BRN","Cottonseed Cake","fabio" +"2557","Brunei Darussalam","BRN","Palmkernel Cake","fabio" +"2558","Brunei Darussalam","BRN","Copra Cake","fabio" +"2559","Brunei Darussalam","BRN","Sesameseed Cake","fabio" +"2560","Brunei Darussalam","BRN","Oilseed Cakes, Other","fabio" +"2561","Brunei Darussalam","BRN","Wine","fabio" +"2562","Brunei Darussalam","BRN","Beer","fabio" +"2563","Brunei Darussalam","BRN","Beverages, Fermented","fabio" +"2564","Brunei Darussalam","BRN","Beverages, Alcoholic","fabio" +"2565","Brunei Darussalam","BRN","Alcohol, Non-Food","fabio" +"2566","Brunei Darussalam","BRN","Cotton lint","fabio" +"2567","Brunei Darussalam","BRN","Cattle","fabio" +"2568","Brunei Darussalam","BRN","Buffaloes","fabio" +"2569","Brunei Darussalam","BRN","Sheep","fabio" +"2570","Brunei Darussalam","BRN","Goats","fabio" +"2571","Brunei Darussalam","BRN","Pigs","fabio" +"2572","Brunei Darussalam","BRN","Poultry Birds","fabio" +"2573","Brunei Darussalam","BRN","Horses","fabio" +"2574","Brunei Darussalam","BRN","Asses","fabio" +"2575","Brunei Darussalam","BRN","Mules","fabio" +"2576","Brunei Darussalam","BRN","Camels","fabio" +"2577","Brunei Darussalam","BRN","Camelids, other","fabio" +"2578","Brunei Darussalam","BRN","Rabbits and hares","fabio" +"2579","Brunei Darussalam","BRN","Rodents, other","fabio" +"2580","Brunei Darussalam","BRN","Live animals, other","fabio" +"2581","Brunei Darussalam","BRN","Milk - Excluding Butter","fabio" +"2582","Brunei Darussalam","BRN","Butter, Ghee","fabio" +"2583","Brunei Darussalam","BRN","Eggs","fabio" +"2584","Brunei Darussalam","BRN","Wool (Clean Eq.)","fabio" +"2585","Brunei Darussalam","BRN","Bovine Meat","fabio" +"2586","Brunei Darussalam","BRN","Mutton & Goat Meat","fabio" +"2587","Brunei Darussalam","BRN","Pigmeat","fabio" +"2588","Brunei Darussalam","BRN","Poultry Meat","fabio" +"2589","Brunei Darussalam","BRN","Meat, Other","fabio" +"2590","Brunei Darussalam","BRN","Offals, Edible","fabio" +"2591","Brunei Darussalam","BRN","Fats, Animals, Raw","fabio" +"2592","Brunei Darussalam","BRN","Hides and skins","fabio" +"2593","Brunei Darussalam","BRN","Meat Meal","fabio" +"2594","Brunei Darussalam","BRN","Pet food","fabio" +"2595","Brunei Darussalam","BRN","Honey","fabio" +"2596","Brunei Darussalam","BRN","Silk","fabio" +"2597","Brunei Darussalam","BRN","Fish, Seafood","fabio" +"2598","Brunei Darussalam","BRN","Wood fuel","fabio" +"2599","Brunei Darussalam","BRN","Industrial roundwood, coniferous","fabio" +"2600","Brunei Darussalam","BRN","Industrial roundwood, non-coniferous","fabio" +"2601","Bulgaria","BGR","Rice (Milled Equivalent)","fabio" +"2602","Bulgaria","BGR","Wheat and products","fabio" +"2603","Bulgaria","BGR","Barley and products","fabio" +"2604","Bulgaria","BGR","Maize and products","fabio" +"2605","Bulgaria","BGR","Rye and products","fabio" +"2606","Bulgaria","BGR","Oats","fabio" +"2607","Bulgaria","BGR","Millet and products","fabio" +"2608","Bulgaria","BGR","Sorghum and products","fabio" +"2609","Bulgaria","BGR","Cereals, Other","fabio" +"2610","Bulgaria","BGR","Potatoes and products","fabio" +"2611","Bulgaria","BGR","Cassava and products","fabio" +"2612","Bulgaria","BGR","Sweet potatoes","fabio" +"2613","Bulgaria","BGR","Roots, Other","fabio" +"2614","Bulgaria","BGR","Yams","fabio" +"2615","Bulgaria","BGR","Sugar cane","fabio" +"2616","Bulgaria","BGR","Sugar beet","fabio" +"2617","Bulgaria","BGR","Beans","fabio" +"2618","Bulgaria","BGR","Peas","fabio" +"2619","Bulgaria","BGR","Pulses, Other and products","fabio" +"2620","Bulgaria","BGR","Nuts and products","fabio" +"2621","Bulgaria","BGR","Soyabeans","fabio" +"2622","Bulgaria","BGR","Groundnuts (Shelled Eq)","fabio" +"2623","Bulgaria","BGR","Sunflower seed","fabio" +"2624","Bulgaria","BGR","Rape and Mustardseed","fabio" +"2625","Bulgaria","BGR","Seed cotton","fabio" +"2626","Bulgaria","BGR","Coconuts - Incl Copra","fabio" +"2627","Bulgaria","BGR","Sesame seed","fabio" +"2628","Bulgaria","BGR","Oil, palm fruit","fabio" +"2629","Bulgaria","BGR","Olives (including preserved)","fabio" +"2630","Bulgaria","BGR","Oilcrops, Other","fabio" +"2631","Bulgaria","BGR","Tomatoes and products","fabio" +"2632","Bulgaria","BGR","Onions","fabio" +"2633","Bulgaria","BGR","Vegetables, Other","fabio" +"2634","Bulgaria","BGR","Oranges, Mandarines","fabio" +"2635","Bulgaria","BGR","Lemons, Limes and products","fabio" +"2636","Bulgaria","BGR","Grapefruit and products","fabio" +"2637","Bulgaria","BGR","Citrus, Other","fabio" +"2638","Bulgaria","BGR","Bananas","fabio" +"2639","Bulgaria","BGR","Plantains","fabio" +"2640","Bulgaria","BGR","Apples and products","fabio" +"2641","Bulgaria","BGR","Pineapples and products","fabio" +"2642","Bulgaria","BGR","Dates","fabio" +"2643","Bulgaria","BGR","Grapes and products (excl wine)","fabio" +"2644","Bulgaria","BGR","Fruits, Other","fabio" +"2645","Bulgaria","BGR","Coffee and products","fabio" +"2646","Bulgaria","BGR","Cocoa Beans and products","fabio" +"2647","Bulgaria","BGR","Tea (including mate)","fabio" +"2648","Bulgaria","BGR","Hops","fabio" +"2649","Bulgaria","BGR","Pepper","fabio" +"2650","Bulgaria","BGR","Pimento","fabio" +"2651","Bulgaria","BGR","Cloves","fabio" +"2652","Bulgaria","BGR","Spices, Other","fabio" +"2653","Bulgaria","BGR","Jute","fabio" +"2654","Bulgaria","BGR","Jute-Like Fibres","fabio" +"2655","Bulgaria","BGR","Soft-Fibres, Other","fabio" +"2656","Bulgaria","BGR","Sisal","fabio" +"2657","Bulgaria","BGR","Abaca","fabio" +"2658","Bulgaria","BGR","Hard Fibres, Other","fabio" +"2659","Bulgaria","BGR","Tobacco","fabio" +"2660","Bulgaria","BGR","Rubber","fabio" +"2661","Bulgaria","BGR","Fodder crops","fabio" +"2662","Bulgaria","BGR","Grazing","fabio" +"2663","Bulgaria","BGR","Cottonseed","fabio" +"2664","Bulgaria","BGR","Palm kernels","fabio" +"2665","Bulgaria","BGR","Sugar non-centrifugal","fabio" +"2666","Bulgaria","BGR","Molasses","fabio" +"2667","Bulgaria","BGR","Sugar, Refined Equiv","fabio" +"2668","Bulgaria","BGR","Sweeteners, Other","fabio" +"2669","Bulgaria","BGR","Soyabean Oil","fabio" +"2670","Bulgaria","BGR","Groundnut Oil","fabio" +"2671","Bulgaria","BGR","Sunflowerseed Oil","fabio" +"2672","Bulgaria","BGR","Rape and Mustard Oil","fabio" +"2673","Bulgaria","BGR","Cottonseed Oil","fabio" +"2674","Bulgaria","BGR","Palmkernel Oil","fabio" +"2675","Bulgaria","BGR","Palm Oil","fabio" +"2676","Bulgaria","BGR","Coconut Oil","fabio" +"2677","Bulgaria","BGR","Sesameseed Oil","fabio" +"2678","Bulgaria","BGR","Olive Oil","fabio" +"2679","Bulgaria","BGR","Ricebran Oil","fabio" +"2680","Bulgaria","BGR","Maize Germ Oil","fabio" +"2681","Bulgaria","BGR","Oilcrops Oil, Other","fabio" +"2682","Bulgaria","BGR","Soyabean Cake","fabio" +"2683","Bulgaria","BGR","Groundnut Cake","fabio" +"2684","Bulgaria","BGR","Sunflowerseed Cake","fabio" +"2685","Bulgaria","BGR","Rape and Mustard Cake","fabio" +"2686","Bulgaria","BGR","Cottonseed Cake","fabio" +"2687","Bulgaria","BGR","Palmkernel Cake","fabio" +"2688","Bulgaria","BGR","Copra Cake","fabio" +"2689","Bulgaria","BGR","Sesameseed Cake","fabio" +"2690","Bulgaria","BGR","Oilseed Cakes, Other","fabio" +"2691","Bulgaria","BGR","Wine","fabio" +"2692","Bulgaria","BGR","Beer","fabio" +"2693","Bulgaria","BGR","Beverages, Fermented","fabio" +"2694","Bulgaria","BGR","Beverages, Alcoholic","fabio" +"2695","Bulgaria","BGR","Alcohol, Non-Food","fabio" +"2696","Bulgaria","BGR","Cotton lint","fabio" +"2697","Bulgaria","BGR","Cattle","fabio" +"2698","Bulgaria","BGR","Buffaloes","fabio" +"2699","Bulgaria","BGR","Sheep","fabio" +"2700","Bulgaria","BGR","Goats","fabio" +"2701","Bulgaria","BGR","Pigs","fabio" +"2702","Bulgaria","BGR","Poultry Birds","fabio" +"2703","Bulgaria","BGR","Horses","fabio" +"2704","Bulgaria","BGR","Asses","fabio" +"2705","Bulgaria","BGR","Mules","fabio" +"2706","Bulgaria","BGR","Camels","fabio" +"2707","Bulgaria","BGR","Camelids, other","fabio" +"2708","Bulgaria","BGR","Rabbits and hares","fabio" +"2709","Bulgaria","BGR","Rodents, other","fabio" +"2710","Bulgaria","BGR","Live animals, other","fabio" +"2711","Bulgaria","BGR","Milk - Excluding Butter","fabio" +"2712","Bulgaria","BGR","Butter, Ghee","fabio" +"2713","Bulgaria","BGR","Eggs","fabio" +"2714","Bulgaria","BGR","Wool (Clean Eq.)","fabio" +"2715","Bulgaria","BGR","Bovine Meat","fabio" +"2716","Bulgaria","BGR","Mutton & Goat Meat","fabio" +"2717","Bulgaria","BGR","Pigmeat","fabio" +"2718","Bulgaria","BGR","Poultry Meat","fabio" +"2719","Bulgaria","BGR","Meat, Other","fabio" +"2720","Bulgaria","BGR","Offals, Edible","fabio" +"2721","Bulgaria","BGR","Fats, Animals, Raw","fabio" +"2722","Bulgaria","BGR","Hides and skins","fabio" +"2723","Bulgaria","BGR","Meat Meal","fabio" +"2724","Bulgaria","BGR","Pet food","fabio" +"2725","Bulgaria","BGR","Honey","fabio" +"2726","Bulgaria","BGR","Silk","fabio" +"2727","Bulgaria","BGR","Fish, Seafood","fabio" +"2728","Bulgaria","BGR","Wood fuel","fabio" +"2729","Bulgaria","BGR","Industrial roundwood, coniferous","fabio" +"2730","Bulgaria","BGR","Industrial roundwood, non-coniferous","fabio" +"2731","Myanmar","MMR","Rice (Milled Equivalent)","fabio" +"2732","Myanmar","MMR","Wheat and products","fabio" +"2733","Myanmar","MMR","Barley and products","fabio" +"2734","Myanmar","MMR","Maize and products","fabio" +"2735","Myanmar","MMR","Rye and products","fabio" +"2736","Myanmar","MMR","Oats","fabio" +"2737","Myanmar","MMR","Millet and products","fabio" +"2738","Myanmar","MMR","Sorghum and products","fabio" +"2739","Myanmar","MMR","Cereals, Other","fabio" +"2740","Myanmar","MMR","Potatoes and products","fabio" +"2741","Myanmar","MMR","Cassava and products","fabio" +"2742","Myanmar","MMR","Sweet potatoes","fabio" +"2743","Myanmar","MMR","Roots, Other","fabio" +"2744","Myanmar","MMR","Yams","fabio" +"2745","Myanmar","MMR","Sugar cane","fabio" +"2746","Myanmar","MMR","Sugar beet","fabio" +"2747","Myanmar","MMR","Beans","fabio" +"2748","Myanmar","MMR","Peas","fabio" +"2749","Myanmar","MMR","Pulses, Other and products","fabio" +"2750","Myanmar","MMR","Nuts and products","fabio" +"2751","Myanmar","MMR","Soyabeans","fabio" +"2752","Myanmar","MMR","Groundnuts (Shelled Eq)","fabio" +"2753","Myanmar","MMR","Sunflower seed","fabio" +"2754","Myanmar","MMR","Rape and Mustardseed","fabio" +"2755","Myanmar","MMR","Seed cotton","fabio" +"2756","Myanmar","MMR","Coconuts - Incl Copra","fabio" +"2757","Myanmar","MMR","Sesame seed","fabio" +"2758","Myanmar","MMR","Oil, palm fruit","fabio" +"2759","Myanmar","MMR","Olives (including preserved)","fabio" +"2760","Myanmar","MMR","Oilcrops, Other","fabio" +"2761","Myanmar","MMR","Tomatoes and products","fabio" +"2762","Myanmar","MMR","Onions","fabio" +"2763","Myanmar","MMR","Vegetables, Other","fabio" +"2764","Myanmar","MMR","Oranges, Mandarines","fabio" +"2765","Myanmar","MMR","Lemons, Limes and products","fabio" +"2766","Myanmar","MMR","Grapefruit and products","fabio" +"2767","Myanmar","MMR","Citrus, Other","fabio" +"2768","Myanmar","MMR","Bananas","fabio" +"2769","Myanmar","MMR","Plantains","fabio" +"2770","Myanmar","MMR","Apples and products","fabio" +"2771","Myanmar","MMR","Pineapples and products","fabio" +"2772","Myanmar","MMR","Dates","fabio" +"2773","Myanmar","MMR","Grapes and products (excl wine)","fabio" +"2774","Myanmar","MMR","Fruits, Other","fabio" +"2775","Myanmar","MMR","Coffee and products","fabio" +"2776","Myanmar","MMR","Cocoa Beans and products","fabio" +"2777","Myanmar","MMR","Tea (including mate)","fabio" +"2778","Myanmar","MMR","Hops","fabio" +"2779","Myanmar","MMR","Pepper","fabio" +"2780","Myanmar","MMR","Pimento","fabio" +"2781","Myanmar","MMR","Cloves","fabio" +"2782","Myanmar","MMR","Spices, Other","fabio" +"2783","Myanmar","MMR","Jute","fabio" +"2784","Myanmar","MMR","Jute-Like Fibres","fabio" +"2785","Myanmar","MMR","Soft-Fibres, Other","fabio" +"2786","Myanmar","MMR","Sisal","fabio" +"2787","Myanmar","MMR","Abaca","fabio" +"2788","Myanmar","MMR","Hard Fibres, Other","fabio" +"2789","Myanmar","MMR","Tobacco","fabio" +"2790","Myanmar","MMR","Rubber","fabio" +"2791","Myanmar","MMR","Fodder crops","fabio" +"2792","Myanmar","MMR","Grazing","fabio" +"2793","Myanmar","MMR","Cottonseed","fabio" +"2794","Myanmar","MMR","Palm kernels","fabio" +"2795","Myanmar","MMR","Sugar non-centrifugal","fabio" +"2796","Myanmar","MMR","Molasses","fabio" +"2797","Myanmar","MMR","Sugar, Refined Equiv","fabio" +"2798","Myanmar","MMR","Sweeteners, Other","fabio" +"2799","Myanmar","MMR","Soyabean Oil","fabio" +"2800","Myanmar","MMR","Groundnut Oil","fabio" +"2801","Myanmar","MMR","Sunflowerseed Oil","fabio" +"2802","Myanmar","MMR","Rape and Mustard Oil","fabio" +"2803","Myanmar","MMR","Cottonseed Oil","fabio" +"2804","Myanmar","MMR","Palmkernel Oil","fabio" +"2805","Myanmar","MMR","Palm Oil","fabio" +"2806","Myanmar","MMR","Coconut Oil","fabio" +"2807","Myanmar","MMR","Sesameseed Oil","fabio" +"2808","Myanmar","MMR","Olive Oil","fabio" +"2809","Myanmar","MMR","Ricebran Oil","fabio" +"2810","Myanmar","MMR","Maize Germ Oil","fabio" +"2811","Myanmar","MMR","Oilcrops Oil, Other","fabio" +"2812","Myanmar","MMR","Soyabean Cake","fabio" +"2813","Myanmar","MMR","Groundnut Cake","fabio" +"2814","Myanmar","MMR","Sunflowerseed Cake","fabio" +"2815","Myanmar","MMR","Rape and Mustard Cake","fabio" +"2816","Myanmar","MMR","Cottonseed Cake","fabio" +"2817","Myanmar","MMR","Palmkernel Cake","fabio" +"2818","Myanmar","MMR","Copra Cake","fabio" +"2819","Myanmar","MMR","Sesameseed Cake","fabio" +"2820","Myanmar","MMR","Oilseed Cakes, Other","fabio" +"2821","Myanmar","MMR","Wine","fabio" +"2822","Myanmar","MMR","Beer","fabio" +"2823","Myanmar","MMR","Beverages, Fermented","fabio" +"2824","Myanmar","MMR","Beverages, Alcoholic","fabio" +"2825","Myanmar","MMR","Alcohol, Non-Food","fabio" +"2826","Myanmar","MMR","Cotton lint","fabio" +"2827","Myanmar","MMR","Cattle","fabio" +"2828","Myanmar","MMR","Buffaloes","fabio" +"2829","Myanmar","MMR","Sheep","fabio" +"2830","Myanmar","MMR","Goats","fabio" +"2831","Myanmar","MMR","Pigs","fabio" +"2832","Myanmar","MMR","Poultry Birds","fabio" +"2833","Myanmar","MMR","Horses","fabio" +"2834","Myanmar","MMR","Asses","fabio" +"2835","Myanmar","MMR","Mules","fabio" +"2836","Myanmar","MMR","Camels","fabio" +"2837","Myanmar","MMR","Camelids, other","fabio" +"2838","Myanmar","MMR","Rabbits and hares","fabio" +"2839","Myanmar","MMR","Rodents, other","fabio" +"2840","Myanmar","MMR","Live animals, other","fabio" +"2841","Myanmar","MMR","Milk - Excluding Butter","fabio" +"2842","Myanmar","MMR","Butter, Ghee","fabio" +"2843","Myanmar","MMR","Eggs","fabio" +"2844","Myanmar","MMR","Wool (Clean Eq.)","fabio" +"2845","Myanmar","MMR","Bovine Meat","fabio" +"2846","Myanmar","MMR","Mutton & Goat Meat","fabio" +"2847","Myanmar","MMR","Pigmeat","fabio" +"2848","Myanmar","MMR","Poultry Meat","fabio" +"2849","Myanmar","MMR","Meat, Other","fabio" +"2850","Myanmar","MMR","Offals, Edible","fabio" +"2851","Myanmar","MMR","Fats, Animals, Raw","fabio" +"2852","Myanmar","MMR","Hides and skins","fabio" +"2853","Myanmar","MMR","Meat Meal","fabio" +"2854","Myanmar","MMR","Pet food","fabio" +"2855","Myanmar","MMR","Honey","fabio" +"2856","Myanmar","MMR","Silk","fabio" +"2857","Myanmar","MMR","Fish, Seafood","fabio" +"2858","Myanmar","MMR","Wood fuel","fabio" +"2859","Myanmar","MMR","Industrial roundwood, coniferous","fabio" +"2860","Myanmar","MMR","Industrial roundwood, non-coniferous","fabio" +"2861","Burundi","BDI","Rice (Milled Equivalent)","fabio" +"2862","Burundi","BDI","Wheat and products","fabio" +"2863","Burundi","BDI","Barley and products","fabio" +"2864","Burundi","BDI","Maize and products","fabio" +"2865","Burundi","BDI","Rye and products","fabio" +"2866","Burundi","BDI","Oats","fabio" +"2867","Burundi","BDI","Millet and products","fabio" +"2868","Burundi","BDI","Sorghum and products","fabio" +"2869","Burundi","BDI","Cereals, Other","fabio" +"2870","Burundi","BDI","Potatoes and products","fabio" +"2871","Burundi","BDI","Cassava and products","fabio" +"2872","Burundi","BDI","Sweet potatoes","fabio" +"2873","Burundi","BDI","Roots, Other","fabio" +"2874","Burundi","BDI","Yams","fabio" +"2875","Burundi","BDI","Sugar cane","fabio" +"2876","Burundi","BDI","Sugar beet","fabio" +"2877","Burundi","BDI","Beans","fabio" +"2878","Burundi","BDI","Peas","fabio" +"2879","Burundi","BDI","Pulses, Other and products","fabio" +"2880","Burundi","BDI","Nuts and products","fabio" +"2881","Burundi","BDI","Soyabeans","fabio" +"2882","Burundi","BDI","Groundnuts (Shelled Eq)","fabio" +"2883","Burundi","BDI","Sunflower seed","fabio" +"2884","Burundi","BDI","Rape and Mustardseed","fabio" +"2885","Burundi","BDI","Seed cotton","fabio" +"2886","Burundi","BDI","Coconuts - Incl Copra","fabio" +"2887","Burundi","BDI","Sesame seed","fabio" +"2888","Burundi","BDI","Oil, palm fruit","fabio" +"2889","Burundi","BDI","Olives (including preserved)","fabio" +"2890","Burundi","BDI","Oilcrops, Other","fabio" +"2891","Burundi","BDI","Tomatoes and products","fabio" +"2892","Burundi","BDI","Onions","fabio" +"2893","Burundi","BDI","Vegetables, Other","fabio" +"2894","Burundi","BDI","Oranges, Mandarines","fabio" +"2895","Burundi","BDI","Lemons, Limes and products","fabio" +"2896","Burundi","BDI","Grapefruit and products","fabio" +"2897","Burundi","BDI","Citrus, Other","fabio" +"2898","Burundi","BDI","Bananas","fabio" +"2899","Burundi","BDI","Plantains","fabio" +"2900","Burundi","BDI","Apples and products","fabio" +"2901","Burundi","BDI","Pineapples and products","fabio" +"2902","Burundi","BDI","Dates","fabio" +"2903","Burundi","BDI","Grapes and products (excl wine)","fabio" +"2904","Burundi","BDI","Fruits, Other","fabio" +"2905","Burundi","BDI","Coffee and products","fabio" +"2906","Burundi","BDI","Cocoa Beans and products","fabio" +"2907","Burundi","BDI","Tea (including mate)","fabio" +"2908","Burundi","BDI","Hops","fabio" +"2909","Burundi","BDI","Pepper","fabio" +"2910","Burundi","BDI","Pimento","fabio" +"2911","Burundi","BDI","Cloves","fabio" +"2912","Burundi","BDI","Spices, Other","fabio" +"2913","Burundi","BDI","Jute","fabio" +"2914","Burundi","BDI","Jute-Like Fibres","fabio" +"2915","Burundi","BDI","Soft-Fibres, Other","fabio" +"2916","Burundi","BDI","Sisal","fabio" +"2917","Burundi","BDI","Abaca","fabio" +"2918","Burundi","BDI","Hard Fibres, Other","fabio" +"2919","Burundi","BDI","Tobacco","fabio" +"2920","Burundi","BDI","Rubber","fabio" +"2921","Burundi","BDI","Fodder crops","fabio" +"2922","Burundi","BDI","Grazing","fabio" +"2923","Burundi","BDI","Cottonseed","fabio" +"2924","Burundi","BDI","Palm kernels","fabio" +"2925","Burundi","BDI","Sugar non-centrifugal","fabio" +"2926","Burundi","BDI","Molasses","fabio" +"2927","Burundi","BDI","Sugar, Refined Equiv","fabio" +"2928","Burundi","BDI","Sweeteners, Other","fabio" +"2929","Burundi","BDI","Soyabean Oil","fabio" +"2930","Burundi","BDI","Groundnut Oil","fabio" +"2931","Burundi","BDI","Sunflowerseed Oil","fabio" +"2932","Burundi","BDI","Rape and Mustard Oil","fabio" +"2933","Burundi","BDI","Cottonseed Oil","fabio" +"2934","Burundi","BDI","Palmkernel Oil","fabio" +"2935","Burundi","BDI","Palm Oil","fabio" +"2936","Burundi","BDI","Coconut Oil","fabio" +"2937","Burundi","BDI","Sesameseed Oil","fabio" +"2938","Burundi","BDI","Olive Oil","fabio" +"2939","Burundi","BDI","Ricebran Oil","fabio" +"2940","Burundi","BDI","Maize Germ Oil","fabio" +"2941","Burundi","BDI","Oilcrops Oil, Other","fabio" +"2942","Burundi","BDI","Soyabean Cake","fabio" +"2943","Burundi","BDI","Groundnut Cake","fabio" +"2944","Burundi","BDI","Sunflowerseed Cake","fabio" +"2945","Burundi","BDI","Rape and Mustard Cake","fabio" +"2946","Burundi","BDI","Cottonseed Cake","fabio" +"2947","Burundi","BDI","Palmkernel Cake","fabio" +"2948","Burundi","BDI","Copra Cake","fabio" +"2949","Burundi","BDI","Sesameseed Cake","fabio" +"2950","Burundi","BDI","Oilseed Cakes, Other","fabio" +"2951","Burundi","BDI","Wine","fabio" +"2952","Burundi","BDI","Beer","fabio" +"2953","Burundi","BDI","Beverages, Fermented","fabio" +"2954","Burundi","BDI","Beverages, Alcoholic","fabio" +"2955","Burundi","BDI","Alcohol, Non-Food","fabio" +"2956","Burundi","BDI","Cotton lint","fabio" +"2957","Burundi","BDI","Cattle","fabio" +"2958","Burundi","BDI","Buffaloes","fabio" +"2959","Burundi","BDI","Sheep","fabio" +"2960","Burundi","BDI","Goats","fabio" +"2961","Burundi","BDI","Pigs","fabio" +"2962","Burundi","BDI","Poultry Birds","fabio" +"2963","Burundi","BDI","Horses","fabio" +"2964","Burundi","BDI","Asses","fabio" +"2965","Burundi","BDI","Mules","fabio" +"2966","Burundi","BDI","Camels","fabio" +"2967","Burundi","BDI","Camelids, other","fabio" +"2968","Burundi","BDI","Rabbits and hares","fabio" +"2969","Burundi","BDI","Rodents, other","fabio" +"2970","Burundi","BDI","Live animals, other","fabio" +"2971","Burundi","BDI","Milk - Excluding Butter","fabio" +"2972","Burundi","BDI","Butter, Ghee","fabio" +"2973","Burundi","BDI","Eggs","fabio" +"2974","Burundi","BDI","Wool (Clean Eq.)","fabio" +"2975","Burundi","BDI","Bovine Meat","fabio" +"2976","Burundi","BDI","Mutton & Goat Meat","fabio" +"2977","Burundi","BDI","Pigmeat","fabio" +"2978","Burundi","BDI","Poultry Meat","fabio" +"2979","Burundi","BDI","Meat, Other","fabio" +"2980","Burundi","BDI","Offals, Edible","fabio" +"2981","Burundi","BDI","Fats, Animals, Raw","fabio" +"2982","Burundi","BDI","Hides and skins","fabio" +"2983","Burundi","BDI","Meat Meal","fabio" +"2984","Burundi","BDI","Pet food","fabio" +"2985","Burundi","BDI","Honey","fabio" +"2986","Burundi","BDI","Silk","fabio" +"2987","Burundi","BDI","Fish, Seafood","fabio" +"2988","Burundi","BDI","Wood fuel","fabio" +"2989","Burundi","BDI","Industrial roundwood, coniferous","fabio" +"2990","Burundi","BDI","Industrial roundwood, non-coniferous","fabio" +"2991","Cameroon","CMR","Rice (Milled Equivalent)","fabio" +"2992","Cameroon","CMR","Wheat and products","fabio" +"2993","Cameroon","CMR","Barley and products","fabio" +"2994","Cameroon","CMR","Maize and products","fabio" +"2995","Cameroon","CMR","Rye and products","fabio" +"2996","Cameroon","CMR","Oats","fabio" +"2997","Cameroon","CMR","Millet and products","fabio" +"2998","Cameroon","CMR","Sorghum and products","fabio" +"2999","Cameroon","CMR","Cereals, Other","fabio" +"3000","Cameroon","CMR","Potatoes and products","fabio" +"3001","Cameroon","CMR","Cassava and products","fabio" +"3002","Cameroon","CMR","Sweet potatoes","fabio" +"3003","Cameroon","CMR","Roots, Other","fabio" +"3004","Cameroon","CMR","Yams","fabio" +"3005","Cameroon","CMR","Sugar cane","fabio" +"3006","Cameroon","CMR","Sugar beet","fabio" +"3007","Cameroon","CMR","Beans","fabio" +"3008","Cameroon","CMR","Peas","fabio" +"3009","Cameroon","CMR","Pulses, Other and products","fabio" +"3010","Cameroon","CMR","Nuts and products","fabio" +"3011","Cameroon","CMR","Soyabeans","fabio" +"3012","Cameroon","CMR","Groundnuts (Shelled Eq)","fabio" +"3013","Cameroon","CMR","Sunflower seed","fabio" +"3014","Cameroon","CMR","Rape and Mustardseed","fabio" +"3015","Cameroon","CMR","Seed cotton","fabio" +"3016","Cameroon","CMR","Coconuts - Incl Copra","fabio" +"3017","Cameroon","CMR","Sesame seed","fabio" +"3018","Cameroon","CMR","Oil, palm fruit","fabio" +"3019","Cameroon","CMR","Olives (including preserved)","fabio" +"3020","Cameroon","CMR","Oilcrops, Other","fabio" +"3021","Cameroon","CMR","Tomatoes and products","fabio" +"3022","Cameroon","CMR","Onions","fabio" +"3023","Cameroon","CMR","Vegetables, Other","fabio" +"3024","Cameroon","CMR","Oranges, Mandarines","fabio" +"3025","Cameroon","CMR","Lemons, Limes and products","fabio" +"3026","Cameroon","CMR","Grapefruit and products","fabio" +"3027","Cameroon","CMR","Citrus, Other","fabio" +"3028","Cameroon","CMR","Bananas","fabio" +"3029","Cameroon","CMR","Plantains","fabio" +"3030","Cameroon","CMR","Apples and products","fabio" +"3031","Cameroon","CMR","Pineapples and products","fabio" +"3032","Cameroon","CMR","Dates","fabio" +"3033","Cameroon","CMR","Grapes and products (excl wine)","fabio" +"3034","Cameroon","CMR","Fruits, Other","fabio" +"3035","Cameroon","CMR","Coffee and products","fabio" +"3036","Cameroon","CMR","Cocoa Beans and products","fabio" +"3037","Cameroon","CMR","Tea (including mate)","fabio" +"3038","Cameroon","CMR","Hops","fabio" +"3039","Cameroon","CMR","Pepper","fabio" +"3040","Cameroon","CMR","Pimento","fabio" +"3041","Cameroon","CMR","Cloves","fabio" +"3042","Cameroon","CMR","Spices, Other","fabio" +"3043","Cameroon","CMR","Jute","fabio" +"3044","Cameroon","CMR","Jute-Like Fibres","fabio" +"3045","Cameroon","CMR","Soft-Fibres, Other","fabio" +"3046","Cameroon","CMR","Sisal","fabio" +"3047","Cameroon","CMR","Abaca","fabio" +"3048","Cameroon","CMR","Hard Fibres, Other","fabio" +"3049","Cameroon","CMR","Tobacco","fabio" +"3050","Cameroon","CMR","Rubber","fabio" +"3051","Cameroon","CMR","Fodder crops","fabio" +"3052","Cameroon","CMR","Grazing","fabio" +"3053","Cameroon","CMR","Cottonseed","fabio" +"3054","Cameroon","CMR","Palm kernels","fabio" +"3055","Cameroon","CMR","Sugar non-centrifugal","fabio" +"3056","Cameroon","CMR","Molasses","fabio" +"3057","Cameroon","CMR","Sugar, Refined Equiv","fabio" +"3058","Cameroon","CMR","Sweeteners, Other","fabio" +"3059","Cameroon","CMR","Soyabean Oil","fabio" +"3060","Cameroon","CMR","Groundnut Oil","fabio" +"3061","Cameroon","CMR","Sunflowerseed Oil","fabio" +"3062","Cameroon","CMR","Rape and Mustard Oil","fabio" +"3063","Cameroon","CMR","Cottonseed Oil","fabio" +"3064","Cameroon","CMR","Palmkernel Oil","fabio" +"3065","Cameroon","CMR","Palm Oil","fabio" +"3066","Cameroon","CMR","Coconut Oil","fabio" +"3067","Cameroon","CMR","Sesameseed Oil","fabio" +"3068","Cameroon","CMR","Olive Oil","fabio" +"3069","Cameroon","CMR","Ricebran Oil","fabio" +"3070","Cameroon","CMR","Maize Germ Oil","fabio" +"3071","Cameroon","CMR","Oilcrops Oil, Other","fabio" +"3072","Cameroon","CMR","Soyabean Cake","fabio" +"3073","Cameroon","CMR","Groundnut Cake","fabio" +"3074","Cameroon","CMR","Sunflowerseed Cake","fabio" +"3075","Cameroon","CMR","Rape and Mustard Cake","fabio" +"3076","Cameroon","CMR","Cottonseed Cake","fabio" +"3077","Cameroon","CMR","Palmkernel Cake","fabio" +"3078","Cameroon","CMR","Copra Cake","fabio" +"3079","Cameroon","CMR","Sesameseed Cake","fabio" +"3080","Cameroon","CMR","Oilseed Cakes, Other","fabio" +"3081","Cameroon","CMR","Wine","fabio" +"3082","Cameroon","CMR","Beer","fabio" +"3083","Cameroon","CMR","Beverages, Fermented","fabio" +"3084","Cameroon","CMR","Beverages, Alcoholic","fabio" +"3085","Cameroon","CMR","Alcohol, Non-Food","fabio" +"3086","Cameroon","CMR","Cotton lint","fabio" +"3087","Cameroon","CMR","Cattle","fabio" +"3088","Cameroon","CMR","Buffaloes","fabio" +"3089","Cameroon","CMR","Sheep","fabio" +"3090","Cameroon","CMR","Goats","fabio" +"3091","Cameroon","CMR","Pigs","fabio" +"3092","Cameroon","CMR","Poultry Birds","fabio" +"3093","Cameroon","CMR","Horses","fabio" +"3094","Cameroon","CMR","Asses","fabio" +"3095","Cameroon","CMR","Mules","fabio" +"3096","Cameroon","CMR","Camels","fabio" +"3097","Cameroon","CMR","Camelids, other","fabio" +"3098","Cameroon","CMR","Rabbits and hares","fabio" +"3099","Cameroon","CMR","Rodents, other","fabio" +"3100","Cameroon","CMR","Live animals, other","fabio" +"3101","Cameroon","CMR","Milk - Excluding Butter","fabio" +"3102","Cameroon","CMR","Butter, Ghee","fabio" +"3103","Cameroon","CMR","Eggs","fabio" +"3104","Cameroon","CMR","Wool (Clean Eq.)","fabio" +"3105","Cameroon","CMR","Bovine Meat","fabio" +"3106","Cameroon","CMR","Mutton & Goat Meat","fabio" +"3107","Cameroon","CMR","Pigmeat","fabio" +"3108","Cameroon","CMR","Poultry Meat","fabio" +"3109","Cameroon","CMR","Meat, Other","fabio" +"3110","Cameroon","CMR","Offals, Edible","fabio" +"3111","Cameroon","CMR","Fats, Animals, Raw","fabio" +"3112","Cameroon","CMR","Hides and skins","fabio" +"3113","Cameroon","CMR","Meat Meal","fabio" +"3114","Cameroon","CMR","Pet food","fabio" +"3115","Cameroon","CMR","Honey","fabio" +"3116","Cameroon","CMR","Silk","fabio" +"3117","Cameroon","CMR","Fish, Seafood","fabio" +"3118","Cameroon","CMR","Wood fuel","fabio" +"3119","Cameroon","CMR","Industrial roundwood, coniferous","fabio" +"3120","Cameroon","CMR","Industrial roundwood, non-coniferous","fabio" +"3121","Canada","CAN","Rice (Milled Equivalent)","fabio" +"3122","Canada","CAN","Wheat and products","fabio" +"3123","Canada","CAN","Barley and products","fabio" +"3124","Canada","CAN","Maize and products","fabio" +"3125","Canada","CAN","Rye and products","fabio" +"3126","Canada","CAN","Oats","fabio" +"3127","Canada","CAN","Millet and products","fabio" +"3128","Canada","CAN","Sorghum and products","fabio" +"3129","Canada","CAN","Cereals, Other","fabio" +"3130","Canada","CAN","Potatoes and products","fabio" +"3131","Canada","CAN","Cassava and products","fabio" +"3132","Canada","CAN","Sweet potatoes","fabio" +"3133","Canada","CAN","Roots, Other","fabio" +"3134","Canada","CAN","Yams","fabio" +"3135","Canada","CAN","Sugar cane","fabio" +"3136","Canada","CAN","Sugar beet","fabio" +"3137","Canada","CAN","Beans","fabio" +"3138","Canada","CAN","Peas","fabio" +"3139","Canada","CAN","Pulses, Other and products","fabio" +"3140","Canada","CAN","Nuts and products","fabio" +"3141","Canada","CAN","Soyabeans","fabio" +"3142","Canada","CAN","Groundnuts (Shelled Eq)","fabio" +"3143","Canada","CAN","Sunflower seed","fabio" +"3144","Canada","CAN","Rape and Mustardseed","fabio" +"3145","Canada","CAN","Seed cotton","fabio" +"3146","Canada","CAN","Coconuts - Incl Copra","fabio" +"3147","Canada","CAN","Sesame seed","fabio" +"3148","Canada","CAN","Oil, palm fruit","fabio" +"3149","Canada","CAN","Olives (including preserved)","fabio" +"3150","Canada","CAN","Oilcrops, Other","fabio" +"3151","Canada","CAN","Tomatoes and products","fabio" +"3152","Canada","CAN","Onions","fabio" +"3153","Canada","CAN","Vegetables, Other","fabio" +"3154","Canada","CAN","Oranges, Mandarines","fabio" +"3155","Canada","CAN","Lemons, Limes and products","fabio" +"3156","Canada","CAN","Grapefruit and products","fabio" +"3157","Canada","CAN","Citrus, Other","fabio" +"3158","Canada","CAN","Bananas","fabio" +"3159","Canada","CAN","Plantains","fabio" +"3160","Canada","CAN","Apples and products","fabio" +"3161","Canada","CAN","Pineapples and products","fabio" +"3162","Canada","CAN","Dates","fabio" +"3163","Canada","CAN","Grapes and products (excl wine)","fabio" +"3164","Canada","CAN","Fruits, Other","fabio" +"3165","Canada","CAN","Coffee and products","fabio" +"3166","Canada","CAN","Cocoa Beans and products","fabio" +"3167","Canada","CAN","Tea (including mate)","fabio" +"3168","Canada","CAN","Hops","fabio" +"3169","Canada","CAN","Pepper","fabio" +"3170","Canada","CAN","Pimento","fabio" +"3171","Canada","CAN","Cloves","fabio" +"3172","Canada","CAN","Spices, Other","fabio" +"3173","Canada","CAN","Jute","fabio" +"3174","Canada","CAN","Jute-Like Fibres","fabio" +"3175","Canada","CAN","Soft-Fibres, Other","fabio" +"3176","Canada","CAN","Sisal","fabio" +"3177","Canada","CAN","Abaca","fabio" +"3178","Canada","CAN","Hard Fibres, Other","fabio" +"3179","Canada","CAN","Tobacco","fabio" +"3180","Canada","CAN","Rubber","fabio" +"3181","Canada","CAN","Fodder crops","fabio" +"3182","Canada","CAN","Grazing","fabio" +"3183","Canada","CAN","Cottonseed","fabio" +"3184","Canada","CAN","Palm kernels","fabio" +"3185","Canada","CAN","Sugar non-centrifugal","fabio" +"3186","Canada","CAN","Molasses","fabio" +"3187","Canada","CAN","Sugar, Refined Equiv","fabio" +"3188","Canada","CAN","Sweeteners, Other","fabio" +"3189","Canada","CAN","Soyabean Oil","fabio" +"3190","Canada","CAN","Groundnut Oil","fabio" +"3191","Canada","CAN","Sunflowerseed Oil","fabio" +"3192","Canada","CAN","Rape and Mustard Oil","fabio" +"3193","Canada","CAN","Cottonseed Oil","fabio" +"3194","Canada","CAN","Palmkernel Oil","fabio" +"3195","Canada","CAN","Palm Oil","fabio" +"3196","Canada","CAN","Coconut Oil","fabio" +"3197","Canada","CAN","Sesameseed Oil","fabio" +"3198","Canada","CAN","Olive Oil","fabio" +"3199","Canada","CAN","Ricebran Oil","fabio" +"3200","Canada","CAN","Maize Germ Oil","fabio" +"3201","Canada","CAN","Oilcrops Oil, Other","fabio" +"3202","Canada","CAN","Soyabean Cake","fabio" +"3203","Canada","CAN","Groundnut Cake","fabio" +"3204","Canada","CAN","Sunflowerseed Cake","fabio" +"3205","Canada","CAN","Rape and Mustard Cake","fabio" +"3206","Canada","CAN","Cottonseed Cake","fabio" +"3207","Canada","CAN","Palmkernel Cake","fabio" +"3208","Canada","CAN","Copra Cake","fabio" +"3209","Canada","CAN","Sesameseed Cake","fabio" +"3210","Canada","CAN","Oilseed Cakes, Other","fabio" +"3211","Canada","CAN","Wine","fabio" +"3212","Canada","CAN","Beer","fabio" +"3213","Canada","CAN","Beverages, Fermented","fabio" +"3214","Canada","CAN","Beverages, Alcoholic","fabio" +"3215","Canada","CAN","Alcohol, Non-Food","fabio" +"3216","Canada","CAN","Cotton lint","fabio" +"3217","Canada","CAN","Cattle","fabio" +"3218","Canada","CAN","Buffaloes","fabio" +"3219","Canada","CAN","Sheep","fabio" +"3220","Canada","CAN","Goats","fabio" +"3221","Canada","CAN","Pigs","fabio" +"3222","Canada","CAN","Poultry Birds","fabio" +"3223","Canada","CAN","Horses","fabio" +"3224","Canada","CAN","Asses","fabio" +"3225","Canada","CAN","Mules","fabio" +"3226","Canada","CAN","Camels","fabio" +"3227","Canada","CAN","Camelids, other","fabio" +"3228","Canada","CAN","Rabbits and hares","fabio" +"3229","Canada","CAN","Rodents, other","fabio" +"3230","Canada","CAN","Live animals, other","fabio" +"3231","Canada","CAN","Milk - Excluding Butter","fabio" +"3232","Canada","CAN","Butter, Ghee","fabio" +"3233","Canada","CAN","Eggs","fabio" +"3234","Canada","CAN","Wool (Clean Eq.)","fabio" +"3235","Canada","CAN","Bovine Meat","fabio" +"3236","Canada","CAN","Mutton & Goat Meat","fabio" +"3237","Canada","CAN","Pigmeat","fabio" +"3238","Canada","CAN","Poultry Meat","fabio" +"3239","Canada","CAN","Meat, Other","fabio" +"3240","Canada","CAN","Offals, Edible","fabio" +"3241","Canada","CAN","Fats, Animals, Raw","fabio" +"3242","Canada","CAN","Hides and skins","fabio" +"3243","Canada","CAN","Meat Meal","fabio" +"3244","Canada","CAN","Pet food","fabio" +"3245","Canada","CAN","Honey","fabio" +"3246","Canada","CAN","Silk","fabio" +"3247","Canada","CAN","Fish, Seafood","fabio" +"3248","Canada","CAN","Wood fuel","fabio" +"3249","Canada","CAN","Industrial roundwood, coniferous","fabio" +"3250","Canada","CAN","Industrial roundwood, non-coniferous","fabio" +"3251","Cabo Verde","CPV","Rice (Milled Equivalent)","fabio" +"3252","Cabo Verde","CPV","Wheat and products","fabio" +"3253","Cabo Verde","CPV","Barley and products","fabio" +"3254","Cabo Verde","CPV","Maize and products","fabio" +"3255","Cabo Verde","CPV","Rye and products","fabio" +"3256","Cabo Verde","CPV","Oats","fabio" +"3257","Cabo Verde","CPV","Millet and products","fabio" +"3258","Cabo Verde","CPV","Sorghum and products","fabio" +"3259","Cabo Verde","CPV","Cereals, Other","fabio" +"3260","Cabo Verde","CPV","Potatoes and products","fabio" +"3261","Cabo Verde","CPV","Cassava and products","fabio" +"3262","Cabo Verde","CPV","Sweet potatoes","fabio" +"3263","Cabo Verde","CPV","Roots, Other","fabio" +"3264","Cabo Verde","CPV","Yams","fabio" +"3265","Cabo Verde","CPV","Sugar cane","fabio" +"3266","Cabo Verde","CPV","Sugar beet","fabio" +"3267","Cabo Verde","CPV","Beans","fabio" +"3268","Cabo Verde","CPV","Peas","fabio" +"3269","Cabo Verde","CPV","Pulses, Other and products","fabio" +"3270","Cabo Verde","CPV","Nuts and products","fabio" +"3271","Cabo Verde","CPV","Soyabeans","fabio" +"3272","Cabo Verde","CPV","Groundnuts (Shelled Eq)","fabio" +"3273","Cabo Verde","CPV","Sunflower seed","fabio" +"3274","Cabo Verde","CPV","Rape and Mustardseed","fabio" +"3275","Cabo Verde","CPV","Seed cotton","fabio" +"3276","Cabo Verde","CPV","Coconuts - Incl Copra","fabio" +"3277","Cabo Verde","CPV","Sesame seed","fabio" +"3278","Cabo Verde","CPV","Oil, palm fruit","fabio" +"3279","Cabo Verde","CPV","Olives (including preserved)","fabio" +"3280","Cabo Verde","CPV","Oilcrops, Other","fabio" +"3281","Cabo Verde","CPV","Tomatoes and products","fabio" +"3282","Cabo Verde","CPV","Onions","fabio" +"3283","Cabo Verde","CPV","Vegetables, Other","fabio" +"3284","Cabo Verde","CPV","Oranges, Mandarines","fabio" +"3285","Cabo Verde","CPV","Lemons, Limes and products","fabio" +"3286","Cabo Verde","CPV","Grapefruit and products","fabio" +"3287","Cabo Verde","CPV","Citrus, Other","fabio" +"3288","Cabo Verde","CPV","Bananas","fabio" +"3289","Cabo Verde","CPV","Plantains","fabio" +"3290","Cabo Verde","CPV","Apples and products","fabio" +"3291","Cabo Verde","CPV","Pineapples and products","fabio" +"3292","Cabo Verde","CPV","Dates","fabio" +"3293","Cabo Verde","CPV","Grapes and products (excl wine)","fabio" +"3294","Cabo Verde","CPV","Fruits, Other","fabio" +"3295","Cabo Verde","CPV","Coffee and products","fabio" +"3296","Cabo Verde","CPV","Cocoa Beans and products","fabio" +"3297","Cabo Verde","CPV","Tea (including mate)","fabio" +"3298","Cabo Verde","CPV","Hops","fabio" +"3299","Cabo Verde","CPV","Pepper","fabio" +"3300","Cabo Verde","CPV","Pimento","fabio" +"3301","Cabo Verde","CPV","Cloves","fabio" +"3302","Cabo Verde","CPV","Spices, Other","fabio" +"3303","Cabo Verde","CPV","Jute","fabio" +"3304","Cabo Verde","CPV","Jute-Like Fibres","fabio" +"3305","Cabo Verde","CPV","Soft-Fibres, Other","fabio" +"3306","Cabo Verde","CPV","Sisal","fabio" +"3307","Cabo Verde","CPV","Abaca","fabio" +"3308","Cabo Verde","CPV","Hard Fibres, Other","fabio" +"3309","Cabo Verde","CPV","Tobacco","fabio" +"3310","Cabo Verde","CPV","Rubber","fabio" +"3311","Cabo Verde","CPV","Fodder crops","fabio" +"3312","Cabo Verde","CPV","Grazing","fabio" +"3313","Cabo Verde","CPV","Cottonseed","fabio" +"3314","Cabo Verde","CPV","Palm kernels","fabio" +"3315","Cabo Verde","CPV","Sugar non-centrifugal","fabio" +"3316","Cabo Verde","CPV","Molasses","fabio" +"3317","Cabo Verde","CPV","Sugar, Refined Equiv","fabio" +"3318","Cabo Verde","CPV","Sweeteners, Other","fabio" +"3319","Cabo Verde","CPV","Soyabean Oil","fabio" +"3320","Cabo Verde","CPV","Groundnut Oil","fabio" +"3321","Cabo Verde","CPV","Sunflowerseed Oil","fabio" +"3322","Cabo Verde","CPV","Rape and Mustard Oil","fabio" +"3323","Cabo Verde","CPV","Cottonseed Oil","fabio" +"3324","Cabo Verde","CPV","Palmkernel Oil","fabio" +"3325","Cabo Verde","CPV","Palm Oil","fabio" +"3326","Cabo Verde","CPV","Coconut Oil","fabio" +"3327","Cabo Verde","CPV","Sesameseed Oil","fabio" +"3328","Cabo Verde","CPV","Olive Oil","fabio" +"3329","Cabo Verde","CPV","Ricebran Oil","fabio" +"3330","Cabo Verde","CPV","Maize Germ Oil","fabio" +"3331","Cabo Verde","CPV","Oilcrops Oil, Other","fabio" +"3332","Cabo Verde","CPV","Soyabean Cake","fabio" +"3333","Cabo Verde","CPV","Groundnut Cake","fabio" +"3334","Cabo Verde","CPV","Sunflowerseed Cake","fabio" +"3335","Cabo Verde","CPV","Rape and Mustard Cake","fabio" +"3336","Cabo Verde","CPV","Cottonseed Cake","fabio" +"3337","Cabo Verde","CPV","Palmkernel Cake","fabio" +"3338","Cabo Verde","CPV","Copra Cake","fabio" +"3339","Cabo Verde","CPV","Sesameseed Cake","fabio" +"3340","Cabo Verde","CPV","Oilseed Cakes, Other","fabio" +"3341","Cabo Verde","CPV","Wine","fabio" +"3342","Cabo Verde","CPV","Beer","fabio" +"3343","Cabo Verde","CPV","Beverages, Fermented","fabio" +"3344","Cabo Verde","CPV","Beverages, Alcoholic","fabio" +"3345","Cabo Verde","CPV","Alcohol, Non-Food","fabio" +"3346","Cabo Verde","CPV","Cotton lint","fabio" +"3347","Cabo Verde","CPV","Cattle","fabio" +"3348","Cabo Verde","CPV","Buffaloes","fabio" +"3349","Cabo Verde","CPV","Sheep","fabio" +"3350","Cabo Verde","CPV","Goats","fabio" +"3351","Cabo Verde","CPV","Pigs","fabio" +"3352","Cabo Verde","CPV","Poultry Birds","fabio" +"3353","Cabo Verde","CPV","Horses","fabio" +"3354","Cabo Verde","CPV","Asses","fabio" +"3355","Cabo Verde","CPV","Mules","fabio" +"3356","Cabo Verde","CPV","Camels","fabio" +"3357","Cabo Verde","CPV","Camelids, other","fabio" +"3358","Cabo Verde","CPV","Rabbits and hares","fabio" +"3359","Cabo Verde","CPV","Rodents, other","fabio" +"3360","Cabo Verde","CPV","Live animals, other","fabio" +"3361","Cabo Verde","CPV","Milk - Excluding Butter","fabio" +"3362","Cabo Verde","CPV","Butter, Ghee","fabio" +"3363","Cabo Verde","CPV","Eggs","fabio" +"3364","Cabo Verde","CPV","Wool (Clean Eq.)","fabio" +"3365","Cabo Verde","CPV","Bovine Meat","fabio" +"3366","Cabo Verde","CPV","Mutton & Goat Meat","fabio" +"3367","Cabo Verde","CPV","Pigmeat","fabio" +"3368","Cabo Verde","CPV","Poultry Meat","fabio" +"3369","Cabo Verde","CPV","Meat, Other","fabio" +"3370","Cabo Verde","CPV","Offals, Edible","fabio" +"3371","Cabo Verde","CPV","Fats, Animals, Raw","fabio" +"3372","Cabo Verde","CPV","Hides and skins","fabio" +"3373","Cabo Verde","CPV","Meat Meal","fabio" +"3374","Cabo Verde","CPV","Pet food","fabio" +"3375","Cabo Verde","CPV","Honey","fabio" +"3376","Cabo Verde","CPV","Silk","fabio" +"3377","Cabo Verde","CPV","Fish, Seafood","fabio" +"3378","Cabo Verde","CPV","Wood fuel","fabio" +"3379","Cabo Verde","CPV","Industrial roundwood, coniferous","fabio" +"3380","Cabo Verde","CPV","Industrial roundwood, non-coniferous","fabio" +"3381","Central African Republic","CAF","Rice (Milled Equivalent)","fabio" +"3382","Central African Republic","CAF","Wheat and products","fabio" +"3383","Central African Republic","CAF","Barley and products","fabio" +"3384","Central African Republic","CAF","Maize and products","fabio" +"3385","Central African Republic","CAF","Rye and products","fabio" +"3386","Central African Republic","CAF","Oats","fabio" +"3387","Central African Republic","CAF","Millet and products","fabio" +"3388","Central African Republic","CAF","Sorghum and products","fabio" +"3389","Central African Republic","CAF","Cereals, Other","fabio" +"3390","Central African Republic","CAF","Potatoes and products","fabio" +"3391","Central African Republic","CAF","Cassava and products","fabio" +"3392","Central African Republic","CAF","Sweet potatoes","fabio" +"3393","Central African Republic","CAF","Roots, Other","fabio" +"3394","Central African Republic","CAF","Yams","fabio" +"3395","Central African Republic","CAF","Sugar cane","fabio" +"3396","Central African Republic","CAF","Sugar beet","fabio" +"3397","Central African Republic","CAF","Beans","fabio" +"3398","Central African Republic","CAF","Peas","fabio" +"3399","Central African Republic","CAF","Pulses, Other and products","fabio" +"3400","Central African Republic","CAF","Nuts and products","fabio" +"3401","Central African Republic","CAF","Soyabeans","fabio" +"3402","Central African Republic","CAF","Groundnuts (Shelled Eq)","fabio" +"3403","Central African Republic","CAF","Sunflower seed","fabio" +"3404","Central African Republic","CAF","Rape and Mustardseed","fabio" +"3405","Central African Republic","CAF","Seed cotton","fabio" +"3406","Central African Republic","CAF","Coconuts - Incl Copra","fabio" +"3407","Central African Republic","CAF","Sesame seed","fabio" +"3408","Central African Republic","CAF","Oil, palm fruit","fabio" +"3409","Central African Republic","CAF","Olives (including preserved)","fabio" +"3410","Central African Republic","CAF","Oilcrops, Other","fabio" +"3411","Central African Republic","CAF","Tomatoes and products","fabio" +"3412","Central African Republic","CAF","Onions","fabio" +"3413","Central African Republic","CAF","Vegetables, Other","fabio" +"3414","Central African Republic","CAF","Oranges, Mandarines","fabio" +"3415","Central African Republic","CAF","Lemons, Limes and products","fabio" +"3416","Central African Republic","CAF","Grapefruit and products","fabio" +"3417","Central African Republic","CAF","Citrus, Other","fabio" +"3418","Central African Republic","CAF","Bananas","fabio" +"3419","Central African Republic","CAF","Plantains","fabio" +"3420","Central African Republic","CAF","Apples and products","fabio" +"3421","Central African Republic","CAF","Pineapples and products","fabio" +"3422","Central African Republic","CAF","Dates","fabio" +"3423","Central African Republic","CAF","Grapes and products (excl wine)","fabio" +"3424","Central African Republic","CAF","Fruits, Other","fabio" +"3425","Central African Republic","CAF","Coffee and products","fabio" +"3426","Central African Republic","CAF","Cocoa Beans and products","fabio" +"3427","Central African Republic","CAF","Tea (including mate)","fabio" +"3428","Central African Republic","CAF","Hops","fabio" +"3429","Central African Republic","CAF","Pepper","fabio" +"3430","Central African Republic","CAF","Pimento","fabio" +"3431","Central African Republic","CAF","Cloves","fabio" +"3432","Central African Republic","CAF","Spices, Other","fabio" +"3433","Central African Republic","CAF","Jute","fabio" +"3434","Central African Republic","CAF","Jute-Like Fibres","fabio" +"3435","Central African Republic","CAF","Soft-Fibres, Other","fabio" +"3436","Central African Republic","CAF","Sisal","fabio" +"3437","Central African Republic","CAF","Abaca","fabio" +"3438","Central African Republic","CAF","Hard Fibres, Other","fabio" +"3439","Central African Republic","CAF","Tobacco","fabio" +"3440","Central African Republic","CAF","Rubber","fabio" +"3441","Central African Republic","CAF","Fodder crops","fabio" +"3442","Central African Republic","CAF","Grazing","fabio" +"3443","Central African Republic","CAF","Cottonseed","fabio" +"3444","Central African Republic","CAF","Palm kernels","fabio" +"3445","Central African Republic","CAF","Sugar non-centrifugal","fabio" +"3446","Central African Republic","CAF","Molasses","fabio" +"3447","Central African Republic","CAF","Sugar, Refined Equiv","fabio" +"3448","Central African Republic","CAF","Sweeteners, Other","fabio" +"3449","Central African Republic","CAF","Soyabean Oil","fabio" +"3450","Central African Republic","CAF","Groundnut Oil","fabio" +"3451","Central African Republic","CAF","Sunflowerseed Oil","fabio" +"3452","Central African Republic","CAF","Rape and Mustard Oil","fabio" +"3453","Central African Republic","CAF","Cottonseed Oil","fabio" +"3454","Central African Republic","CAF","Palmkernel Oil","fabio" +"3455","Central African Republic","CAF","Palm Oil","fabio" +"3456","Central African Republic","CAF","Coconut Oil","fabio" +"3457","Central African Republic","CAF","Sesameseed Oil","fabio" +"3458","Central African Republic","CAF","Olive Oil","fabio" +"3459","Central African Republic","CAF","Ricebran Oil","fabio" +"3460","Central African Republic","CAF","Maize Germ Oil","fabio" +"3461","Central African Republic","CAF","Oilcrops Oil, Other","fabio" +"3462","Central African Republic","CAF","Soyabean Cake","fabio" +"3463","Central African Republic","CAF","Groundnut Cake","fabio" +"3464","Central African Republic","CAF","Sunflowerseed Cake","fabio" +"3465","Central African Republic","CAF","Rape and Mustard Cake","fabio" +"3466","Central African Republic","CAF","Cottonseed Cake","fabio" +"3467","Central African Republic","CAF","Palmkernel Cake","fabio" +"3468","Central African Republic","CAF","Copra Cake","fabio" +"3469","Central African Republic","CAF","Sesameseed Cake","fabio" +"3470","Central African Republic","CAF","Oilseed Cakes, Other","fabio" +"3471","Central African Republic","CAF","Wine","fabio" +"3472","Central African Republic","CAF","Beer","fabio" +"3473","Central African Republic","CAF","Beverages, Fermented","fabio" +"3474","Central African Republic","CAF","Beverages, Alcoholic","fabio" +"3475","Central African Republic","CAF","Alcohol, Non-Food","fabio" +"3476","Central African Republic","CAF","Cotton lint","fabio" +"3477","Central African Republic","CAF","Cattle","fabio" +"3478","Central African Republic","CAF","Buffaloes","fabio" +"3479","Central African Republic","CAF","Sheep","fabio" +"3480","Central African Republic","CAF","Goats","fabio" +"3481","Central African Republic","CAF","Pigs","fabio" +"3482","Central African Republic","CAF","Poultry Birds","fabio" +"3483","Central African Republic","CAF","Horses","fabio" +"3484","Central African Republic","CAF","Asses","fabio" +"3485","Central African Republic","CAF","Mules","fabio" +"3486","Central African Republic","CAF","Camels","fabio" +"3487","Central African Republic","CAF","Camelids, other","fabio" +"3488","Central African Republic","CAF","Rabbits and hares","fabio" +"3489","Central African Republic","CAF","Rodents, other","fabio" +"3490","Central African Republic","CAF","Live animals, other","fabio" +"3491","Central African Republic","CAF","Milk - Excluding Butter","fabio" +"3492","Central African Republic","CAF","Butter, Ghee","fabio" +"3493","Central African Republic","CAF","Eggs","fabio" +"3494","Central African Republic","CAF","Wool (Clean Eq.)","fabio" +"3495","Central African Republic","CAF","Bovine Meat","fabio" +"3496","Central African Republic","CAF","Mutton & Goat Meat","fabio" +"3497","Central African Republic","CAF","Pigmeat","fabio" +"3498","Central African Republic","CAF","Poultry Meat","fabio" +"3499","Central African Republic","CAF","Meat, Other","fabio" +"3500","Central African Republic","CAF","Offals, Edible","fabio" +"3501","Central African Republic","CAF","Fats, Animals, Raw","fabio" +"3502","Central African Republic","CAF","Hides and skins","fabio" +"3503","Central African Republic","CAF","Meat Meal","fabio" +"3504","Central African Republic","CAF","Pet food","fabio" +"3505","Central African Republic","CAF","Honey","fabio" +"3506","Central African Republic","CAF","Silk","fabio" +"3507","Central African Republic","CAF","Fish, Seafood","fabio" +"3508","Central African Republic","CAF","Wood fuel","fabio" +"3509","Central African Republic","CAF","Industrial roundwood, coniferous","fabio" +"3510","Central African Republic","CAF","Industrial roundwood, non-coniferous","fabio" +"3511","Sri Lanka","LKA","Rice (Milled Equivalent)","fabio" +"3512","Sri Lanka","LKA","Wheat and products","fabio" +"3513","Sri Lanka","LKA","Barley and products","fabio" +"3514","Sri Lanka","LKA","Maize and products","fabio" +"3515","Sri Lanka","LKA","Rye and products","fabio" +"3516","Sri Lanka","LKA","Oats","fabio" +"3517","Sri Lanka","LKA","Millet and products","fabio" +"3518","Sri Lanka","LKA","Sorghum and products","fabio" +"3519","Sri Lanka","LKA","Cereals, Other","fabio" +"3520","Sri Lanka","LKA","Potatoes and products","fabio" +"3521","Sri Lanka","LKA","Cassava and products","fabio" +"3522","Sri Lanka","LKA","Sweet potatoes","fabio" +"3523","Sri Lanka","LKA","Roots, Other","fabio" +"3524","Sri Lanka","LKA","Yams","fabio" +"3525","Sri Lanka","LKA","Sugar cane","fabio" +"3526","Sri Lanka","LKA","Sugar beet","fabio" +"3527","Sri Lanka","LKA","Beans","fabio" +"3528","Sri Lanka","LKA","Peas","fabio" +"3529","Sri Lanka","LKA","Pulses, Other and products","fabio" +"3530","Sri Lanka","LKA","Nuts and products","fabio" +"3531","Sri Lanka","LKA","Soyabeans","fabio" +"3532","Sri Lanka","LKA","Groundnuts (Shelled Eq)","fabio" +"3533","Sri Lanka","LKA","Sunflower seed","fabio" +"3534","Sri Lanka","LKA","Rape and Mustardseed","fabio" +"3535","Sri Lanka","LKA","Seed cotton","fabio" +"3536","Sri Lanka","LKA","Coconuts - Incl Copra","fabio" +"3537","Sri Lanka","LKA","Sesame seed","fabio" +"3538","Sri Lanka","LKA","Oil, palm fruit","fabio" +"3539","Sri Lanka","LKA","Olives (including preserved)","fabio" +"3540","Sri Lanka","LKA","Oilcrops, Other","fabio" +"3541","Sri Lanka","LKA","Tomatoes and products","fabio" +"3542","Sri Lanka","LKA","Onions","fabio" +"3543","Sri Lanka","LKA","Vegetables, Other","fabio" +"3544","Sri Lanka","LKA","Oranges, Mandarines","fabio" +"3545","Sri Lanka","LKA","Lemons, Limes and products","fabio" +"3546","Sri Lanka","LKA","Grapefruit and products","fabio" +"3547","Sri Lanka","LKA","Citrus, Other","fabio" +"3548","Sri Lanka","LKA","Bananas","fabio" +"3549","Sri Lanka","LKA","Plantains","fabio" +"3550","Sri Lanka","LKA","Apples and products","fabio" +"3551","Sri Lanka","LKA","Pineapples and products","fabio" +"3552","Sri Lanka","LKA","Dates","fabio" +"3553","Sri Lanka","LKA","Grapes and products (excl wine)","fabio" +"3554","Sri Lanka","LKA","Fruits, Other","fabio" +"3555","Sri Lanka","LKA","Coffee and products","fabio" +"3556","Sri Lanka","LKA","Cocoa Beans and products","fabio" +"3557","Sri Lanka","LKA","Tea (including mate)","fabio" +"3558","Sri Lanka","LKA","Hops","fabio" +"3559","Sri Lanka","LKA","Pepper","fabio" +"3560","Sri Lanka","LKA","Pimento","fabio" +"3561","Sri Lanka","LKA","Cloves","fabio" +"3562","Sri Lanka","LKA","Spices, Other","fabio" +"3563","Sri Lanka","LKA","Jute","fabio" +"3564","Sri Lanka","LKA","Jute-Like Fibres","fabio" +"3565","Sri Lanka","LKA","Soft-Fibres, Other","fabio" +"3566","Sri Lanka","LKA","Sisal","fabio" +"3567","Sri Lanka","LKA","Abaca","fabio" +"3568","Sri Lanka","LKA","Hard Fibres, Other","fabio" +"3569","Sri Lanka","LKA","Tobacco","fabio" +"3570","Sri Lanka","LKA","Rubber","fabio" +"3571","Sri Lanka","LKA","Fodder crops","fabio" +"3572","Sri Lanka","LKA","Grazing","fabio" +"3573","Sri Lanka","LKA","Cottonseed","fabio" +"3574","Sri Lanka","LKA","Palm kernels","fabio" +"3575","Sri Lanka","LKA","Sugar non-centrifugal","fabio" +"3576","Sri Lanka","LKA","Molasses","fabio" +"3577","Sri Lanka","LKA","Sugar, Refined Equiv","fabio" +"3578","Sri Lanka","LKA","Sweeteners, Other","fabio" +"3579","Sri Lanka","LKA","Soyabean Oil","fabio" +"3580","Sri Lanka","LKA","Groundnut Oil","fabio" +"3581","Sri Lanka","LKA","Sunflowerseed Oil","fabio" +"3582","Sri Lanka","LKA","Rape and Mustard Oil","fabio" +"3583","Sri Lanka","LKA","Cottonseed Oil","fabio" +"3584","Sri Lanka","LKA","Palmkernel Oil","fabio" +"3585","Sri Lanka","LKA","Palm Oil","fabio" +"3586","Sri Lanka","LKA","Coconut Oil","fabio" +"3587","Sri Lanka","LKA","Sesameseed Oil","fabio" +"3588","Sri Lanka","LKA","Olive Oil","fabio" +"3589","Sri Lanka","LKA","Ricebran Oil","fabio" +"3590","Sri Lanka","LKA","Maize Germ Oil","fabio" +"3591","Sri Lanka","LKA","Oilcrops Oil, Other","fabio" +"3592","Sri Lanka","LKA","Soyabean Cake","fabio" +"3593","Sri Lanka","LKA","Groundnut Cake","fabio" +"3594","Sri Lanka","LKA","Sunflowerseed Cake","fabio" +"3595","Sri Lanka","LKA","Rape and Mustard Cake","fabio" +"3596","Sri Lanka","LKA","Cottonseed Cake","fabio" +"3597","Sri Lanka","LKA","Palmkernel Cake","fabio" +"3598","Sri Lanka","LKA","Copra Cake","fabio" +"3599","Sri Lanka","LKA","Sesameseed Cake","fabio" +"3600","Sri Lanka","LKA","Oilseed Cakes, Other","fabio" +"3601","Sri Lanka","LKA","Wine","fabio" +"3602","Sri Lanka","LKA","Beer","fabio" +"3603","Sri Lanka","LKA","Beverages, Fermented","fabio" +"3604","Sri Lanka","LKA","Beverages, Alcoholic","fabio" +"3605","Sri Lanka","LKA","Alcohol, Non-Food","fabio" +"3606","Sri Lanka","LKA","Cotton lint","fabio" +"3607","Sri Lanka","LKA","Cattle","fabio" +"3608","Sri Lanka","LKA","Buffaloes","fabio" +"3609","Sri Lanka","LKA","Sheep","fabio" +"3610","Sri Lanka","LKA","Goats","fabio" +"3611","Sri Lanka","LKA","Pigs","fabio" +"3612","Sri Lanka","LKA","Poultry Birds","fabio" +"3613","Sri Lanka","LKA","Horses","fabio" +"3614","Sri Lanka","LKA","Asses","fabio" +"3615","Sri Lanka","LKA","Mules","fabio" +"3616","Sri Lanka","LKA","Camels","fabio" +"3617","Sri Lanka","LKA","Camelids, other","fabio" +"3618","Sri Lanka","LKA","Rabbits and hares","fabio" +"3619","Sri Lanka","LKA","Rodents, other","fabio" +"3620","Sri Lanka","LKA","Live animals, other","fabio" +"3621","Sri Lanka","LKA","Milk - Excluding Butter","fabio" +"3622","Sri Lanka","LKA","Butter, Ghee","fabio" +"3623","Sri Lanka","LKA","Eggs","fabio" +"3624","Sri Lanka","LKA","Wool (Clean Eq.)","fabio" +"3625","Sri Lanka","LKA","Bovine Meat","fabio" +"3626","Sri Lanka","LKA","Mutton & Goat Meat","fabio" +"3627","Sri Lanka","LKA","Pigmeat","fabio" +"3628","Sri Lanka","LKA","Poultry Meat","fabio" +"3629","Sri Lanka","LKA","Meat, Other","fabio" +"3630","Sri Lanka","LKA","Offals, Edible","fabio" +"3631","Sri Lanka","LKA","Fats, Animals, Raw","fabio" +"3632","Sri Lanka","LKA","Hides and skins","fabio" +"3633","Sri Lanka","LKA","Meat Meal","fabio" +"3634","Sri Lanka","LKA","Pet food","fabio" +"3635","Sri Lanka","LKA","Honey","fabio" +"3636","Sri Lanka","LKA","Silk","fabio" +"3637","Sri Lanka","LKA","Fish, Seafood","fabio" +"3638","Sri Lanka","LKA","Wood fuel","fabio" +"3639","Sri Lanka","LKA","Industrial roundwood, coniferous","fabio" +"3640","Sri Lanka","LKA","Industrial roundwood, non-coniferous","fabio" +"3641","Chad","TCD","Rice (Milled Equivalent)","fabio" +"3642","Chad","TCD","Wheat and products","fabio" +"3643","Chad","TCD","Barley and products","fabio" +"3644","Chad","TCD","Maize and products","fabio" +"3645","Chad","TCD","Rye and products","fabio" +"3646","Chad","TCD","Oats","fabio" +"3647","Chad","TCD","Millet and products","fabio" +"3648","Chad","TCD","Sorghum and products","fabio" +"3649","Chad","TCD","Cereals, Other","fabio" +"3650","Chad","TCD","Potatoes and products","fabio" +"3651","Chad","TCD","Cassava and products","fabio" +"3652","Chad","TCD","Sweet potatoes","fabio" +"3653","Chad","TCD","Roots, Other","fabio" +"3654","Chad","TCD","Yams","fabio" +"3655","Chad","TCD","Sugar cane","fabio" +"3656","Chad","TCD","Sugar beet","fabio" +"3657","Chad","TCD","Beans","fabio" +"3658","Chad","TCD","Peas","fabio" +"3659","Chad","TCD","Pulses, Other and products","fabio" +"3660","Chad","TCD","Nuts and products","fabio" +"3661","Chad","TCD","Soyabeans","fabio" +"3662","Chad","TCD","Groundnuts (Shelled Eq)","fabio" +"3663","Chad","TCD","Sunflower seed","fabio" +"3664","Chad","TCD","Rape and Mustardseed","fabio" +"3665","Chad","TCD","Seed cotton","fabio" +"3666","Chad","TCD","Coconuts - Incl Copra","fabio" +"3667","Chad","TCD","Sesame seed","fabio" +"3668","Chad","TCD","Oil, palm fruit","fabio" +"3669","Chad","TCD","Olives (including preserved)","fabio" +"3670","Chad","TCD","Oilcrops, Other","fabio" +"3671","Chad","TCD","Tomatoes and products","fabio" +"3672","Chad","TCD","Onions","fabio" +"3673","Chad","TCD","Vegetables, Other","fabio" +"3674","Chad","TCD","Oranges, Mandarines","fabio" +"3675","Chad","TCD","Lemons, Limes and products","fabio" +"3676","Chad","TCD","Grapefruit and products","fabio" +"3677","Chad","TCD","Citrus, Other","fabio" +"3678","Chad","TCD","Bananas","fabio" +"3679","Chad","TCD","Plantains","fabio" +"3680","Chad","TCD","Apples and products","fabio" +"3681","Chad","TCD","Pineapples and products","fabio" +"3682","Chad","TCD","Dates","fabio" +"3683","Chad","TCD","Grapes and products (excl wine)","fabio" +"3684","Chad","TCD","Fruits, Other","fabio" +"3685","Chad","TCD","Coffee and products","fabio" +"3686","Chad","TCD","Cocoa Beans and products","fabio" +"3687","Chad","TCD","Tea (including mate)","fabio" +"3688","Chad","TCD","Hops","fabio" +"3689","Chad","TCD","Pepper","fabio" +"3690","Chad","TCD","Pimento","fabio" +"3691","Chad","TCD","Cloves","fabio" +"3692","Chad","TCD","Spices, Other","fabio" +"3693","Chad","TCD","Jute","fabio" +"3694","Chad","TCD","Jute-Like Fibres","fabio" +"3695","Chad","TCD","Soft-Fibres, Other","fabio" +"3696","Chad","TCD","Sisal","fabio" +"3697","Chad","TCD","Abaca","fabio" +"3698","Chad","TCD","Hard Fibres, Other","fabio" +"3699","Chad","TCD","Tobacco","fabio" +"3700","Chad","TCD","Rubber","fabio" +"3701","Chad","TCD","Fodder crops","fabio" +"3702","Chad","TCD","Grazing","fabio" +"3703","Chad","TCD","Cottonseed","fabio" +"3704","Chad","TCD","Palm kernels","fabio" +"3705","Chad","TCD","Sugar non-centrifugal","fabio" +"3706","Chad","TCD","Molasses","fabio" +"3707","Chad","TCD","Sugar, Refined Equiv","fabio" +"3708","Chad","TCD","Sweeteners, Other","fabio" +"3709","Chad","TCD","Soyabean Oil","fabio" +"3710","Chad","TCD","Groundnut Oil","fabio" +"3711","Chad","TCD","Sunflowerseed Oil","fabio" +"3712","Chad","TCD","Rape and Mustard Oil","fabio" +"3713","Chad","TCD","Cottonseed Oil","fabio" +"3714","Chad","TCD","Palmkernel Oil","fabio" +"3715","Chad","TCD","Palm Oil","fabio" +"3716","Chad","TCD","Coconut Oil","fabio" +"3717","Chad","TCD","Sesameseed Oil","fabio" +"3718","Chad","TCD","Olive Oil","fabio" +"3719","Chad","TCD","Ricebran Oil","fabio" +"3720","Chad","TCD","Maize Germ Oil","fabio" +"3721","Chad","TCD","Oilcrops Oil, Other","fabio" +"3722","Chad","TCD","Soyabean Cake","fabio" +"3723","Chad","TCD","Groundnut Cake","fabio" +"3724","Chad","TCD","Sunflowerseed Cake","fabio" +"3725","Chad","TCD","Rape and Mustard Cake","fabio" +"3726","Chad","TCD","Cottonseed Cake","fabio" +"3727","Chad","TCD","Palmkernel Cake","fabio" +"3728","Chad","TCD","Copra Cake","fabio" +"3729","Chad","TCD","Sesameseed Cake","fabio" +"3730","Chad","TCD","Oilseed Cakes, Other","fabio" +"3731","Chad","TCD","Wine","fabio" +"3732","Chad","TCD","Beer","fabio" +"3733","Chad","TCD","Beverages, Fermented","fabio" +"3734","Chad","TCD","Beverages, Alcoholic","fabio" +"3735","Chad","TCD","Alcohol, Non-Food","fabio" +"3736","Chad","TCD","Cotton lint","fabio" +"3737","Chad","TCD","Cattle","fabio" +"3738","Chad","TCD","Buffaloes","fabio" +"3739","Chad","TCD","Sheep","fabio" +"3740","Chad","TCD","Goats","fabio" +"3741","Chad","TCD","Pigs","fabio" +"3742","Chad","TCD","Poultry Birds","fabio" +"3743","Chad","TCD","Horses","fabio" +"3744","Chad","TCD","Asses","fabio" +"3745","Chad","TCD","Mules","fabio" +"3746","Chad","TCD","Camels","fabio" +"3747","Chad","TCD","Camelids, other","fabio" +"3748","Chad","TCD","Rabbits and hares","fabio" +"3749","Chad","TCD","Rodents, other","fabio" +"3750","Chad","TCD","Live animals, other","fabio" +"3751","Chad","TCD","Milk - Excluding Butter","fabio" +"3752","Chad","TCD","Butter, Ghee","fabio" +"3753","Chad","TCD","Eggs","fabio" +"3754","Chad","TCD","Wool (Clean Eq.)","fabio" +"3755","Chad","TCD","Bovine Meat","fabio" +"3756","Chad","TCD","Mutton & Goat Meat","fabio" +"3757","Chad","TCD","Pigmeat","fabio" +"3758","Chad","TCD","Poultry Meat","fabio" +"3759","Chad","TCD","Meat, Other","fabio" +"3760","Chad","TCD","Offals, Edible","fabio" +"3761","Chad","TCD","Fats, Animals, Raw","fabio" +"3762","Chad","TCD","Hides and skins","fabio" +"3763","Chad","TCD","Meat Meal","fabio" +"3764","Chad","TCD","Pet food","fabio" +"3765","Chad","TCD","Honey","fabio" +"3766","Chad","TCD","Silk","fabio" +"3767","Chad","TCD","Fish, Seafood","fabio" +"3768","Chad","TCD","Wood fuel","fabio" +"3769","Chad","TCD","Industrial roundwood, coniferous","fabio" +"3770","Chad","TCD","Industrial roundwood, non-coniferous","fabio" +"3771","Chile","CHL","Rice (Milled Equivalent)","fabio" +"3772","Chile","CHL","Wheat and products","fabio" +"3773","Chile","CHL","Barley and products","fabio" +"3774","Chile","CHL","Maize and products","fabio" +"3775","Chile","CHL","Rye and products","fabio" +"3776","Chile","CHL","Oats","fabio" +"3777","Chile","CHL","Millet and products","fabio" +"3778","Chile","CHL","Sorghum and products","fabio" +"3779","Chile","CHL","Cereals, Other","fabio" +"3780","Chile","CHL","Potatoes and products","fabio" +"3781","Chile","CHL","Cassava and products","fabio" +"3782","Chile","CHL","Sweet potatoes","fabio" +"3783","Chile","CHL","Roots, Other","fabio" +"3784","Chile","CHL","Yams","fabio" +"3785","Chile","CHL","Sugar cane","fabio" +"3786","Chile","CHL","Sugar beet","fabio" +"3787","Chile","CHL","Beans","fabio" +"3788","Chile","CHL","Peas","fabio" +"3789","Chile","CHL","Pulses, Other and products","fabio" +"3790","Chile","CHL","Nuts and products","fabio" +"3791","Chile","CHL","Soyabeans","fabio" +"3792","Chile","CHL","Groundnuts (Shelled Eq)","fabio" +"3793","Chile","CHL","Sunflower seed","fabio" +"3794","Chile","CHL","Rape and Mustardseed","fabio" +"3795","Chile","CHL","Seed cotton","fabio" +"3796","Chile","CHL","Coconuts - Incl Copra","fabio" +"3797","Chile","CHL","Sesame seed","fabio" +"3798","Chile","CHL","Oil, palm fruit","fabio" +"3799","Chile","CHL","Olives (including preserved)","fabio" +"3800","Chile","CHL","Oilcrops, Other","fabio" +"3801","Chile","CHL","Tomatoes and products","fabio" +"3802","Chile","CHL","Onions","fabio" +"3803","Chile","CHL","Vegetables, Other","fabio" +"3804","Chile","CHL","Oranges, Mandarines","fabio" +"3805","Chile","CHL","Lemons, Limes and products","fabio" +"3806","Chile","CHL","Grapefruit and products","fabio" +"3807","Chile","CHL","Citrus, Other","fabio" +"3808","Chile","CHL","Bananas","fabio" +"3809","Chile","CHL","Plantains","fabio" +"3810","Chile","CHL","Apples and products","fabio" +"3811","Chile","CHL","Pineapples and products","fabio" +"3812","Chile","CHL","Dates","fabio" +"3813","Chile","CHL","Grapes and products (excl wine)","fabio" +"3814","Chile","CHL","Fruits, Other","fabio" +"3815","Chile","CHL","Coffee and products","fabio" +"3816","Chile","CHL","Cocoa Beans and products","fabio" +"3817","Chile","CHL","Tea (including mate)","fabio" +"3818","Chile","CHL","Hops","fabio" +"3819","Chile","CHL","Pepper","fabio" +"3820","Chile","CHL","Pimento","fabio" +"3821","Chile","CHL","Cloves","fabio" +"3822","Chile","CHL","Spices, Other","fabio" +"3823","Chile","CHL","Jute","fabio" +"3824","Chile","CHL","Jute-Like Fibres","fabio" +"3825","Chile","CHL","Soft-Fibres, Other","fabio" +"3826","Chile","CHL","Sisal","fabio" +"3827","Chile","CHL","Abaca","fabio" +"3828","Chile","CHL","Hard Fibres, Other","fabio" +"3829","Chile","CHL","Tobacco","fabio" +"3830","Chile","CHL","Rubber","fabio" +"3831","Chile","CHL","Fodder crops","fabio" +"3832","Chile","CHL","Grazing","fabio" +"3833","Chile","CHL","Cottonseed","fabio" +"3834","Chile","CHL","Palm kernels","fabio" +"3835","Chile","CHL","Sugar non-centrifugal","fabio" +"3836","Chile","CHL","Molasses","fabio" +"3837","Chile","CHL","Sugar, Refined Equiv","fabio" +"3838","Chile","CHL","Sweeteners, Other","fabio" +"3839","Chile","CHL","Soyabean Oil","fabio" +"3840","Chile","CHL","Groundnut Oil","fabio" +"3841","Chile","CHL","Sunflowerseed Oil","fabio" +"3842","Chile","CHL","Rape and Mustard Oil","fabio" +"3843","Chile","CHL","Cottonseed Oil","fabio" +"3844","Chile","CHL","Palmkernel Oil","fabio" +"3845","Chile","CHL","Palm Oil","fabio" +"3846","Chile","CHL","Coconut Oil","fabio" +"3847","Chile","CHL","Sesameseed Oil","fabio" +"3848","Chile","CHL","Olive Oil","fabio" +"3849","Chile","CHL","Ricebran Oil","fabio" +"3850","Chile","CHL","Maize Germ Oil","fabio" +"3851","Chile","CHL","Oilcrops Oil, Other","fabio" +"3852","Chile","CHL","Soyabean Cake","fabio" +"3853","Chile","CHL","Groundnut Cake","fabio" +"3854","Chile","CHL","Sunflowerseed Cake","fabio" +"3855","Chile","CHL","Rape and Mustard Cake","fabio" +"3856","Chile","CHL","Cottonseed Cake","fabio" +"3857","Chile","CHL","Palmkernel Cake","fabio" +"3858","Chile","CHL","Copra Cake","fabio" +"3859","Chile","CHL","Sesameseed Cake","fabio" +"3860","Chile","CHL","Oilseed Cakes, Other","fabio" +"3861","Chile","CHL","Wine","fabio" +"3862","Chile","CHL","Beer","fabio" +"3863","Chile","CHL","Beverages, Fermented","fabio" +"3864","Chile","CHL","Beverages, Alcoholic","fabio" +"3865","Chile","CHL","Alcohol, Non-Food","fabio" +"3866","Chile","CHL","Cotton lint","fabio" +"3867","Chile","CHL","Cattle","fabio" +"3868","Chile","CHL","Buffaloes","fabio" +"3869","Chile","CHL","Sheep","fabio" +"3870","Chile","CHL","Goats","fabio" +"3871","Chile","CHL","Pigs","fabio" +"3872","Chile","CHL","Poultry Birds","fabio" +"3873","Chile","CHL","Horses","fabio" +"3874","Chile","CHL","Asses","fabio" +"3875","Chile","CHL","Mules","fabio" +"3876","Chile","CHL","Camels","fabio" +"3877","Chile","CHL","Camelids, other","fabio" +"3878","Chile","CHL","Rabbits and hares","fabio" +"3879","Chile","CHL","Rodents, other","fabio" +"3880","Chile","CHL","Live animals, other","fabio" +"3881","Chile","CHL","Milk - Excluding Butter","fabio" +"3882","Chile","CHL","Butter, Ghee","fabio" +"3883","Chile","CHL","Eggs","fabio" +"3884","Chile","CHL","Wool (Clean Eq.)","fabio" +"3885","Chile","CHL","Bovine Meat","fabio" +"3886","Chile","CHL","Mutton & Goat Meat","fabio" +"3887","Chile","CHL","Pigmeat","fabio" +"3888","Chile","CHL","Poultry Meat","fabio" +"3889","Chile","CHL","Meat, Other","fabio" +"3890","Chile","CHL","Offals, Edible","fabio" +"3891","Chile","CHL","Fats, Animals, Raw","fabio" +"3892","Chile","CHL","Hides and skins","fabio" +"3893","Chile","CHL","Meat Meal","fabio" +"3894","Chile","CHL","Pet food","fabio" +"3895","Chile","CHL","Honey","fabio" +"3896","Chile","CHL","Silk","fabio" +"3897","Chile","CHL","Fish, Seafood","fabio" +"3898","Chile","CHL","Wood fuel","fabio" +"3899","Chile","CHL","Industrial roundwood, coniferous","fabio" +"3900","Chile","CHL","Industrial roundwood, non-coniferous","fabio" +"3901","China, mainland","CHN","Rice (Milled Equivalent)","fabio" +"3902","China, mainland","CHN","Wheat and products","fabio" +"3903","China, mainland","CHN","Barley and products","fabio" +"3904","China, mainland","CHN","Maize and products","fabio" +"3905","China, mainland","CHN","Rye and products","fabio" +"3906","China, mainland","CHN","Oats","fabio" +"3907","China, mainland","CHN","Millet and products","fabio" +"3908","China, mainland","CHN","Sorghum and products","fabio" +"3909","China, mainland","CHN","Cereals, Other","fabio" +"3910","China, mainland","CHN","Potatoes and products","fabio" +"3911","China, mainland","CHN","Cassava and products","fabio" +"3912","China, mainland","CHN","Sweet potatoes","fabio" +"3913","China, mainland","CHN","Roots, Other","fabio" +"3914","China, mainland","CHN","Yams","fabio" +"3915","China, mainland","CHN","Sugar cane","fabio" +"3916","China, mainland","CHN","Sugar beet","fabio" +"3917","China, mainland","CHN","Beans","fabio" +"3918","China, mainland","CHN","Peas","fabio" +"3919","China, mainland","CHN","Pulses, Other and products","fabio" +"3920","China, mainland","CHN","Nuts and products","fabio" +"3921","China, mainland","CHN","Soyabeans","fabio" +"3922","China, mainland","CHN","Groundnuts (Shelled Eq)","fabio" +"3923","China, mainland","CHN","Sunflower seed","fabio" +"3924","China, mainland","CHN","Rape and Mustardseed","fabio" +"3925","China, mainland","CHN","Seed cotton","fabio" +"3926","China, mainland","CHN","Coconuts - Incl Copra","fabio" +"3927","China, mainland","CHN","Sesame seed","fabio" +"3928","China, mainland","CHN","Oil, palm fruit","fabio" +"3929","China, mainland","CHN","Olives (including preserved)","fabio" +"3930","China, mainland","CHN","Oilcrops, Other","fabio" +"3931","China, mainland","CHN","Tomatoes and products","fabio" +"3932","China, mainland","CHN","Onions","fabio" +"3933","China, mainland","CHN","Vegetables, Other","fabio" +"3934","China, mainland","CHN","Oranges, Mandarines","fabio" +"3935","China, mainland","CHN","Lemons, Limes and products","fabio" +"3936","China, mainland","CHN","Grapefruit and products","fabio" +"3937","China, mainland","CHN","Citrus, Other","fabio" +"3938","China, mainland","CHN","Bananas","fabio" +"3939","China, mainland","CHN","Plantains","fabio" +"3940","China, mainland","CHN","Apples and products","fabio" +"3941","China, mainland","CHN","Pineapples and products","fabio" +"3942","China, mainland","CHN","Dates","fabio" +"3943","China, mainland","CHN","Grapes and products (excl wine)","fabio" +"3944","China, mainland","CHN","Fruits, Other","fabio" +"3945","China, mainland","CHN","Coffee and products","fabio" +"3946","China, mainland","CHN","Cocoa Beans and products","fabio" +"3947","China, mainland","CHN","Tea (including mate)","fabio" +"3948","China, mainland","CHN","Hops","fabio" +"3949","China, mainland","CHN","Pepper","fabio" +"3950","China, mainland","CHN","Pimento","fabio" +"3951","China, mainland","CHN","Cloves","fabio" +"3952","China, mainland","CHN","Spices, Other","fabio" +"3953","China, mainland","CHN","Jute","fabio" +"3954","China, mainland","CHN","Jute-Like Fibres","fabio" +"3955","China, mainland","CHN","Soft-Fibres, Other","fabio" +"3956","China, mainland","CHN","Sisal","fabio" +"3957","China, mainland","CHN","Abaca","fabio" +"3958","China, mainland","CHN","Hard Fibres, Other","fabio" +"3959","China, mainland","CHN","Tobacco","fabio" +"3960","China, mainland","CHN","Rubber","fabio" +"3961","China, mainland","CHN","Fodder crops","fabio" +"3962","China, mainland","CHN","Grazing","fabio" +"3963","China, mainland","CHN","Cottonseed","fabio" +"3964","China, mainland","CHN","Palm kernels","fabio" +"3965","China, mainland","CHN","Sugar non-centrifugal","fabio" +"3966","China, mainland","CHN","Molasses","fabio" +"3967","China, mainland","CHN","Sugar, Refined Equiv","fabio" +"3968","China, mainland","CHN","Sweeteners, Other","fabio" +"3969","China, mainland","CHN","Soyabean Oil","fabio" +"3970","China, mainland","CHN","Groundnut Oil","fabio" +"3971","China, mainland","CHN","Sunflowerseed Oil","fabio" +"3972","China, mainland","CHN","Rape and Mustard Oil","fabio" +"3973","China, mainland","CHN","Cottonseed Oil","fabio" +"3974","China, mainland","CHN","Palmkernel Oil","fabio" +"3975","China, mainland","CHN","Palm Oil","fabio" +"3976","China, mainland","CHN","Coconut Oil","fabio" +"3977","China, mainland","CHN","Sesameseed Oil","fabio" +"3978","China, mainland","CHN","Olive Oil","fabio" +"3979","China, mainland","CHN","Ricebran Oil","fabio" +"3980","China, mainland","CHN","Maize Germ Oil","fabio" +"3981","China, mainland","CHN","Oilcrops Oil, Other","fabio" +"3982","China, mainland","CHN","Soyabean Cake","fabio" +"3983","China, mainland","CHN","Groundnut Cake","fabio" +"3984","China, mainland","CHN","Sunflowerseed Cake","fabio" +"3985","China, mainland","CHN","Rape and Mustard Cake","fabio" +"3986","China, mainland","CHN","Cottonseed Cake","fabio" +"3987","China, mainland","CHN","Palmkernel Cake","fabio" +"3988","China, mainland","CHN","Copra Cake","fabio" +"3989","China, mainland","CHN","Sesameseed Cake","fabio" +"3990","China, mainland","CHN","Oilseed Cakes, Other","fabio" +"3991","China, mainland","CHN","Wine","fabio" +"3992","China, mainland","CHN","Beer","fabio" +"3993","China, mainland","CHN","Beverages, Fermented","fabio" +"3994","China, mainland","CHN","Beverages, Alcoholic","fabio" +"3995","China, mainland","CHN","Alcohol, Non-Food","fabio" +"3996","China, mainland","CHN","Cotton lint","fabio" +"3997","China, mainland","CHN","Cattle","fabio" +"3998","China, mainland","CHN","Buffaloes","fabio" +"3999","China, mainland","CHN","Sheep","fabio" +"4000","China, mainland","CHN","Goats","fabio" +"4001","China, mainland","CHN","Pigs","fabio" +"4002","China, mainland","CHN","Poultry Birds","fabio" +"4003","China, mainland","CHN","Horses","fabio" +"4004","China, mainland","CHN","Asses","fabio" +"4005","China, mainland","CHN","Mules","fabio" +"4006","China, mainland","CHN","Camels","fabio" +"4007","China, mainland","CHN","Camelids, other","fabio" +"4008","China, mainland","CHN","Rabbits and hares","fabio" +"4009","China, mainland","CHN","Rodents, other","fabio" +"4010","China, mainland","CHN","Live animals, other","fabio" +"4011","China, mainland","CHN","Milk - Excluding Butter","fabio" +"4012","China, mainland","CHN","Butter, Ghee","fabio" +"4013","China, mainland","CHN","Eggs","fabio" +"4014","China, mainland","CHN","Wool (Clean Eq.)","fabio" +"4015","China, mainland","CHN","Bovine Meat","fabio" +"4016","China, mainland","CHN","Mutton & Goat Meat","fabio" +"4017","China, mainland","CHN","Pigmeat","fabio" +"4018","China, mainland","CHN","Poultry Meat","fabio" +"4019","China, mainland","CHN","Meat, Other","fabio" +"4020","China, mainland","CHN","Offals, Edible","fabio" +"4021","China, mainland","CHN","Fats, Animals, Raw","fabio" +"4022","China, mainland","CHN","Hides and skins","fabio" +"4023","China, mainland","CHN","Meat Meal","fabio" +"4024","China, mainland","CHN","Pet food","fabio" +"4025","China, mainland","CHN","Honey","fabio" +"4026","China, mainland","CHN","Silk","fabio" +"4027","China, mainland","CHN","Fish, Seafood","fabio" +"4028","China, mainland","CHN","Wood fuel","fabio" +"4029","China, mainland","CHN","Industrial roundwood, coniferous","fabio" +"4030","China, mainland","CHN","Industrial roundwood, non-coniferous","fabio" +"4031","Colombia","COL","Rice (Milled Equivalent)","fabio" +"4032","Colombia","COL","Wheat and products","fabio" +"4033","Colombia","COL","Barley and products","fabio" +"4034","Colombia","COL","Maize and products","fabio" +"4035","Colombia","COL","Rye and products","fabio" +"4036","Colombia","COL","Oats","fabio" +"4037","Colombia","COL","Millet and products","fabio" +"4038","Colombia","COL","Sorghum and products","fabio" +"4039","Colombia","COL","Cereals, Other","fabio" +"4040","Colombia","COL","Potatoes and products","fabio" +"4041","Colombia","COL","Cassava and products","fabio" +"4042","Colombia","COL","Sweet potatoes","fabio" +"4043","Colombia","COL","Roots, Other","fabio" +"4044","Colombia","COL","Yams","fabio" +"4045","Colombia","COL","Sugar cane","fabio" +"4046","Colombia","COL","Sugar beet","fabio" +"4047","Colombia","COL","Beans","fabio" +"4048","Colombia","COL","Peas","fabio" +"4049","Colombia","COL","Pulses, Other and products","fabio" +"4050","Colombia","COL","Nuts and products","fabio" +"4051","Colombia","COL","Soyabeans","fabio" +"4052","Colombia","COL","Groundnuts (Shelled Eq)","fabio" +"4053","Colombia","COL","Sunflower seed","fabio" +"4054","Colombia","COL","Rape and Mustardseed","fabio" +"4055","Colombia","COL","Seed cotton","fabio" +"4056","Colombia","COL","Coconuts - Incl Copra","fabio" +"4057","Colombia","COL","Sesame seed","fabio" +"4058","Colombia","COL","Oil, palm fruit","fabio" +"4059","Colombia","COL","Olives (including preserved)","fabio" +"4060","Colombia","COL","Oilcrops, Other","fabio" +"4061","Colombia","COL","Tomatoes and products","fabio" +"4062","Colombia","COL","Onions","fabio" +"4063","Colombia","COL","Vegetables, Other","fabio" +"4064","Colombia","COL","Oranges, Mandarines","fabio" +"4065","Colombia","COL","Lemons, Limes and products","fabio" +"4066","Colombia","COL","Grapefruit and products","fabio" +"4067","Colombia","COL","Citrus, Other","fabio" +"4068","Colombia","COL","Bananas","fabio" +"4069","Colombia","COL","Plantains","fabio" +"4070","Colombia","COL","Apples and products","fabio" +"4071","Colombia","COL","Pineapples and products","fabio" +"4072","Colombia","COL","Dates","fabio" +"4073","Colombia","COL","Grapes and products (excl wine)","fabio" +"4074","Colombia","COL","Fruits, Other","fabio" +"4075","Colombia","COL","Coffee and products","fabio" +"4076","Colombia","COL","Cocoa Beans and products","fabio" +"4077","Colombia","COL","Tea (including mate)","fabio" +"4078","Colombia","COL","Hops","fabio" +"4079","Colombia","COL","Pepper","fabio" +"4080","Colombia","COL","Pimento","fabio" +"4081","Colombia","COL","Cloves","fabio" +"4082","Colombia","COL","Spices, Other","fabio" +"4083","Colombia","COL","Jute","fabio" +"4084","Colombia","COL","Jute-Like Fibres","fabio" +"4085","Colombia","COL","Soft-Fibres, Other","fabio" +"4086","Colombia","COL","Sisal","fabio" +"4087","Colombia","COL","Abaca","fabio" +"4088","Colombia","COL","Hard Fibres, Other","fabio" +"4089","Colombia","COL","Tobacco","fabio" +"4090","Colombia","COL","Rubber","fabio" +"4091","Colombia","COL","Fodder crops","fabio" +"4092","Colombia","COL","Grazing","fabio" +"4093","Colombia","COL","Cottonseed","fabio" +"4094","Colombia","COL","Palm kernels","fabio" +"4095","Colombia","COL","Sugar non-centrifugal","fabio" +"4096","Colombia","COL","Molasses","fabio" +"4097","Colombia","COL","Sugar, Refined Equiv","fabio" +"4098","Colombia","COL","Sweeteners, Other","fabio" +"4099","Colombia","COL","Soyabean Oil","fabio" +"4100","Colombia","COL","Groundnut Oil","fabio" +"4101","Colombia","COL","Sunflowerseed Oil","fabio" +"4102","Colombia","COL","Rape and Mustard Oil","fabio" +"4103","Colombia","COL","Cottonseed Oil","fabio" +"4104","Colombia","COL","Palmkernel Oil","fabio" +"4105","Colombia","COL","Palm Oil","fabio" +"4106","Colombia","COL","Coconut Oil","fabio" +"4107","Colombia","COL","Sesameseed Oil","fabio" +"4108","Colombia","COL","Olive Oil","fabio" +"4109","Colombia","COL","Ricebran Oil","fabio" +"4110","Colombia","COL","Maize Germ Oil","fabio" +"4111","Colombia","COL","Oilcrops Oil, Other","fabio" +"4112","Colombia","COL","Soyabean Cake","fabio" +"4113","Colombia","COL","Groundnut Cake","fabio" +"4114","Colombia","COL","Sunflowerseed Cake","fabio" +"4115","Colombia","COL","Rape and Mustard Cake","fabio" +"4116","Colombia","COL","Cottonseed Cake","fabio" +"4117","Colombia","COL","Palmkernel Cake","fabio" +"4118","Colombia","COL","Copra Cake","fabio" +"4119","Colombia","COL","Sesameseed Cake","fabio" +"4120","Colombia","COL","Oilseed Cakes, Other","fabio" +"4121","Colombia","COL","Wine","fabio" +"4122","Colombia","COL","Beer","fabio" +"4123","Colombia","COL","Beverages, Fermented","fabio" +"4124","Colombia","COL","Beverages, Alcoholic","fabio" +"4125","Colombia","COL","Alcohol, Non-Food","fabio" +"4126","Colombia","COL","Cotton lint","fabio" +"4127","Colombia","COL","Cattle","fabio" +"4128","Colombia","COL","Buffaloes","fabio" +"4129","Colombia","COL","Sheep","fabio" +"4130","Colombia","COL","Goats","fabio" +"4131","Colombia","COL","Pigs","fabio" +"4132","Colombia","COL","Poultry Birds","fabio" +"4133","Colombia","COL","Horses","fabio" +"4134","Colombia","COL","Asses","fabio" +"4135","Colombia","COL","Mules","fabio" +"4136","Colombia","COL","Camels","fabio" +"4137","Colombia","COL","Camelids, other","fabio" +"4138","Colombia","COL","Rabbits and hares","fabio" +"4139","Colombia","COL","Rodents, other","fabio" +"4140","Colombia","COL","Live animals, other","fabio" +"4141","Colombia","COL","Milk - Excluding Butter","fabio" +"4142","Colombia","COL","Butter, Ghee","fabio" +"4143","Colombia","COL","Eggs","fabio" +"4144","Colombia","COL","Wool (Clean Eq.)","fabio" +"4145","Colombia","COL","Bovine Meat","fabio" +"4146","Colombia","COL","Mutton & Goat Meat","fabio" +"4147","Colombia","COL","Pigmeat","fabio" +"4148","Colombia","COL","Poultry Meat","fabio" +"4149","Colombia","COL","Meat, Other","fabio" +"4150","Colombia","COL","Offals, Edible","fabio" +"4151","Colombia","COL","Fats, Animals, Raw","fabio" +"4152","Colombia","COL","Hides and skins","fabio" +"4153","Colombia","COL","Meat Meal","fabio" +"4154","Colombia","COL","Pet food","fabio" +"4155","Colombia","COL","Honey","fabio" +"4156","Colombia","COL","Silk","fabio" +"4157","Colombia","COL","Fish, Seafood","fabio" +"4158","Colombia","COL","Wood fuel","fabio" +"4159","Colombia","COL","Industrial roundwood, coniferous","fabio" +"4160","Colombia","COL","Industrial roundwood, non-coniferous","fabio" +"4161","Congo","COG","Rice (Milled Equivalent)","fabio" +"4162","Congo","COG","Wheat and products","fabio" +"4163","Congo","COG","Barley and products","fabio" +"4164","Congo","COG","Maize and products","fabio" +"4165","Congo","COG","Rye and products","fabio" +"4166","Congo","COG","Oats","fabio" +"4167","Congo","COG","Millet and products","fabio" +"4168","Congo","COG","Sorghum and products","fabio" +"4169","Congo","COG","Cereals, Other","fabio" +"4170","Congo","COG","Potatoes and products","fabio" +"4171","Congo","COG","Cassava and products","fabio" +"4172","Congo","COG","Sweet potatoes","fabio" +"4173","Congo","COG","Roots, Other","fabio" +"4174","Congo","COG","Yams","fabio" +"4175","Congo","COG","Sugar cane","fabio" +"4176","Congo","COG","Sugar beet","fabio" +"4177","Congo","COG","Beans","fabio" +"4178","Congo","COG","Peas","fabio" +"4179","Congo","COG","Pulses, Other and products","fabio" +"4180","Congo","COG","Nuts and products","fabio" +"4181","Congo","COG","Soyabeans","fabio" +"4182","Congo","COG","Groundnuts (Shelled Eq)","fabio" +"4183","Congo","COG","Sunflower seed","fabio" +"4184","Congo","COG","Rape and Mustardseed","fabio" +"4185","Congo","COG","Seed cotton","fabio" +"4186","Congo","COG","Coconuts - Incl Copra","fabio" +"4187","Congo","COG","Sesame seed","fabio" +"4188","Congo","COG","Oil, palm fruit","fabio" +"4189","Congo","COG","Olives (including preserved)","fabio" +"4190","Congo","COG","Oilcrops, Other","fabio" +"4191","Congo","COG","Tomatoes and products","fabio" +"4192","Congo","COG","Onions","fabio" +"4193","Congo","COG","Vegetables, Other","fabio" +"4194","Congo","COG","Oranges, Mandarines","fabio" +"4195","Congo","COG","Lemons, Limes and products","fabio" +"4196","Congo","COG","Grapefruit and products","fabio" +"4197","Congo","COG","Citrus, Other","fabio" +"4198","Congo","COG","Bananas","fabio" +"4199","Congo","COG","Plantains","fabio" +"4200","Congo","COG","Apples and products","fabio" +"4201","Congo","COG","Pineapples and products","fabio" +"4202","Congo","COG","Dates","fabio" +"4203","Congo","COG","Grapes and products (excl wine)","fabio" +"4204","Congo","COG","Fruits, Other","fabio" +"4205","Congo","COG","Coffee and products","fabio" +"4206","Congo","COG","Cocoa Beans and products","fabio" +"4207","Congo","COG","Tea (including mate)","fabio" +"4208","Congo","COG","Hops","fabio" +"4209","Congo","COG","Pepper","fabio" +"4210","Congo","COG","Pimento","fabio" +"4211","Congo","COG","Cloves","fabio" +"4212","Congo","COG","Spices, Other","fabio" +"4213","Congo","COG","Jute","fabio" +"4214","Congo","COG","Jute-Like Fibres","fabio" +"4215","Congo","COG","Soft-Fibres, Other","fabio" +"4216","Congo","COG","Sisal","fabio" +"4217","Congo","COG","Abaca","fabio" +"4218","Congo","COG","Hard Fibres, Other","fabio" +"4219","Congo","COG","Tobacco","fabio" +"4220","Congo","COG","Rubber","fabio" +"4221","Congo","COG","Fodder crops","fabio" +"4222","Congo","COG","Grazing","fabio" +"4223","Congo","COG","Cottonseed","fabio" +"4224","Congo","COG","Palm kernels","fabio" +"4225","Congo","COG","Sugar non-centrifugal","fabio" +"4226","Congo","COG","Molasses","fabio" +"4227","Congo","COG","Sugar, Refined Equiv","fabio" +"4228","Congo","COG","Sweeteners, Other","fabio" +"4229","Congo","COG","Soyabean Oil","fabio" +"4230","Congo","COG","Groundnut Oil","fabio" +"4231","Congo","COG","Sunflowerseed Oil","fabio" +"4232","Congo","COG","Rape and Mustard Oil","fabio" +"4233","Congo","COG","Cottonseed Oil","fabio" +"4234","Congo","COG","Palmkernel Oil","fabio" +"4235","Congo","COG","Palm Oil","fabio" +"4236","Congo","COG","Coconut Oil","fabio" +"4237","Congo","COG","Sesameseed Oil","fabio" +"4238","Congo","COG","Olive Oil","fabio" +"4239","Congo","COG","Ricebran Oil","fabio" +"4240","Congo","COG","Maize Germ Oil","fabio" +"4241","Congo","COG","Oilcrops Oil, Other","fabio" +"4242","Congo","COG","Soyabean Cake","fabio" +"4243","Congo","COG","Groundnut Cake","fabio" +"4244","Congo","COG","Sunflowerseed Cake","fabio" +"4245","Congo","COG","Rape and Mustard Cake","fabio" +"4246","Congo","COG","Cottonseed Cake","fabio" +"4247","Congo","COG","Palmkernel Cake","fabio" +"4248","Congo","COG","Copra Cake","fabio" +"4249","Congo","COG","Sesameseed Cake","fabio" +"4250","Congo","COG","Oilseed Cakes, Other","fabio" +"4251","Congo","COG","Wine","fabio" +"4252","Congo","COG","Beer","fabio" +"4253","Congo","COG","Beverages, Fermented","fabio" +"4254","Congo","COG","Beverages, Alcoholic","fabio" +"4255","Congo","COG","Alcohol, Non-Food","fabio" +"4256","Congo","COG","Cotton lint","fabio" +"4257","Congo","COG","Cattle","fabio" +"4258","Congo","COG","Buffaloes","fabio" +"4259","Congo","COG","Sheep","fabio" +"4260","Congo","COG","Goats","fabio" +"4261","Congo","COG","Pigs","fabio" +"4262","Congo","COG","Poultry Birds","fabio" +"4263","Congo","COG","Horses","fabio" +"4264","Congo","COG","Asses","fabio" +"4265","Congo","COG","Mules","fabio" +"4266","Congo","COG","Camels","fabio" +"4267","Congo","COG","Camelids, other","fabio" +"4268","Congo","COG","Rabbits and hares","fabio" +"4269","Congo","COG","Rodents, other","fabio" +"4270","Congo","COG","Live animals, other","fabio" +"4271","Congo","COG","Milk - Excluding Butter","fabio" +"4272","Congo","COG","Butter, Ghee","fabio" +"4273","Congo","COG","Eggs","fabio" +"4274","Congo","COG","Wool (Clean Eq.)","fabio" +"4275","Congo","COG","Bovine Meat","fabio" +"4276","Congo","COG","Mutton & Goat Meat","fabio" +"4277","Congo","COG","Pigmeat","fabio" +"4278","Congo","COG","Poultry Meat","fabio" +"4279","Congo","COG","Meat, Other","fabio" +"4280","Congo","COG","Offals, Edible","fabio" +"4281","Congo","COG","Fats, Animals, Raw","fabio" +"4282","Congo","COG","Hides and skins","fabio" +"4283","Congo","COG","Meat Meal","fabio" +"4284","Congo","COG","Pet food","fabio" +"4285","Congo","COG","Honey","fabio" +"4286","Congo","COG","Silk","fabio" +"4287","Congo","COG","Fish, Seafood","fabio" +"4288","Congo","COG","Wood fuel","fabio" +"4289","Congo","COG","Industrial roundwood, coniferous","fabio" +"4290","Congo","COG","Industrial roundwood, non-coniferous","fabio" +"4291","Costa Rica","CRI","Rice (Milled Equivalent)","fabio" +"4292","Costa Rica","CRI","Wheat and products","fabio" +"4293","Costa Rica","CRI","Barley and products","fabio" +"4294","Costa Rica","CRI","Maize and products","fabio" +"4295","Costa Rica","CRI","Rye and products","fabio" +"4296","Costa Rica","CRI","Oats","fabio" +"4297","Costa Rica","CRI","Millet and products","fabio" +"4298","Costa Rica","CRI","Sorghum and products","fabio" +"4299","Costa Rica","CRI","Cereals, Other","fabio" +"4300","Costa Rica","CRI","Potatoes and products","fabio" +"4301","Costa Rica","CRI","Cassava and products","fabio" +"4302","Costa Rica","CRI","Sweet potatoes","fabio" +"4303","Costa Rica","CRI","Roots, Other","fabio" +"4304","Costa Rica","CRI","Yams","fabio" +"4305","Costa Rica","CRI","Sugar cane","fabio" +"4306","Costa Rica","CRI","Sugar beet","fabio" +"4307","Costa Rica","CRI","Beans","fabio" +"4308","Costa Rica","CRI","Peas","fabio" +"4309","Costa Rica","CRI","Pulses, Other and products","fabio" +"4310","Costa Rica","CRI","Nuts and products","fabio" +"4311","Costa Rica","CRI","Soyabeans","fabio" +"4312","Costa Rica","CRI","Groundnuts (Shelled Eq)","fabio" +"4313","Costa Rica","CRI","Sunflower seed","fabio" +"4314","Costa Rica","CRI","Rape and Mustardseed","fabio" +"4315","Costa Rica","CRI","Seed cotton","fabio" +"4316","Costa Rica","CRI","Coconuts - Incl Copra","fabio" +"4317","Costa Rica","CRI","Sesame seed","fabio" +"4318","Costa Rica","CRI","Oil, palm fruit","fabio" +"4319","Costa Rica","CRI","Olives (including preserved)","fabio" +"4320","Costa Rica","CRI","Oilcrops, Other","fabio" +"4321","Costa Rica","CRI","Tomatoes and products","fabio" +"4322","Costa Rica","CRI","Onions","fabio" +"4323","Costa Rica","CRI","Vegetables, Other","fabio" +"4324","Costa Rica","CRI","Oranges, Mandarines","fabio" +"4325","Costa Rica","CRI","Lemons, Limes and products","fabio" +"4326","Costa Rica","CRI","Grapefruit and products","fabio" +"4327","Costa Rica","CRI","Citrus, Other","fabio" +"4328","Costa Rica","CRI","Bananas","fabio" +"4329","Costa Rica","CRI","Plantains","fabio" +"4330","Costa Rica","CRI","Apples and products","fabio" +"4331","Costa Rica","CRI","Pineapples and products","fabio" +"4332","Costa Rica","CRI","Dates","fabio" +"4333","Costa Rica","CRI","Grapes and products (excl wine)","fabio" +"4334","Costa Rica","CRI","Fruits, Other","fabio" +"4335","Costa Rica","CRI","Coffee and products","fabio" +"4336","Costa Rica","CRI","Cocoa Beans and products","fabio" +"4337","Costa Rica","CRI","Tea (including mate)","fabio" +"4338","Costa Rica","CRI","Hops","fabio" +"4339","Costa Rica","CRI","Pepper","fabio" +"4340","Costa Rica","CRI","Pimento","fabio" +"4341","Costa Rica","CRI","Cloves","fabio" +"4342","Costa Rica","CRI","Spices, Other","fabio" +"4343","Costa Rica","CRI","Jute","fabio" +"4344","Costa Rica","CRI","Jute-Like Fibres","fabio" +"4345","Costa Rica","CRI","Soft-Fibres, Other","fabio" +"4346","Costa Rica","CRI","Sisal","fabio" +"4347","Costa Rica","CRI","Abaca","fabio" +"4348","Costa Rica","CRI","Hard Fibres, Other","fabio" +"4349","Costa Rica","CRI","Tobacco","fabio" +"4350","Costa Rica","CRI","Rubber","fabio" +"4351","Costa Rica","CRI","Fodder crops","fabio" +"4352","Costa Rica","CRI","Grazing","fabio" +"4353","Costa Rica","CRI","Cottonseed","fabio" +"4354","Costa Rica","CRI","Palm kernels","fabio" +"4355","Costa Rica","CRI","Sugar non-centrifugal","fabio" +"4356","Costa Rica","CRI","Molasses","fabio" +"4357","Costa Rica","CRI","Sugar, Refined Equiv","fabio" +"4358","Costa Rica","CRI","Sweeteners, Other","fabio" +"4359","Costa Rica","CRI","Soyabean Oil","fabio" +"4360","Costa Rica","CRI","Groundnut Oil","fabio" +"4361","Costa Rica","CRI","Sunflowerseed Oil","fabio" +"4362","Costa Rica","CRI","Rape and Mustard Oil","fabio" +"4363","Costa Rica","CRI","Cottonseed Oil","fabio" +"4364","Costa Rica","CRI","Palmkernel Oil","fabio" +"4365","Costa Rica","CRI","Palm Oil","fabio" +"4366","Costa Rica","CRI","Coconut Oil","fabio" +"4367","Costa Rica","CRI","Sesameseed Oil","fabio" +"4368","Costa Rica","CRI","Olive Oil","fabio" +"4369","Costa Rica","CRI","Ricebran Oil","fabio" +"4370","Costa Rica","CRI","Maize Germ Oil","fabio" +"4371","Costa Rica","CRI","Oilcrops Oil, Other","fabio" +"4372","Costa Rica","CRI","Soyabean Cake","fabio" +"4373","Costa Rica","CRI","Groundnut Cake","fabio" +"4374","Costa Rica","CRI","Sunflowerseed Cake","fabio" +"4375","Costa Rica","CRI","Rape and Mustard Cake","fabio" +"4376","Costa Rica","CRI","Cottonseed Cake","fabio" +"4377","Costa Rica","CRI","Palmkernel Cake","fabio" +"4378","Costa Rica","CRI","Copra Cake","fabio" +"4379","Costa Rica","CRI","Sesameseed Cake","fabio" +"4380","Costa Rica","CRI","Oilseed Cakes, Other","fabio" +"4381","Costa Rica","CRI","Wine","fabio" +"4382","Costa Rica","CRI","Beer","fabio" +"4383","Costa Rica","CRI","Beverages, Fermented","fabio" +"4384","Costa Rica","CRI","Beverages, Alcoholic","fabio" +"4385","Costa Rica","CRI","Alcohol, Non-Food","fabio" +"4386","Costa Rica","CRI","Cotton lint","fabio" +"4387","Costa Rica","CRI","Cattle","fabio" +"4388","Costa Rica","CRI","Buffaloes","fabio" +"4389","Costa Rica","CRI","Sheep","fabio" +"4390","Costa Rica","CRI","Goats","fabio" +"4391","Costa Rica","CRI","Pigs","fabio" +"4392","Costa Rica","CRI","Poultry Birds","fabio" +"4393","Costa Rica","CRI","Horses","fabio" +"4394","Costa Rica","CRI","Asses","fabio" +"4395","Costa Rica","CRI","Mules","fabio" +"4396","Costa Rica","CRI","Camels","fabio" +"4397","Costa Rica","CRI","Camelids, other","fabio" +"4398","Costa Rica","CRI","Rabbits and hares","fabio" +"4399","Costa Rica","CRI","Rodents, other","fabio" +"4400","Costa Rica","CRI","Live animals, other","fabio" +"4401","Costa Rica","CRI","Milk - Excluding Butter","fabio" +"4402","Costa Rica","CRI","Butter, Ghee","fabio" +"4403","Costa Rica","CRI","Eggs","fabio" +"4404","Costa Rica","CRI","Wool (Clean Eq.)","fabio" +"4405","Costa Rica","CRI","Bovine Meat","fabio" +"4406","Costa Rica","CRI","Mutton & Goat Meat","fabio" +"4407","Costa Rica","CRI","Pigmeat","fabio" +"4408","Costa Rica","CRI","Poultry Meat","fabio" +"4409","Costa Rica","CRI","Meat, Other","fabio" +"4410","Costa Rica","CRI","Offals, Edible","fabio" +"4411","Costa Rica","CRI","Fats, Animals, Raw","fabio" +"4412","Costa Rica","CRI","Hides and skins","fabio" +"4413","Costa Rica","CRI","Meat Meal","fabio" +"4414","Costa Rica","CRI","Pet food","fabio" +"4415","Costa Rica","CRI","Honey","fabio" +"4416","Costa Rica","CRI","Silk","fabio" +"4417","Costa Rica","CRI","Fish, Seafood","fabio" +"4418","Costa Rica","CRI","Wood fuel","fabio" +"4419","Costa Rica","CRI","Industrial roundwood, coniferous","fabio" +"4420","Costa Rica","CRI","Industrial roundwood, non-coniferous","fabio" +"4421","Cuba","CUB","Rice (Milled Equivalent)","fabio" +"4422","Cuba","CUB","Wheat and products","fabio" +"4423","Cuba","CUB","Barley and products","fabio" +"4424","Cuba","CUB","Maize and products","fabio" +"4425","Cuba","CUB","Rye and products","fabio" +"4426","Cuba","CUB","Oats","fabio" +"4427","Cuba","CUB","Millet and products","fabio" +"4428","Cuba","CUB","Sorghum and products","fabio" +"4429","Cuba","CUB","Cereals, Other","fabio" +"4430","Cuba","CUB","Potatoes and products","fabio" +"4431","Cuba","CUB","Cassava and products","fabio" +"4432","Cuba","CUB","Sweet potatoes","fabio" +"4433","Cuba","CUB","Roots, Other","fabio" +"4434","Cuba","CUB","Yams","fabio" +"4435","Cuba","CUB","Sugar cane","fabio" +"4436","Cuba","CUB","Sugar beet","fabio" +"4437","Cuba","CUB","Beans","fabio" +"4438","Cuba","CUB","Peas","fabio" +"4439","Cuba","CUB","Pulses, Other and products","fabio" +"4440","Cuba","CUB","Nuts and products","fabio" +"4441","Cuba","CUB","Soyabeans","fabio" +"4442","Cuba","CUB","Groundnuts (Shelled Eq)","fabio" +"4443","Cuba","CUB","Sunflower seed","fabio" +"4444","Cuba","CUB","Rape and Mustardseed","fabio" +"4445","Cuba","CUB","Seed cotton","fabio" +"4446","Cuba","CUB","Coconuts - Incl Copra","fabio" +"4447","Cuba","CUB","Sesame seed","fabio" +"4448","Cuba","CUB","Oil, palm fruit","fabio" +"4449","Cuba","CUB","Olives (including preserved)","fabio" +"4450","Cuba","CUB","Oilcrops, Other","fabio" +"4451","Cuba","CUB","Tomatoes and products","fabio" +"4452","Cuba","CUB","Onions","fabio" +"4453","Cuba","CUB","Vegetables, Other","fabio" +"4454","Cuba","CUB","Oranges, Mandarines","fabio" +"4455","Cuba","CUB","Lemons, Limes and products","fabio" +"4456","Cuba","CUB","Grapefruit and products","fabio" +"4457","Cuba","CUB","Citrus, Other","fabio" +"4458","Cuba","CUB","Bananas","fabio" +"4459","Cuba","CUB","Plantains","fabio" +"4460","Cuba","CUB","Apples and products","fabio" +"4461","Cuba","CUB","Pineapples and products","fabio" +"4462","Cuba","CUB","Dates","fabio" +"4463","Cuba","CUB","Grapes and products (excl wine)","fabio" +"4464","Cuba","CUB","Fruits, Other","fabio" +"4465","Cuba","CUB","Coffee and products","fabio" +"4466","Cuba","CUB","Cocoa Beans and products","fabio" +"4467","Cuba","CUB","Tea (including mate)","fabio" +"4468","Cuba","CUB","Hops","fabio" +"4469","Cuba","CUB","Pepper","fabio" +"4470","Cuba","CUB","Pimento","fabio" +"4471","Cuba","CUB","Cloves","fabio" +"4472","Cuba","CUB","Spices, Other","fabio" +"4473","Cuba","CUB","Jute","fabio" +"4474","Cuba","CUB","Jute-Like Fibres","fabio" +"4475","Cuba","CUB","Soft-Fibres, Other","fabio" +"4476","Cuba","CUB","Sisal","fabio" +"4477","Cuba","CUB","Abaca","fabio" +"4478","Cuba","CUB","Hard Fibres, Other","fabio" +"4479","Cuba","CUB","Tobacco","fabio" +"4480","Cuba","CUB","Rubber","fabio" +"4481","Cuba","CUB","Fodder crops","fabio" +"4482","Cuba","CUB","Grazing","fabio" +"4483","Cuba","CUB","Cottonseed","fabio" +"4484","Cuba","CUB","Palm kernels","fabio" +"4485","Cuba","CUB","Sugar non-centrifugal","fabio" +"4486","Cuba","CUB","Molasses","fabio" +"4487","Cuba","CUB","Sugar, Refined Equiv","fabio" +"4488","Cuba","CUB","Sweeteners, Other","fabio" +"4489","Cuba","CUB","Soyabean Oil","fabio" +"4490","Cuba","CUB","Groundnut Oil","fabio" +"4491","Cuba","CUB","Sunflowerseed Oil","fabio" +"4492","Cuba","CUB","Rape and Mustard Oil","fabio" +"4493","Cuba","CUB","Cottonseed Oil","fabio" +"4494","Cuba","CUB","Palmkernel Oil","fabio" +"4495","Cuba","CUB","Palm Oil","fabio" +"4496","Cuba","CUB","Coconut Oil","fabio" +"4497","Cuba","CUB","Sesameseed Oil","fabio" +"4498","Cuba","CUB","Olive Oil","fabio" +"4499","Cuba","CUB","Ricebran Oil","fabio" +"4500","Cuba","CUB","Maize Germ Oil","fabio" +"4501","Cuba","CUB","Oilcrops Oil, Other","fabio" +"4502","Cuba","CUB","Soyabean Cake","fabio" +"4503","Cuba","CUB","Groundnut Cake","fabio" +"4504","Cuba","CUB","Sunflowerseed Cake","fabio" +"4505","Cuba","CUB","Rape and Mustard Cake","fabio" +"4506","Cuba","CUB","Cottonseed Cake","fabio" +"4507","Cuba","CUB","Palmkernel Cake","fabio" +"4508","Cuba","CUB","Copra Cake","fabio" +"4509","Cuba","CUB","Sesameseed Cake","fabio" +"4510","Cuba","CUB","Oilseed Cakes, Other","fabio" +"4511","Cuba","CUB","Wine","fabio" +"4512","Cuba","CUB","Beer","fabio" +"4513","Cuba","CUB","Beverages, Fermented","fabio" +"4514","Cuba","CUB","Beverages, Alcoholic","fabio" +"4515","Cuba","CUB","Alcohol, Non-Food","fabio" +"4516","Cuba","CUB","Cotton lint","fabio" +"4517","Cuba","CUB","Cattle","fabio" +"4518","Cuba","CUB","Buffaloes","fabio" +"4519","Cuba","CUB","Sheep","fabio" +"4520","Cuba","CUB","Goats","fabio" +"4521","Cuba","CUB","Pigs","fabio" +"4522","Cuba","CUB","Poultry Birds","fabio" +"4523","Cuba","CUB","Horses","fabio" +"4524","Cuba","CUB","Asses","fabio" +"4525","Cuba","CUB","Mules","fabio" +"4526","Cuba","CUB","Camels","fabio" +"4527","Cuba","CUB","Camelids, other","fabio" +"4528","Cuba","CUB","Rabbits and hares","fabio" +"4529","Cuba","CUB","Rodents, other","fabio" +"4530","Cuba","CUB","Live animals, other","fabio" +"4531","Cuba","CUB","Milk - Excluding Butter","fabio" +"4532","Cuba","CUB","Butter, Ghee","fabio" +"4533","Cuba","CUB","Eggs","fabio" +"4534","Cuba","CUB","Wool (Clean Eq.)","fabio" +"4535","Cuba","CUB","Bovine Meat","fabio" +"4536","Cuba","CUB","Mutton & Goat Meat","fabio" +"4537","Cuba","CUB","Pigmeat","fabio" +"4538","Cuba","CUB","Poultry Meat","fabio" +"4539","Cuba","CUB","Meat, Other","fabio" +"4540","Cuba","CUB","Offals, Edible","fabio" +"4541","Cuba","CUB","Fats, Animals, Raw","fabio" +"4542","Cuba","CUB","Hides and skins","fabio" +"4543","Cuba","CUB","Meat Meal","fabio" +"4544","Cuba","CUB","Pet food","fabio" +"4545","Cuba","CUB","Honey","fabio" +"4546","Cuba","CUB","Silk","fabio" +"4547","Cuba","CUB","Fish, Seafood","fabio" +"4548","Cuba","CUB","Wood fuel","fabio" +"4549","Cuba","CUB","Industrial roundwood, coniferous","fabio" +"4550","Cuba","CUB","Industrial roundwood, non-coniferous","fabio" +"4551","Cyprus","CYP","Rice (Milled Equivalent)","fabio" +"4552","Cyprus","CYP","Wheat and products","fabio" +"4553","Cyprus","CYP","Barley and products","fabio" +"4554","Cyprus","CYP","Maize and products","fabio" +"4555","Cyprus","CYP","Rye and products","fabio" +"4556","Cyprus","CYP","Oats","fabio" +"4557","Cyprus","CYP","Millet and products","fabio" +"4558","Cyprus","CYP","Sorghum and products","fabio" +"4559","Cyprus","CYP","Cereals, Other","fabio" +"4560","Cyprus","CYP","Potatoes and products","fabio" +"4561","Cyprus","CYP","Cassava and products","fabio" +"4562","Cyprus","CYP","Sweet potatoes","fabio" +"4563","Cyprus","CYP","Roots, Other","fabio" +"4564","Cyprus","CYP","Yams","fabio" +"4565","Cyprus","CYP","Sugar cane","fabio" +"4566","Cyprus","CYP","Sugar beet","fabio" +"4567","Cyprus","CYP","Beans","fabio" +"4568","Cyprus","CYP","Peas","fabio" +"4569","Cyprus","CYP","Pulses, Other and products","fabio" +"4570","Cyprus","CYP","Nuts and products","fabio" +"4571","Cyprus","CYP","Soyabeans","fabio" +"4572","Cyprus","CYP","Groundnuts (Shelled Eq)","fabio" +"4573","Cyprus","CYP","Sunflower seed","fabio" +"4574","Cyprus","CYP","Rape and Mustardseed","fabio" +"4575","Cyprus","CYP","Seed cotton","fabio" +"4576","Cyprus","CYP","Coconuts - Incl Copra","fabio" +"4577","Cyprus","CYP","Sesame seed","fabio" +"4578","Cyprus","CYP","Oil, palm fruit","fabio" +"4579","Cyprus","CYP","Olives (including preserved)","fabio" +"4580","Cyprus","CYP","Oilcrops, Other","fabio" +"4581","Cyprus","CYP","Tomatoes and products","fabio" +"4582","Cyprus","CYP","Onions","fabio" +"4583","Cyprus","CYP","Vegetables, Other","fabio" +"4584","Cyprus","CYP","Oranges, Mandarines","fabio" +"4585","Cyprus","CYP","Lemons, Limes and products","fabio" +"4586","Cyprus","CYP","Grapefruit and products","fabio" +"4587","Cyprus","CYP","Citrus, Other","fabio" +"4588","Cyprus","CYP","Bananas","fabio" +"4589","Cyprus","CYP","Plantains","fabio" +"4590","Cyprus","CYP","Apples and products","fabio" +"4591","Cyprus","CYP","Pineapples and products","fabio" +"4592","Cyprus","CYP","Dates","fabio" +"4593","Cyprus","CYP","Grapes and products (excl wine)","fabio" +"4594","Cyprus","CYP","Fruits, Other","fabio" +"4595","Cyprus","CYP","Coffee and products","fabio" +"4596","Cyprus","CYP","Cocoa Beans and products","fabio" +"4597","Cyprus","CYP","Tea (including mate)","fabio" +"4598","Cyprus","CYP","Hops","fabio" +"4599","Cyprus","CYP","Pepper","fabio" +"4600","Cyprus","CYP","Pimento","fabio" +"4601","Cyprus","CYP","Cloves","fabio" +"4602","Cyprus","CYP","Spices, Other","fabio" +"4603","Cyprus","CYP","Jute","fabio" +"4604","Cyprus","CYP","Jute-Like Fibres","fabio" +"4605","Cyprus","CYP","Soft-Fibres, Other","fabio" +"4606","Cyprus","CYP","Sisal","fabio" +"4607","Cyprus","CYP","Abaca","fabio" +"4608","Cyprus","CYP","Hard Fibres, Other","fabio" +"4609","Cyprus","CYP","Tobacco","fabio" +"4610","Cyprus","CYP","Rubber","fabio" +"4611","Cyprus","CYP","Fodder crops","fabio" +"4612","Cyprus","CYP","Grazing","fabio" +"4613","Cyprus","CYP","Cottonseed","fabio" +"4614","Cyprus","CYP","Palm kernels","fabio" +"4615","Cyprus","CYP","Sugar non-centrifugal","fabio" +"4616","Cyprus","CYP","Molasses","fabio" +"4617","Cyprus","CYP","Sugar, Refined Equiv","fabio" +"4618","Cyprus","CYP","Sweeteners, Other","fabio" +"4619","Cyprus","CYP","Soyabean Oil","fabio" +"4620","Cyprus","CYP","Groundnut Oil","fabio" +"4621","Cyprus","CYP","Sunflowerseed Oil","fabio" +"4622","Cyprus","CYP","Rape and Mustard Oil","fabio" +"4623","Cyprus","CYP","Cottonseed Oil","fabio" +"4624","Cyprus","CYP","Palmkernel Oil","fabio" +"4625","Cyprus","CYP","Palm Oil","fabio" +"4626","Cyprus","CYP","Coconut Oil","fabio" +"4627","Cyprus","CYP","Sesameseed Oil","fabio" +"4628","Cyprus","CYP","Olive Oil","fabio" +"4629","Cyprus","CYP","Ricebran Oil","fabio" +"4630","Cyprus","CYP","Maize Germ Oil","fabio" +"4631","Cyprus","CYP","Oilcrops Oil, Other","fabio" +"4632","Cyprus","CYP","Soyabean Cake","fabio" +"4633","Cyprus","CYP","Groundnut Cake","fabio" +"4634","Cyprus","CYP","Sunflowerseed Cake","fabio" +"4635","Cyprus","CYP","Rape and Mustard Cake","fabio" +"4636","Cyprus","CYP","Cottonseed Cake","fabio" +"4637","Cyprus","CYP","Palmkernel Cake","fabio" +"4638","Cyprus","CYP","Copra Cake","fabio" +"4639","Cyprus","CYP","Sesameseed Cake","fabio" +"4640","Cyprus","CYP","Oilseed Cakes, Other","fabio" +"4641","Cyprus","CYP","Wine","fabio" +"4642","Cyprus","CYP","Beer","fabio" +"4643","Cyprus","CYP","Beverages, Fermented","fabio" +"4644","Cyprus","CYP","Beverages, Alcoholic","fabio" +"4645","Cyprus","CYP","Alcohol, Non-Food","fabio" +"4646","Cyprus","CYP","Cotton lint","fabio" +"4647","Cyprus","CYP","Cattle","fabio" +"4648","Cyprus","CYP","Buffaloes","fabio" +"4649","Cyprus","CYP","Sheep","fabio" +"4650","Cyprus","CYP","Goats","fabio" +"4651","Cyprus","CYP","Pigs","fabio" +"4652","Cyprus","CYP","Poultry Birds","fabio" +"4653","Cyprus","CYP","Horses","fabio" +"4654","Cyprus","CYP","Asses","fabio" +"4655","Cyprus","CYP","Mules","fabio" +"4656","Cyprus","CYP","Camels","fabio" +"4657","Cyprus","CYP","Camelids, other","fabio" +"4658","Cyprus","CYP","Rabbits and hares","fabio" +"4659","Cyprus","CYP","Rodents, other","fabio" +"4660","Cyprus","CYP","Live animals, other","fabio" +"4661","Cyprus","CYP","Milk - Excluding Butter","fabio" +"4662","Cyprus","CYP","Butter, Ghee","fabio" +"4663","Cyprus","CYP","Eggs","fabio" +"4664","Cyprus","CYP","Wool (Clean Eq.)","fabio" +"4665","Cyprus","CYP","Bovine Meat","fabio" +"4666","Cyprus","CYP","Mutton & Goat Meat","fabio" +"4667","Cyprus","CYP","Pigmeat","fabio" +"4668","Cyprus","CYP","Poultry Meat","fabio" +"4669","Cyprus","CYP","Meat, Other","fabio" +"4670","Cyprus","CYP","Offals, Edible","fabio" +"4671","Cyprus","CYP","Fats, Animals, Raw","fabio" +"4672","Cyprus","CYP","Hides and skins","fabio" +"4673","Cyprus","CYP","Meat Meal","fabio" +"4674","Cyprus","CYP","Pet food","fabio" +"4675","Cyprus","CYP","Honey","fabio" +"4676","Cyprus","CYP","Silk","fabio" +"4677","Cyprus","CYP","Fish, Seafood","fabio" +"4678","Cyprus","CYP","Wood fuel","fabio" +"4679","Cyprus","CYP","Industrial roundwood, coniferous","fabio" +"4680","Cyprus","CYP","Industrial roundwood, non-coniferous","fabio" +"4681","Czechoslovakia","CSK","Rice (Milled Equivalent)","fabio" +"4682","Czechoslovakia","CSK","Wheat and products","fabio" +"4683","Czechoslovakia","CSK","Barley and products","fabio" +"4684","Czechoslovakia","CSK","Maize and products","fabio" +"4685","Czechoslovakia","CSK","Rye and products","fabio" +"4686","Czechoslovakia","CSK","Oats","fabio" +"4687","Czechoslovakia","CSK","Millet and products","fabio" +"4688","Czechoslovakia","CSK","Sorghum and products","fabio" +"4689","Czechoslovakia","CSK","Cereals, Other","fabio" +"4690","Czechoslovakia","CSK","Potatoes and products","fabio" +"4691","Czechoslovakia","CSK","Cassava and products","fabio" +"4692","Czechoslovakia","CSK","Sweet potatoes","fabio" +"4693","Czechoslovakia","CSK","Roots, Other","fabio" +"4694","Czechoslovakia","CSK","Yams","fabio" +"4695","Czechoslovakia","CSK","Sugar cane","fabio" +"4696","Czechoslovakia","CSK","Sugar beet","fabio" +"4697","Czechoslovakia","CSK","Beans","fabio" +"4698","Czechoslovakia","CSK","Peas","fabio" +"4699","Czechoslovakia","CSK","Pulses, Other and products","fabio" +"4700","Czechoslovakia","CSK","Nuts and products","fabio" +"4701","Czechoslovakia","CSK","Soyabeans","fabio" +"4702","Czechoslovakia","CSK","Groundnuts (Shelled Eq)","fabio" +"4703","Czechoslovakia","CSK","Sunflower seed","fabio" +"4704","Czechoslovakia","CSK","Rape and Mustardseed","fabio" +"4705","Czechoslovakia","CSK","Seed cotton","fabio" +"4706","Czechoslovakia","CSK","Coconuts - Incl Copra","fabio" +"4707","Czechoslovakia","CSK","Sesame seed","fabio" +"4708","Czechoslovakia","CSK","Oil, palm fruit","fabio" +"4709","Czechoslovakia","CSK","Olives (including preserved)","fabio" +"4710","Czechoslovakia","CSK","Oilcrops, Other","fabio" +"4711","Czechoslovakia","CSK","Tomatoes and products","fabio" +"4712","Czechoslovakia","CSK","Onions","fabio" +"4713","Czechoslovakia","CSK","Vegetables, Other","fabio" +"4714","Czechoslovakia","CSK","Oranges, Mandarines","fabio" +"4715","Czechoslovakia","CSK","Lemons, Limes and products","fabio" +"4716","Czechoslovakia","CSK","Grapefruit and products","fabio" +"4717","Czechoslovakia","CSK","Citrus, Other","fabio" +"4718","Czechoslovakia","CSK","Bananas","fabio" +"4719","Czechoslovakia","CSK","Plantains","fabio" +"4720","Czechoslovakia","CSK","Apples and products","fabio" +"4721","Czechoslovakia","CSK","Pineapples and products","fabio" +"4722","Czechoslovakia","CSK","Dates","fabio" +"4723","Czechoslovakia","CSK","Grapes and products (excl wine)","fabio" +"4724","Czechoslovakia","CSK","Fruits, Other","fabio" +"4725","Czechoslovakia","CSK","Coffee and products","fabio" +"4726","Czechoslovakia","CSK","Cocoa Beans and products","fabio" +"4727","Czechoslovakia","CSK","Tea (including mate)","fabio" +"4728","Czechoslovakia","CSK","Hops","fabio" +"4729","Czechoslovakia","CSK","Pepper","fabio" +"4730","Czechoslovakia","CSK","Pimento","fabio" +"4731","Czechoslovakia","CSK","Cloves","fabio" +"4732","Czechoslovakia","CSK","Spices, Other","fabio" +"4733","Czechoslovakia","CSK","Jute","fabio" +"4734","Czechoslovakia","CSK","Jute-Like Fibres","fabio" +"4735","Czechoslovakia","CSK","Soft-Fibres, Other","fabio" +"4736","Czechoslovakia","CSK","Sisal","fabio" +"4737","Czechoslovakia","CSK","Abaca","fabio" +"4738","Czechoslovakia","CSK","Hard Fibres, Other","fabio" +"4739","Czechoslovakia","CSK","Tobacco","fabio" +"4740","Czechoslovakia","CSK","Rubber","fabio" +"4741","Czechoslovakia","CSK","Fodder crops","fabio" +"4742","Czechoslovakia","CSK","Grazing","fabio" +"4743","Czechoslovakia","CSK","Cottonseed","fabio" +"4744","Czechoslovakia","CSK","Palm kernels","fabio" +"4745","Czechoslovakia","CSK","Sugar non-centrifugal","fabio" +"4746","Czechoslovakia","CSK","Molasses","fabio" +"4747","Czechoslovakia","CSK","Sugar, Refined Equiv","fabio" +"4748","Czechoslovakia","CSK","Sweeteners, Other","fabio" +"4749","Czechoslovakia","CSK","Soyabean Oil","fabio" +"4750","Czechoslovakia","CSK","Groundnut Oil","fabio" +"4751","Czechoslovakia","CSK","Sunflowerseed Oil","fabio" +"4752","Czechoslovakia","CSK","Rape and Mustard Oil","fabio" +"4753","Czechoslovakia","CSK","Cottonseed Oil","fabio" +"4754","Czechoslovakia","CSK","Palmkernel Oil","fabio" +"4755","Czechoslovakia","CSK","Palm Oil","fabio" +"4756","Czechoslovakia","CSK","Coconut Oil","fabio" +"4757","Czechoslovakia","CSK","Sesameseed Oil","fabio" +"4758","Czechoslovakia","CSK","Olive Oil","fabio" +"4759","Czechoslovakia","CSK","Ricebran Oil","fabio" +"4760","Czechoslovakia","CSK","Maize Germ Oil","fabio" +"4761","Czechoslovakia","CSK","Oilcrops Oil, Other","fabio" +"4762","Czechoslovakia","CSK","Soyabean Cake","fabio" +"4763","Czechoslovakia","CSK","Groundnut Cake","fabio" +"4764","Czechoslovakia","CSK","Sunflowerseed Cake","fabio" +"4765","Czechoslovakia","CSK","Rape and Mustard Cake","fabio" +"4766","Czechoslovakia","CSK","Cottonseed Cake","fabio" +"4767","Czechoslovakia","CSK","Palmkernel Cake","fabio" +"4768","Czechoslovakia","CSK","Copra Cake","fabio" +"4769","Czechoslovakia","CSK","Sesameseed Cake","fabio" +"4770","Czechoslovakia","CSK","Oilseed Cakes, Other","fabio" +"4771","Czechoslovakia","CSK","Wine","fabio" +"4772","Czechoslovakia","CSK","Beer","fabio" +"4773","Czechoslovakia","CSK","Beverages, Fermented","fabio" +"4774","Czechoslovakia","CSK","Beverages, Alcoholic","fabio" +"4775","Czechoslovakia","CSK","Alcohol, Non-Food","fabio" +"4776","Czechoslovakia","CSK","Cotton lint","fabio" +"4777","Czechoslovakia","CSK","Cattle","fabio" +"4778","Czechoslovakia","CSK","Buffaloes","fabio" +"4779","Czechoslovakia","CSK","Sheep","fabio" +"4780","Czechoslovakia","CSK","Goats","fabio" +"4781","Czechoslovakia","CSK","Pigs","fabio" +"4782","Czechoslovakia","CSK","Poultry Birds","fabio" +"4783","Czechoslovakia","CSK","Horses","fabio" +"4784","Czechoslovakia","CSK","Asses","fabio" +"4785","Czechoslovakia","CSK","Mules","fabio" +"4786","Czechoslovakia","CSK","Camels","fabio" +"4787","Czechoslovakia","CSK","Camelids, other","fabio" +"4788","Czechoslovakia","CSK","Rabbits and hares","fabio" +"4789","Czechoslovakia","CSK","Rodents, other","fabio" +"4790","Czechoslovakia","CSK","Live animals, other","fabio" +"4791","Czechoslovakia","CSK","Milk - Excluding Butter","fabio" +"4792","Czechoslovakia","CSK","Butter, Ghee","fabio" +"4793","Czechoslovakia","CSK","Eggs","fabio" +"4794","Czechoslovakia","CSK","Wool (Clean Eq.)","fabio" +"4795","Czechoslovakia","CSK","Bovine Meat","fabio" +"4796","Czechoslovakia","CSK","Mutton & Goat Meat","fabio" +"4797","Czechoslovakia","CSK","Pigmeat","fabio" +"4798","Czechoslovakia","CSK","Poultry Meat","fabio" +"4799","Czechoslovakia","CSK","Meat, Other","fabio" +"4800","Czechoslovakia","CSK","Offals, Edible","fabio" +"4801","Czechoslovakia","CSK","Fats, Animals, Raw","fabio" +"4802","Czechoslovakia","CSK","Hides and skins","fabio" +"4803","Czechoslovakia","CSK","Meat Meal","fabio" +"4804","Czechoslovakia","CSK","Pet food","fabio" +"4805","Czechoslovakia","CSK","Honey","fabio" +"4806","Czechoslovakia","CSK","Silk","fabio" +"4807","Czechoslovakia","CSK","Fish, Seafood","fabio" +"4808","Czechoslovakia","CSK","Wood fuel","fabio" +"4809","Czechoslovakia","CSK","Industrial roundwood, coniferous","fabio" +"4810","Czechoslovakia","CSK","Industrial roundwood, non-coniferous","fabio" +"4811","Azerbaijan","AZE","Rice (Milled Equivalent)","fabio" +"4812","Azerbaijan","AZE","Wheat and products","fabio" +"4813","Azerbaijan","AZE","Barley and products","fabio" +"4814","Azerbaijan","AZE","Maize and products","fabio" +"4815","Azerbaijan","AZE","Rye and products","fabio" +"4816","Azerbaijan","AZE","Oats","fabio" +"4817","Azerbaijan","AZE","Millet and products","fabio" +"4818","Azerbaijan","AZE","Sorghum and products","fabio" +"4819","Azerbaijan","AZE","Cereals, Other","fabio" +"4820","Azerbaijan","AZE","Potatoes and products","fabio" +"4821","Azerbaijan","AZE","Cassava and products","fabio" +"4822","Azerbaijan","AZE","Sweet potatoes","fabio" +"4823","Azerbaijan","AZE","Roots, Other","fabio" +"4824","Azerbaijan","AZE","Yams","fabio" +"4825","Azerbaijan","AZE","Sugar cane","fabio" +"4826","Azerbaijan","AZE","Sugar beet","fabio" +"4827","Azerbaijan","AZE","Beans","fabio" +"4828","Azerbaijan","AZE","Peas","fabio" +"4829","Azerbaijan","AZE","Pulses, Other and products","fabio" +"4830","Azerbaijan","AZE","Nuts and products","fabio" +"4831","Azerbaijan","AZE","Soyabeans","fabio" +"4832","Azerbaijan","AZE","Groundnuts (Shelled Eq)","fabio" +"4833","Azerbaijan","AZE","Sunflower seed","fabio" +"4834","Azerbaijan","AZE","Rape and Mustardseed","fabio" +"4835","Azerbaijan","AZE","Seed cotton","fabio" +"4836","Azerbaijan","AZE","Coconuts - Incl Copra","fabio" +"4837","Azerbaijan","AZE","Sesame seed","fabio" +"4838","Azerbaijan","AZE","Oil, palm fruit","fabio" +"4839","Azerbaijan","AZE","Olives (including preserved)","fabio" +"4840","Azerbaijan","AZE","Oilcrops, Other","fabio" +"4841","Azerbaijan","AZE","Tomatoes and products","fabio" +"4842","Azerbaijan","AZE","Onions","fabio" +"4843","Azerbaijan","AZE","Vegetables, Other","fabio" +"4844","Azerbaijan","AZE","Oranges, Mandarines","fabio" +"4845","Azerbaijan","AZE","Lemons, Limes and products","fabio" +"4846","Azerbaijan","AZE","Grapefruit and products","fabio" +"4847","Azerbaijan","AZE","Citrus, Other","fabio" +"4848","Azerbaijan","AZE","Bananas","fabio" +"4849","Azerbaijan","AZE","Plantains","fabio" +"4850","Azerbaijan","AZE","Apples and products","fabio" +"4851","Azerbaijan","AZE","Pineapples and products","fabio" +"4852","Azerbaijan","AZE","Dates","fabio" +"4853","Azerbaijan","AZE","Grapes and products (excl wine)","fabio" +"4854","Azerbaijan","AZE","Fruits, Other","fabio" +"4855","Azerbaijan","AZE","Coffee and products","fabio" +"4856","Azerbaijan","AZE","Cocoa Beans and products","fabio" +"4857","Azerbaijan","AZE","Tea (including mate)","fabio" +"4858","Azerbaijan","AZE","Hops","fabio" +"4859","Azerbaijan","AZE","Pepper","fabio" +"4860","Azerbaijan","AZE","Pimento","fabio" +"4861","Azerbaijan","AZE","Cloves","fabio" +"4862","Azerbaijan","AZE","Spices, Other","fabio" +"4863","Azerbaijan","AZE","Jute","fabio" +"4864","Azerbaijan","AZE","Jute-Like Fibres","fabio" +"4865","Azerbaijan","AZE","Soft-Fibres, Other","fabio" +"4866","Azerbaijan","AZE","Sisal","fabio" +"4867","Azerbaijan","AZE","Abaca","fabio" +"4868","Azerbaijan","AZE","Hard Fibres, Other","fabio" +"4869","Azerbaijan","AZE","Tobacco","fabio" +"4870","Azerbaijan","AZE","Rubber","fabio" +"4871","Azerbaijan","AZE","Fodder crops","fabio" +"4872","Azerbaijan","AZE","Grazing","fabio" +"4873","Azerbaijan","AZE","Cottonseed","fabio" +"4874","Azerbaijan","AZE","Palm kernels","fabio" +"4875","Azerbaijan","AZE","Sugar non-centrifugal","fabio" +"4876","Azerbaijan","AZE","Molasses","fabio" +"4877","Azerbaijan","AZE","Sugar, Refined Equiv","fabio" +"4878","Azerbaijan","AZE","Sweeteners, Other","fabio" +"4879","Azerbaijan","AZE","Soyabean Oil","fabio" +"4880","Azerbaijan","AZE","Groundnut Oil","fabio" +"4881","Azerbaijan","AZE","Sunflowerseed Oil","fabio" +"4882","Azerbaijan","AZE","Rape and Mustard Oil","fabio" +"4883","Azerbaijan","AZE","Cottonseed Oil","fabio" +"4884","Azerbaijan","AZE","Palmkernel Oil","fabio" +"4885","Azerbaijan","AZE","Palm Oil","fabio" +"4886","Azerbaijan","AZE","Coconut Oil","fabio" +"4887","Azerbaijan","AZE","Sesameseed Oil","fabio" +"4888","Azerbaijan","AZE","Olive Oil","fabio" +"4889","Azerbaijan","AZE","Ricebran Oil","fabio" +"4890","Azerbaijan","AZE","Maize Germ Oil","fabio" +"4891","Azerbaijan","AZE","Oilcrops Oil, Other","fabio" +"4892","Azerbaijan","AZE","Soyabean Cake","fabio" +"4893","Azerbaijan","AZE","Groundnut Cake","fabio" +"4894","Azerbaijan","AZE","Sunflowerseed Cake","fabio" +"4895","Azerbaijan","AZE","Rape and Mustard Cake","fabio" +"4896","Azerbaijan","AZE","Cottonseed Cake","fabio" +"4897","Azerbaijan","AZE","Palmkernel Cake","fabio" +"4898","Azerbaijan","AZE","Copra Cake","fabio" +"4899","Azerbaijan","AZE","Sesameseed Cake","fabio" +"4900","Azerbaijan","AZE","Oilseed Cakes, Other","fabio" +"4901","Azerbaijan","AZE","Wine","fabio" +"4902","Azerbaijan","AZE","Beer","fabio" +"4903","Azerbaijan","AZE","Beverages, Fermented","fabio" +"4904","Azerbaijan","AZE","Beverages, Alcoholic","fabio" +"4905","Azerbaijan","AZE","Alcohol, Non-Food","fabio" +"4906","Azerbaijan","AZE","Cotton lint","fabio" +"4907","Azerbaijan","AZE","Cattle","fabio" +"4908","Azerbaijan","AZE","Buffaloes","fabio" +"4909","Azerbaijan","AZE","Sheep","fabio" +"4910","Azerbaijan","AZE","Goats","fabio" +"4911","Azerbaijan","AZE","Pigs","fabio" +"4912","Azerbaijan","AZE","Poultry Birds","fabio" +"4913","Azerbaijan","AZE","Horses","fabio" +"4914","Azerbaijan","AZE","Asses","fabio" +"4915","Azerbaijan","AZE","Mules","fabio" +"4916","Azerbaijan","AZE","Camels","fabio" +"4917","Azerbaijan","AZE","Camelids, other","fabio" +"4918","Azerbaijan","AZE","Rabbits and hares","fabio" +"4919","Azerbaijan","AZE","Rodents, other","fabio" +"4920","Azerbaijan","AZE","Live animals, other","fabio" +"4921","Azerbaijan","AZE","Milk - Excluding Butter","fabio" +"4922","Azerbaijan","AZE","Butter, Ghee","fabio" +"4923","Azerbaijan","AZE","Eggs","fabio" +"4924","Azerbaijan","AZE","Wool (Clean Eq.)","fabio" +"4925","Azerbaijan","AZE","Bovine Meat","fabio" +"4926","Azerbaijan","AZE","Mutton & Goat Meat","fabio" +"4927","Azerbaijan","AZE","Pigmeat","fabio" +"4928","Azerbaijan","AZE","Poultry Meat","fabio" +"4929","Azerbaijan","AZE","Meat, Other","fabio" +"4930","Azerbaijan","AZE","Offals, Edible","fabio" +"4931","Azerbaijan","AZE","Fats, Animals, Raw","fabio" +"4932","Azerbaijan","AZE","Hides and skins","fabio" +"4933","Azerbaijan","AZE","Meat Meal","fabio" +"4934","Azerbaijan","AZE","Pet food","fabio" +"4935","Azerbaijan","AZE","Honey","fabio" +"4936","Azerbaijan","AZE","Silk","fabio" +"4937","Azerbaijan","AZE","Fish, Seafood","fabio" +"4938","Azerbaijan","AZE","Wood fuel","fabio" +"4939","Azerbaijan","AZE","Industrial roundwood, coniferous","fabio" +"4940","Azerbaijan","AZE","Industrial roundwood, non-coniferous","fabio" +"4941","Benin","BEN","Rice (Milled Equivalent)","fabio" +"4942","Benin","BEN","Wheat and products","fabio" +"4943","Benin","BEN","Barley and products","fabio" +"4944","Benin","BEN","Maize and products","fabio" +"4945","Benin","BEN","Rye and products","fabio" +"4946","Benin","BEN","Oats","fabio" +"4947","Benin","BEN","Millet and products","fabio" +"4948","Benin","BEN","Sorghum and products","fabio" +"4949","Benin","BEN","Cereals, Other","fabio" +"4950","Benin","BEN","Potatoes and products","fabio" +"4951","Benin","BEN","Cassava and products","fabio" +"4952","Benin","BEN","Sweet potatoes","fabio" +"4953","Benin","BEN","Roots, Other","fabio" +"4954","Benin","BEN","Yams","fabio" +"4955","Benin","BEN","Sugar cane","fabio" +"4956","Benin","BEN","Sugar beet","fabio" +"4957","Benin","BEN","Beans","fabio" +"4958","Benin","BEN","Peas","fabio" +"4959","Benin","BEN","Pulses, Other and products","fabio" +"4960","Benin","BEN","Nuts and products","fabio" +"4961","Benin","BEN","Soyabeans","fabio" +"4962","Benin","BEN","Groundnuts (Shelled Eq)","fabio" +"4963","Benin","BEN","Sunflower seed","fabio" +"4964","Benin","BEN","Rape and Mustardseed","fabio" +"4965","Benin","BEN","Seed cotton","fabio" +"4966","Benin","BEN","Coconuts - Incl Copra","fabio" +"4967","Benin","BEN","Sesame seed","fabio" +"4968","Benin","BEN","Oil, palm fruit","fabio" +"4969","Benin","BEN","Olives (including preserved)","fabio" +"4970","Benin","BEN","Oilcrops, Other","fabio" +"4971","Benin","BEN","Tomatoes and products","fabio" +"4972","Benin","BEN","Onions","fabio" +"4973","Benin","BEN","Vegetables, Other","fabio" +"4974","Benin","BEN","Oranges, Mandarines","fabio" +"4975","Benin","BEN","Lemons, Limes and products","fabio" +"4976","Benin","BEN","Grapefruit and products","fabio" +"4977","Benin","BEN","Citrus, Other","fabio" +"4978","Benin","BEN","Bananas","fabio" +"4979","Benin","BEN","Plantains","fabio" +"4980","Benin","BEN","Apples and products","fabio" +"4981","Benin","BEN","Pineapples and products","fabio" +"4982","Benin","BEN","Dates","fabio" +"4983","Benin","BEN","Grapes and products (excl wine)","fabio" +"4984","Benin","BEN","Fruits, Other","fabio" +"4985","Benin","BEN","Coffee and products","fabio" +"4986","Benin","BEN","Cocoa Beans and products","fabio" +"4987","Benin","BEN","Tea (including mate)","fabio" +"4988","Benin","BEN","Hops","fabio" +"4989","Benin","BEN","Pepper","fabio" +"4990","Benin","BEN","Pimento","fabio" +"4991","Benin","BEN","Cloves","fabio" +"4992","Benin","BEN","Spices, Other","fabio" +"4993","Benin","BEN","Jute","fabio" +"4994","Benin","BEN","Jute-Like Fibres","fabio" +"4995","Benin","BEN","Soft-Fibres, Other","fabio" +"4996","Benin","BEN","Sisal","fabio" +"4997","Benin","BEN","Abaca","fabio" +"4998","Benin","BEN","Hard Fibres, Other","fabio" +"4999","Benin","BEN","Tobacco","fabio" +"5000","Benin","BEN","Rubber","fabio" +"5001","Benin","BEN","Fodder crops","fabio" +"5002","Benin","BEN","Grazing","fabio" +"5003","Benin","BEN","Cottonseed","fabio" +"5004","Benin","BEN","Palm kernels","fabio" +"5005","Benin","BEN","Sugar non-centrifugal","fabio" +"5006","Benin","BEN","Molasses","fabio" +"5007","Benin","BEN","Sugar, Refined Equiv","fabio" +"5008","Benin","BEN","Sweeteners, Other","fabio" +"5009","Benin","BEN","Soyabean Oil","fabio" +"5010","Benin","BEN","Groundnut Oil","fabio" +"5011","Benin","BEN","Sunflowerseed Oil","fabio" +"5012","Benin","BEN","Rape and Mustard Oil","fabio" +"5013","Benin","BEN","Cottonseed Oil","fabio" +"5014","Benin","BEN","Palmkernel Oil","fabio" +"5015","Benin","BEN","Palm Oil","fabio" +"5016","Benin","BEN","Coconut Oil","fabio" +"5017","Benin","BEN","Sesameseed Oil","fabio" +"5018","Benin","BEN","Olive Oil","fabio" +"5019","Benin","BEN","Ricebran Oil","fabio" +"5020","Benin","BEN","Maize Germ Oil","fabio" +"5021","Benin","BEN","Oilcrops Oil, Other","fabio" +"5022","Benin","BEN","Soyabean Cake","fabio" +"5023","Benin","BEN","Groundnut Cake","fabio" +"5024","Benin","BEN","Sunflowerseed Cake","fabio" +"5025","Benin","BEN","Rape and Mustard Cake","fabio" +"5026","Benin","BEN","Cottonseed Cake","fabio" +"5027","Benin","BEN","Palmkernel Cake","fabio" +"5028","Benin","BEN","Copra Cake","fabio" +"5029","Benin","BEN","Sesameseed Cake","fabio" +"5030","Benin","BEN","Oilseed Cakes, Other","fabio" +"5031","Benin","BEN","Wine","fabio" +"5032","Benin","BEN","Beer","fabio" +"5033","Benin","BEN","Beverages, Fermented","fabio" +"5034","Benin","BEN","Beverages, Alcoholic","fabio" +"5035","Benin","BEN","Alcohol, Non-Food","fabio" +"5036","Benin","BEN","Cotton lint","fabio" +"5037","Benin","BEN","Cattle","fabio" +"5038","Benin","BEN","Buffaloes","fabio" +"5039","Benin","BEN","Sheep","fabio" +"5040","Benin","BEN","Goats","fabio" +"5041","Benin","BEN","Pigs","fabio" +"5042","Benin","BEN","Poultry Birds","fabio" +"5043","Benin","BEN","Horses","fabio" +"5044","Benin","BEN","Asses","fabio" +"5045","Benin","BEN","Mules","fabio" +"5046","Benin","BEN","Camels","fabio" +"5047","Benin","BEN","Camelids, other","fabio" +"5048","Benin","BEN","Rabbits and hares","fabio" +"5049","Benin","BEN","Rodents, other","fabio" +"5050","Benin","BEN","Live animals, other","fabio" +"5051","Benin","BEN","Milk - Excluding Butter","fabio" +"5052","Benin","BEN","Butter, Ghee","fabio" +"5053","Benin","BEN","Eggs","fabio" +"5054","Benin","BEN","Wool (Clean Eq.)","fabio" +"5055","Benin","BEN","Bovine Meat","fabio" +"5056","Benin","BEN","Mutton & Goat Meat","fabio" +"5057","Benin","BEN","Pigmeat","fabio" +"5058","Benin","BEN","Poultry Meat","fabio" +"5059","Benin","BEN","Meat, Other","fabio" +"5060","Benin","BEN","Offals, Edible","fabio" +"5061","Benin","BEN","Fats, Animals, Raw","fabio" +"5062","Benin","BEN","Hides and skins","fabio" +"5063","Benin","BEN","Meat Meal","fabio" +"5064","Benin","BEN","Pet food","fabio" +"5065","Benin","BEN","Honey","fabio" +"5066","Benin","BEN","Silk","fabio" +"5067","Benin","BEN","Fish, Seafood","fabio" +"5068","Benin","BEN","Wood fuel","fabio" +"5069","Benin","BEN","Industrial roundwood, coniferous","fabio" +"5070","Benin","BEN","Industrial roundwood, non-coniferous","fabio" +"5071","Denmark","DNK","Rice (Milled Equivalent)","fabio" +"5072","Denmark","DNK","Wheat and products","fabio" +"5073","Denmark","DNK","Barley and products","fabio" +"5074","Denmark","DNK","Maize and products","fabio" +"5075","Denmark","DNK","Rye and products","fabio" +"5076","Denmark","DNK","Oats","fabio" +"5077","Denmark","DNK","Millet and products","fabio" +"5078","Denmark","DNK","Sorghum and products","fabio" +"5079","Denmark","DNK","Cereals, Other","fabio" +"5080","Denmark","DNK","Potatoes and products","fabio" +"5081","Denmark","DNK","Cassava and products","fabio" +"5082","Denmark","DNK","Sweet potatoes","fabio" +"5083","Denmark","DNK","Roots, Other","fabio" +"5084","Denmark","DNK","Yams","fabio" +"5085","Denmark","DNK","Sugar cane","fabio" +"5086","Denmark","DNK","Sugar beet","fabio" +"5087","Denmark","DNK","Beans","fabio" +"5088","Denmark","DNK","Peas","fabio" +"5089","Denmark","DNK","Pulses, Other and products","fabio" +"5090","Denmark","DNK","Nuts and products","fabio" +"5091","Denmark","DNK","Soyabeans","fabio" +"5092","Denmark","DNK","Groundnuts (Shelled Eq)","fabio" +"5093","Denmark","DNK","Sunflower seed","fabio" +"5094","Denmark","DNK","Rape and Mustardseed","fabio" +"5095","Denmark","DNK","Seed cotton","fabio" +"5096","Denmark","DNK","Coconuts - Incl Copra","fabio" +"5097","Denmark","DNK","Sesame seed","fabio" +"5098","Denmark","DNK","Oil, palm fruit","fabio" +"5099","Denmark","DNK","Olives (including preserved)","fabio" +"5100","Denmark","DNK","Oilcrops, Other","fabio" +"5101","Denmark","DNK","Tomatoes and products","fabio" +"5102","Denmark","DNK","Onions","fabio" +"5103","Denmark","DNK","Vegetables, Other","fabio" +"5104","Denmark","DNK","Oranges, Mandarines","fabio" +"5105","Denmark","DNK","Lemons, Limes and products","fabio" +"5106","Denmark","DNK","Grapefruit and products","fabio" +"5107","Denmark","DNK","Citrus, Other","fabio" +"5108","Denmark","DNK","Bananas","fabio" +"5109","Denmark","DNK","Plantains","fabio" +"5110","Denmark","DNK","Apples and products","fabio" +"5111","Denmark","DNK","Pineapples and products","fabio" +"5112","Denmark","DNK","Dates","fabio" +"5113","Denmark","DNK","Grapes and products (excl wine)","fabio" +"5114","Denmark","DNK","Fruits, Other","fabio" +"5115","Denmark","DNK","Coffee and products","fabio" +"5116","Denmark","DNK","Cocoa Beans and products","fabio" +"5117","Denmark","DNK","Tea (including mate)","fabio" +"5118","Denmark","DNK","Hops","fabio" +"5119","Denmark","DNK","Pepper","fabio" +"5120","Denmark","DNK","Pimento","fabio" +"5121","Denmark","DNK","Cloves","fabio" +"5122","Denmark","DNK","Spices, Other","fabio" +"5123","Denmark","DNK","Jute","fabio" +"5124","Denmark","DNK","Jute-Like Fibres","fabio" +"5125","Denmark","DNK","Soft-Fibres, Other","fabio" +"5126","Denmark","DNK","Sisal","fabio" +"5127","Denmark","DNK","Abaca","fabio" +"5128","Denmark","DNK","Hard Fibres, Other","fabio" +"5129","Denmark","DNK","Tobacco","fabio" +"5130","Denmark","DNK","Rubber","fabio" +"5131","Denmark","DNK","Fodder crops","fabio" +"5132","Denmark","DNK","Grazing","fabio" +"5133","Denmark","DNK","Cottonseed","fabio" +"5134","Denmark","DNK","Palm kernels","fabio" +"5135","Denmark","DNK","Sugar non-centrifugal","fabio" +"5136","Denmark","DNK","Molasses","fabio" +"5137","Denmark","DNK","Sugar, Refined Equiv","fabio" +"5138","Denmark","DNK","Sweeteners, Other","fabio" +"5139","Denmark","DNK","Soyabean Oil","fabio" +"5140","Denmark","DNK","Groundnut Oil","fabio" +"5141","Denmark","DNK","Sunflowerseed Oil","fabio" +"5142","Denmark","DNK","Rape and Mustard Oil","fabio" +"5143","Denmark","DNK","Cottonseed Oil","fabio" +"5144","Denmark","DNK","Palmkernel Oil","fabio" +"5145","Denmark","DNK","Palm Oil","fabio" +"5146","Denmark","DNK","Coconut Oil","fabio" +"5147","Denmark","DNK","Sesameseed Oil","fabio" +"5148","Denmark","DNK","Olive Oil","fabio" +"5149","Denmark","DNK","Ricebran Oil","fabio" +"5150","Denmark","DNK","Maize Germ Oil","fabio" +"5151","Denmark","DNK","Oilcrops Oil, Other","fabio" +"5152","Denmark","DNK","Soyabean Cake","fabio" +"5153","Denmark","DNK","Groundnut Cake","fabio" +"5154","Denmark","DNK","Sunflowerseed Cake","fabio" +"5155","Denmark","DNK","Rape and Mustard Cake","fabio" +"5156","Denmark","DNK","Cottonseed Cake","fabio" +"5157","Denmark","DNK","Palmkernel Cake","fabio" +"5158","Denmark","DNK","Copra Cake","fabio" +"5159","Denmark","DNK","Sesameseed Cake","fabio" +"5160","Denmark","DNK","Oilseed Cakes, Other","fabio" +"5161","Denmark","DNK","Wine","fabio" +"5162","Denmark","DNK","Beer","fabio" +"5163","Denmark","DNK","Beverages, Fermented","fabio" +"5164","Denmark","DNK","Beverages, Alcoholic","fabio" +"5165","Denmark","DNK","Alcohol, Non-Food","fabio" +"5166","Denmark","DNK","Cotton lint","fabio" +"5167","Denmark","DNK","Cattle","fabio" +"5168","Denmark","DNK","Buffaloes","fabio" +"5169","Denmark","DNK","Sheep","fabio" +"5170","Denmark","DNK","Goats","fabio" +"5171","Denmark","DNK","Pigs","fabio" +"5172","Denmark","DNK","Poultry Birds","fabio" +"5173","Denmark","DNK","Horses","fabio" +"5174","Denmark","DNK","Asses","fabio" +"5175","Denmark","DNK","Mules","fabio" +"5176","Denmark","DNK","Camels","fabio" +"5177","Denmark","DNK","Camelids, other","fabio" +"5178","Denmark","DNK","Rabbits and hares","fabio" +"5179","Denmark","DNK","Rodents, other","fabio" +"5180","Denmark","DNK","Live animals, other","fabio" +"5181","Denmark","DNK","Milk - Excluding Butter","fabio" +"5182","Denmark","DNK","Butter, Ghee","fabio" +"5183","Denmark","DNK","Eggs","fabio" +"5184","Denmark","DNK","Wool (Clean Eq.)","fabio" +"5185","Denmark","DNK","Bovine Meat","fabio" +"5186","Denmark","DNK","Mutton & Goat Meat","fabio" +"5187","Denmark","DNK","Pigmeat","fabio" +"5188","Denmark","DNK","Poultry Meat","fabio" +"5189","Denmark","DNK","Meat, Other","fabio" +"5190","Denmark","DNK","Offals, Edible","fabio" +"5191","Denmark","DNK","Fats, Animals, Raw","fabio" +"5192","Denmark","DNK","Hides and skins","fabio" +"5193","Denmark","DNK","Meat Meal","fabio" +"5194","Denmark","DNK","Pet food","fabio" +"5195","Denmark","DNK","Honey","fabio" +"5196","Denmark","DNK","Silk","fabio" +"5197","Denmark","DNK","Fish, Seafood","fabio" +"5198","Denmark","DNK","Wood fuel","fabio" +"5199","Denmark","DNK","Industrial roundwood, coniferous","fabio" +"5200","Denmark","DNK","Industrial roundwood, non-coniferous","fabio" +"5201","Dominica","DMA","Rice (Milled Equivalent)","fabio" +"5202","Dominica","DMA","Wheat and products","fabio" +"5203","Dominica","DMA","Barley and products","fabio" +"5204","Dominica","DMA","Maize and products","fabio" +"5205","Dominica","DMA","Rye and products","fabio" +"5206","Dominica","DMA","Oats","fabio" +"5207","Dominica","DMA","Millet and products","fabio" +"5208","Dominica","DMA","Sorghum and products","fabio" +"5209","Dominica","DMA","Cereals, Other","fabio" +"5210","Dominica","DMA","Potatoes and products","fabio" +"5211","Dominica","DMA","Cassava and products","fabio" +"5212","Dominica","DMA","Sweet potatoes","fabio" +"5213","Dominica","DMA","Roots, Other","fabio" +"5214","Dominica","DMA","Yams","fabio" +"5215","Dominica","DMA","Sugar cane","fabio" +"5216","Dominica","DMA","Sugar beet","fabio" +"5217","Dominica","DMA","Beans","fabio" +"5218","Dominica","DMA","Peas","fabio" +"5219","Dominica","DMA","Pulses, Other and products","fabio" +"5220","Dominica","DMA","Nuts and products","fabio" +"5221","Dominica","DMA","Soyabeans","fabio" +"5222","Dominica","DMA","Groundnuts (Shelled Eq)","fabio" +"5223","Dominica","DMA","Sunflower seed","fabio" +"5224","Dominica","DMA","Rape and Mustardseed","fabio" +"5225","Dominica","DMA","Seed cotton","fabio" +"5226","Dominica","DMA","Coconuts - Incl Copra","fabio" +"5227","Dominica","DMA","Sesame seed","fabio" +"5228","Dominica","DMA","Oil, palm fruit","fabio" +"5229","Dominica","DMA","Olives (including preserved)","fabio" +"5230","Dominica","DMA","Oilcrops, Other","fabio" +"5231","Dominica","DMA","Tomatoes and products","fabio" +"5232","Dominica","DMA","Onions","fabio" +"5233","Dominica","DMA","Vegetables, Other","fabio" +"5234","Dominica","DMA","Oranges, Mandarines","fabio" +"5235","Dominica","DMA","Lemons, Limes and products","fabio" +"5236","Dominica","DMA","Grapefruit and products","fabio" +"5237","Dominica","DMA","Citrus, Other","fabio" +"5238","Dominica","DMA","Bananas","fabio" +"5239","Dominica","DMA","Plantains","fabio" +"5240","Dominica","DMA","Apples and products","fabio" +"5241","Dominica","DMA","Pineapples and products","fabio" +"5242","Dominica","DMA","Dates","fabio" +"5243","Dominica","DMA","Grapes and products (excl wine)","fabio" +"5244","Dominica","DMA","Fruits, Other","fabio" +"5245","Dominica","DMA","Coffee and products","fabio" +"5246","Dominica","DMA","Cocoa Beans and products","fabio" +"5247","Dominica","DMA","Tea (including mate)","fabio" +"5248","Dominica","DMA","Hops","fabio" +"5249","Dominica","DMA","Pepper","fabio" +"5250","Dominica","DMA","Pimento","fabio" +"5251","Dominica","DMA","Cloves","fabio" +"5252","Dominica","DMA","Spices, Other","fabio" +"5253","Dominica","DMA","Jute","fabio" +"5254","Dominica","DMA","Jute-Like Fibres","fabio" +"5255","Dominica","DMA","Soft-Fibres, Other","fabio" +"5256","Dominica","DMA","Sisal","fabio" +"5257","Dominica","DMA","Abaca","fabio" +"5258","Dominica","DMA","Hard Fibres, Other","fabio" +"5259","Dominica","DMA","Tobacco","fabio" +"5260","Dominica","DMA","Rubber","fabio" +"5261","Dominica","DMA","Fodder crops","fabio" +"5262","Dominica","DMA","Grazing","fabio" +"5263","Dominica","DMA","Cottonseed","fabio" +"5264","Dominica","DMA","Palm kernels","fabio" +"5265","Dominica","DMA","Sugar non-centrifugal","fabio" +"5266","Dominica","DMA","Molasses","fabio" +"5267","Dominica","DMA","Sugar, Refined Equiv","fabio" +"5268","Dominica","DMA","Sweeteners, Other","fabio" +"5269","Dominica","DMA","Soyabean Oil","fabio" +"5270","Dominica","DMA","Groundnut Oil","fabio" +"5271","Dominica","DMA","Sunflowerseed Oil","fabio" +"5272","Dominica","DMA","Rape and Mustard Oil","fabio" +"5273","Dominica","DMA","Cottonseed Oil","fabio" +"5274","Dominica","DMA","Palmkernel Oil","fabio" +"5275","Dominica","DMA","Palm Oil","fabio" +"5276","Dominica","DMA","Coconut Oil","fabio" +"5277","Dominica","DMA","Sesameseed Oil","fabio" +"5278","Dominica","DMA","Olive Oil","fabio" +"5279","Dominica","DMA","Ricebran Oil","fabio" +"5280","Dominica","DMA","Maize Germ Oil","fabio" +"5281","Dominica","DMA","Oilcrops Oil, Other","fabio" +"5282","Dominica","DMA","Soyabean Cake","fabio" +"5283","Dominica","DMA","Groundnut Cake","fabio" +"5284","Dominica","DMA","Sunflowerseed Cake","fabio" +"5285","Dominica","DMA","Rape and Mustard Cake","fabio" +"5286","Dominica","DMA","Cottonseed Cake","fabio" +"5287","Dominica","DMA","Palmkernel Cake","fabio" +"5288","Dominica","DMA","Copra Cake","fabio" +"5289","Dominica","DMA","Sesameseed Cake","fabio" +"5290","Dominica","DMA","Oilseed Cakes, Other","fabio" +"5291","Dominica","DMA","Wine","fabio" +"5292","Dominica","DMA","Beer","fabio" +"5293","Dominica","DMA","Beverages, Fermented","fabio" +"5294","Dominica","DMA","Beverages, Alcoholic","fabio" +"5295","Dominica","DMA","Alcohol, Non-Food","fabio" +"5296","Dominica","DMA","Cotton lint","fabio" +"5297","Dominica","DMA","Cattle","fabio" +"5298","Dominica","DMA","Buffaloes","fabio" +"5299","Dominica","DMA","Sheep","fabio" +"5300","Dominica","DMA","Goats","fabio" +"5301","Dominica","DMA","Pigs","fabio" +"5302","Dominica","DMA","Poultry Birds","fabio" +"5303","Dominica","DMA","Horses","fabio" +"5304","Dominica","DMA","Asses","fabio" +"5305","Dominica","DMA","Mules","fabio" +"5306","Dominica","DMA","Camels","fabio" +"5307","Dominica","DMA","Camelids, other","fabio" +"5308","Dominica","DMA","Rabbits and hares","fabio" +"5309","Dominica","DMA","Rodents, other","fabio" +"5310","Dominica","DMA","Live animals, other","fabio" +"5311","Dominica","DMA","Milk - Excluding Butter","fabio" +"5312","Dominica","DMA","Butter, Ghee","fabio" +"5313","Dominica","DMA","Eggs","fabio" +"5314","Dominica","DMA","Wool (Clean Eq.)","fabio" +"5315","Dominica","DMA","Bovine Meat","fabio" +"5316","Dominica","DMA","Mutton & Goat Meat","fabio" +"5317","Dominica","DMA","Pigmeat","fabio" +"5318","Dominica","DMA","Poultry Meat","fabio" +"5319","Dominica","DMA","Meat, Other","fabio" +"5320","Dominica","DMA","Offals, Edible","fabio" +"5321","Dominica","DMA","Fats, Animals, Raw","fabio" +"5322","Dominica","DMA","Hides and skins","fabio" +"5323","Dominica","DMA","Meat Meal","fabio" +"5324","Dominica","DMA","Pet food","fabio" +"5325","Dominica","DMA","Honey","fabio" +"5326","Dominica","DMA","Silk","fabio" +"5327","Dominica","DMA","Fish, Seafood","fabio" +"5328","Dominica","DMA","Wood fuel","fabio" +"5329","Dominica","DMA","Industrial roundwood, coniferous","fabio" +"5330","Dominica","DMA","Industrial roundwood, non-coniferous","fabio" +"5331","Dominican Republic","DOM","Rice (Milled Equivalent)","fabio" +"5332","Dominican Republic","DOM","Wheat and products","fabio" +"5333","Dominican Republic","DOM","Barley and products","fabio" +"5334","Dominican Republic","DOM","Maize and products","fabio" +"5335","Dominican Republic","DOM","Rye and products","fabio" +"5336","Dominican Republic","DOM","Oats","fabio" +"5337","Dominican Republic","DOM","Millet and products","fabio" +"5338","Dominican Republic","DOM","Sorghum and products","fabio" +"5339","Dominican Republic","DOM","Cereals, Other","fabio" +"5340","Dominican Republic","DOM","Potatoes and products","fabio" +"5341","Dominican Republic","DOM","Cassava and products","fabio" +"5342","Dominican Republic","DOM","Sweet potatoes","fabio" +"5343","Dominican Republic","DOM","Roots, Other","fabio" +"5344","Dominican Republic","DOM","Yams","fabio" +"5345","Dominican Republic","DOM","Sugar cane","fabio" +"5346","Dominican Republic","DOM","Sugar beet","fabio" +"5347","Dominican Republic","DOM","Beans","fabio" +"5348","Dominican Republic","DOM","Peas","fabio" +"5349","Dominican Republic","DOM","Pulses, Other and products","fabio" +"5350","Dominican Republic","DOM","Nuts and products","fabio" +"5351","Dominican Republic","DOM","Soyabeans","fabio" +"5352","Dominican Republic","DOM","Groundnuts (Shelled Eq)","fabio" +"5353","Dominican Republic","DOM","Sunflower seed","fabio" +"5354","Dominican Republic","DOM","Rape and Mustardseed","fabio" +"5355","Dominican Republic","DOM","Seed cotton","fabio" +"5356","Dominican Republic","DOM","Coconuts - Incl Copra","fabio" +"5357","Dominican Republic","DOM","Sesame seed","fabio" +"5358","Dominican Republic","DOM","Oil, palm fruit","fabio" +"5359","Dominican Republic","DOM","Olives (including preserved)","fabio" +"5360","Dominican Republic","DOM","Oilcrops, Other","fabio" +"5361","Dominican Republic","DOM","Tomatoes and products","fabio" +"5362","Dominican Republic","DOM","Onions","fabio" +"5363","Dominican Republic","DOM","Vegetables, Other","fabio" +"5364","Dominican Republic","DOM","Oranges, Mandarines","fabio" +"5365","Dominican Republic","DOM","Lemons, Limes and products","fabio" +"5366","Dominican Republic","DOM","Grapefruit and products","fabio" +"5367","Dominican Republic","DOM","Citrus, Other","fabio" +"5368","Dominican Republic","DOM","Bananas","fabio" +"5369","Dominican Republic","DOM","Plantains","fabio" +"5370","Dominican Republic","DOM","Apples and products","fabio" +"5371","Dominican Republic","DOM","Pineapples and products","fabio" +"5372","Dominican Republic","DOM","Dates","fabio" +"5373","Dominican Republic","DOM","Grapes and products (excl wine)","fabio" +"5374","Dominican Republic","DOM","Fruits, Other","fabio" +"5375","Dominican Republic","DOM","Coffee and products","fabio" +"5376","Dominican Republic","DOM","Cocoa Beans and products","fabio" +"5377","Dominican Republic","DOM","Tea (including mate)","fabio" +"5378","Dominican Republic","DOM","Hops","fabio" +"5379","Dominican Republic","DOM","Pepper","fabio" +"5380","Dominican Republic","DOM","Pimento","fabio" +"5381","Dominican Republic","DOM","Cloves","fabio" +"5382","Dominican Republic","DOM","Spices, Other","fabio" +"5383","Dominican Republic","DOM","Jute","fabio" +"5384","Dominican Republic","DOM","Jute-Like Fibres","fabio" +"5385","Dominican Republic","DOM","Soft-Fibres, Other","fabio" +"5386","Dominican Republic","DOM","Sisal","fabio" +"5387","Dominican Republic","DOM","Abaca","fabio" +"5388","Dominican Republic","DOM","Hard Fibres, Other","fabio" +"5389","Dominican Republic","DOM","Tobacco","fabio" +"5390","Dominican Republic","DOM","Rubber","fabio" +"5391","Dominican Republic","DOM","Fodder crops","fabio" +"5392","Dominican Republic","DOM","Grazing","fabio" +"5393","Dominican Republic","DOM","Cottonseed","fabio" +"5394","Dominican Republic","DOM","Palm kernels","fabio" +"5395","Dominican Republic","DOM","Sugar non-centrifugal","fabio" +"5396","Dominican Republic","DOM","Molasses","fabio" +"5397","Dominican Republic","DOM","Sugar, Refined Equiv","fabio" +"5398","Dominican Republic","DOM","Sweeteners, Other","fabio" +"5399","Dominican Republic","DOM","Soyabean Oil","fabio" +"5400","Dominican Republic","DOM","Groundnut Oil","fabio" +"5401","Dominican Republic","DOM","Sunflowerseed Oil","fabio" +"5402","Dominican Republic","DOM","Rape and Mustard Oil","fabio" +"5403","Dominican Republic","DOM","Cottonseed Oil","fabio" +"5404","Dominican Republic","DOM","Palmkernel Oil","fabio" +"5405","Dominican Republic","DOM","Palm Oil","fabio" +"5406","Dominican Republic","DOM","Coconut Oil","fabio" +"5407","Dominican Republic","DOM","Sesameseed Oil","fabio" +"5408","Dominican Republic","DOM","Olive Oil","fabio" +"5409","Dominican Republic","DOM","Ricebran Oil","fabio" +"5410","Dominican Republic","DOM","Maize Germ Oil","fabio" +"5411","Dominican Republic","DOM","Oilcrops Oil, Other","fabio" +"5412","Dominican Republic","DOM","Soyabean Cake","fabio" +"5413","Dominican Republic","DOM","Groundnut Cake","fabio" +"5414","Dominican Republic","DOM","Sunflowerseed Cake","fabio" +"5415","Dominican Republic","DOM","Rape and Mustard Cake","fabio" +"5416","Dominican Republic","DOM","Cottonseed Cake","fabio" +"5417","Dominican Republic","DOM","Palmkernel Cake","fabio" +"5418","Dominican Republic","DOM","Copra Cake","fabio" +"5419","Dominican Republic","DOM","Sesameseed Cake","fabio" +"5420","Dominican Republic","DOM","Oilseed Cakes, Other","fabio" +"5421","Dominican Republic","DOM","Wine","fabio" +"5422","Dominican Republic","DOM","Beer","fabio" +"5423","Dominican Republic","DOM","Beverages, Fermented","fabio" +"5424","Dominican Republic","DOM","Beverages, Alcoholic","fabio" +"5425","Dominican Republic","DOM","Alcohol, Non-Food","fabio" +"5426","Dominican Republic","DOM","Cotton lint","fabio" +"5427","Dominican Republic","DOM","Cattle","fabio" +"5428","Dominican Republic","DOM","Buffaloes","fabio" +"5429","Dominican Republic","DOM","Sheep","fabio" +"5430","Dominican Republic","DOM","Goats","fabio" +"5431","Dominican Republic","DOM","Pigs","fabio" +"5432","Dominican Republic","DOM","Poultry Birds","fabio" +"5433","Dominican Republic","DOM","Horses","fabio" +"5434","Dominican Republic","DOM","Asses","fabio" +"5435","Dominican Republic","DOM","Mules","fabio" +"5436","Dominican Republic","DOM","Camels","fabio" +"5437","Dominican Republic","DOM","Camelids, other","fabio" +"5438","Dominican Republic","DOM","Rabbits and hares","fabio" +"5439","Dominican Republic","DOM","Rodents, other","fabio" +"5440","Dominican Republic","DOM","Live animals, other","fabio" +"5441","Dominican Republic","DOM","Milk - Excluding Butter","fabio" +"5442","Dominican Republic","DOM","Butter, Ghee","fabio" +"5443","Dominican Republic","DOM","Eggs","fabio" +"5444","Dominican Republic","DOM","Wool (Clean Eq.)","fabio" +"5445","Dominican Republic","DOM","Bovine Meat","fabio" +"5446","Dominican Republic","DOM","Mutton & Goat Meat","fabio" +"5447","Dominican Republic","DOM","Pigmeat","fabio" +"5448","Dominican Republic","DOM","Poultry Meat","fabio" +"5449","Dominican Republic","DOM","Meat, Other","fabio" +"5450","Dominican Republic","DOM","Offals, Edible","fabio" +"5451","Dominican Republic","DOM","Fats, Animals, Raw","fabio" +"5452","Dominican Republic","DOM","Hides and skins","fabio" +"5453","Dominican Republic","DOM","Meat Meal","fabio" +"5454","Dominican Republic","DOM","Pet food","fabio" +"5455","Dominican Republic","DOM","Honey","fabio" +"5456","Dominican Republic","DOM","Silk","fabio" +"5457","Dominican Republic","DOM","Fish, Seafood","fabio" +"5458","Dominican Republic","DOM","Wood fuel","fabio" +"5459","Dominican Republic","DOM","Industrial roundwood, coniferous","fabio" +"5460","Dominican Republic","DOM","Industrial roundwood, non-coniferous","fabio" +"5461","Belarus","BLR","Rice (Milled Equivalent)","fabio" +"5462","Belarus","BLR","Wheat and products","fabio" +"5463","Belarus","BLR","Barley and products","fabio" +"5464","Belarus","BLR","Maize and products","fabio" +"5465","Belarus","BLR","Rye and products","fabio" +"5466","Belarus","BLR","Oats","fabio" +"5467","Belarus","BLR","Millet and products","fabio" +"5468","Belarus","BLR","Sorghum and products","fabio" +"5469","Belarus","BLR","Cereals, Other","fabio" +"5470","Belarus","BLR","Potatoes and products","fabio" +"5471","Belarus","BLR","Cassava and products","fabio" +"5472","Belarus","BLR","Sweet potatoes","fabio" +"5473","Belarus","BLR","Roots, Other","fabio" +"5474","Belarus","BLR","Yams","fabio" +"5475","Belarus","BLR","Sugar cane","fabio" +"5476","Belarus","BLR","Sugar beet","fabio" +"5477","Belarus","BLR","Beans","fabio" +"5478","Belarus","BLR","Peas","fabio" +"5479","Belarus","BLR","Pulses, Other and products","fabio" +"5480","Belarus","BLR","Nuts and products","fabio" +"5481","Belarus","BLR","Soyabeans","fabio" +"5482","Belarus","BLR","Groundnuts (Shelled Eq)","fabio" +"5483","Belarus","BLR","Sunflower seed","fabio" +"5484","Belarus","BLR","Rape and Mustardseed","fabio" +"5485","Belarus","BLR","Seed cotton","fabio" +"5486","Belarus","BLR","Coconuts - Incl Copra","fabio" +"5487","Belarus","BLR","Sesame seed","fabio" +"5488","Belarus","BLR","Oil, palm fruit","fabio" +"5489","Belarus","BLR","Olives (including preserved)","fabio" +"5490","Belarus","BLR","Oilcrops, Other","fabio" +"5491","Belarus","BLR","Tomatoes and products","fabio" +"5492","Belarus","BLR","Onions","fabio" +"5493","Belarus","BLR","Vegetables, Other","fabio" +"5494","Belarus","BLR","Oranges, Mandarines","fabio" +"5495","Belarus","BLR","Lemons, Limes and products","fabio" +"5496","Belarus","BLR","Grapefruit and products","fabio" +"5497","Belarus","BLR","Citrus, Other","fabio" +"5498","Belarus","BLR","Bananas","fabio" +"5499","Belarus","BLR","Plantains","fabio" +"5500","Belarus","BLR","Apples and products","fabio" +"5501","Belarus","BLR","Pineapples and products","fabio" +"5502","Belarus","BLR","Dates","fabio" +"5503","Belarus","BLR","Grapes and products (excl wine)","fabio" +"5504","Belarus","BLR","Fruits, Other","fabio" +"5505","Belarus","BLR","Coffee and products","fabio" +"5506","Belarus","BLR","Cocoa Beans and products","fabio" +"5507","Belarus","BLR","Tea (including mate)","fabio" +"5508","Belarus","BLR","Hops","fabio" +"5509","Belarus","BLR","Pepper","fabio" +"5510","Belarus","BLR","Pimento","fabio" +"5511","Belarus","BLR","Cloves","fabio" +"5512","Belarus","BLR","Spices, Other","fabio" +"5513","Belarus","BLR","Jute","fabio" +"5514","Belarus","BLR","Jute-Like Fibres","fabio" +"5515","Belarus","BLR","Soft-Fibres, Other","fabio" +"5516","Belarus","BLR","Sisal","fabio" +"5517","Belarus","BLR","Abaca","fabio" +"5518","Belarus","BLR","Hard Fibres, Other","fabio" +"5519","Belarus","BLR","Tobacco","fabio" +"5520","Belarus","BLR","Rubber","fabio" +"5521","Belarus","BLR","Fodder crops","fabio" +"5522","Belarus","BLR","Grazing","fabio" +"5523","Belarus","BLR","Cottonseed","fabio" +"5524","Belarus","BLR","Palm kernels","fabio" +"5525","Belarus","BLR","Sugar non-centrifugal","fabio" +"5526","Belarus","BLR","Molasses","fabio" +"5527","Belarus","BLR","Sugar, Refined Equiv","fabio" +"5528","Belarus","BLR","Sweeteners, Other","fabio" +"5529","Belarus","BLR","Soyabean Oil","fabio" +"5530","Belarus","BLR","Groundnut Oil","fabio" +"5531","Belarus","BLR","Sunflowerseed Oil","fabio" +"5532","Belarus","BLR","Rape and Mustard Oil","fabio" +"5533","Belarus","BLR","Cottonseed Oil","fabio" +"5534","Belarus","BLR","Palmkernel Oil","fabio" +"5535","Belarus","BLR","Palm Oil","fabio" +"5536","Belarus","BLR","Coconut Oil","fabio" +"5537","Belarus","BLR","Sesameseed Oil","fabio" +"5538","Belarus","BLR","Olive Oil","fabio" +"5539","Belarus","BLR","Ricebran Oil","fabio" +"5540","Belarus","BLR","Maize Germ Oil","fabio" +"5541","Belarus","BLR","Oilcrops Oil, Other","fabio" +"5542","Belarus","BLR","Soyabean Cake","fabio" +"5543","Belarus","BLR","Groundnut Cake","fabio" +"5544","Belarus","BLR","Sunflowerseed Cake","fabio" +"5545","Belarus","BLR","Rape and Mustard Cake","fabio" +"5546","Belarus","BLR","Cottonseed Cake","fabio" +"5547","Belarus","BLR","Palmkernel Cake","fabio" +"5548","Belarus","BLR","Copra Cake","fabio" +"5549","Belarus","BLR","Sesameseed Cake","fabio" +"5550","Belarus","BLR","Oilseed Cakes, Other","fabio" +"5551","Belarus","BLR","Wine","fabio" +"5552","Belarus","BLR","Beer","fabio" +"5553","Belarus","BLR","Beverages, Fermented","fabio" +"5554","Belarus","BLR","Beverages, Alcoholic","fabio" +"5555","Belarus","BLR","Alcohol, Non-Food","fabio" +"5556","Belarus","BLR","Cotton lint","fabio" +"5557","Belarus","BLR","Cattle","fabio" +"5558","Belarus","BLR","Buffaloes","fabio" +"5559","Belarus","BLR","Sheep","fabio" +"5560","Belarus","BLR","Goats","fabio" +"5561","Belarus","BLR","Pigs","fabio" +"5562","Belarus","BLR","Poultry Birds","fabio" +"5563","Belarus","BLR","Horses","fabio" +"5564","Belarus","BLR","Asses","fabio" +"5565","Belarus","BLR","Mules","fabio" +"5566","Belarus","BLR","Camels","fabio" +"5567","Belarus","BLR","Camelids, other","fabio" +"5568","Belarus","BLR","Rabbits and hares","fabio" +"5569","Belarus","BLR","Rodents, other","fabio" +"5570","Belarus","BLR","Live animals, other","fabio" +"5571","Belarus","BLR","Milk - Excluding Butter","fabio" +"5572","Belarus","BLR","Butter, Ghee","fabio" +"5573","Belarus","BLR","Eggs","fabio" +"5574","Belarus","BLR","Wool (Clean Eq.)","fabio" +"5575","Belarus","BLR","Bovine Meat","fabio" +"5576","Belarus","BLR","Mutton & Goat Meat","fabio" +"5577","Belarus","BLR","Pigmeat","fabio" +"5578","Belarus","BLR","Poultry Meat","fabio" +"5579","Belarus","BLR","Meat, Other","fabio" +"5580","Belarus","BLR","Offals, Edible","fabio" +"5581","Belarus","BLR","Fats, Animals, Raw","fabio" +"5582","Belarus","BLR","Hides and skins","fabio" +"5583","Belarus","BLR","Meat Meal","fabio" +"5584","Belarus","BLR","Pet food","fabio" +"5585","Belarus","BLR","Honey","fabio" +"5586","Belarus","BLR","Silk","fabio" +"5587","Belarus","BLR","Fish, Seafood","fabio" +"5588","Belarus","BLR","Wood fuel","fabio" +"5589","Belarus","BLR","Industrial roundwood, coniferous","fabio" +"5590","Belarus","BLR","Industrial roundwood, non-coniferous","fabio" +"5591","Ecuador","ECU","Rice (Milled Equivalent)","fabio" +"5592","Ecuador","ECU","Wheat and products","fabio" +"5593","Ecuador","ECU","Barley and products","fabio" +"5594","Ecuador","ECU","Maize and products","fabio" +"5595","Ecuador","ECU","Rye and products","fabio" +"5596","Ecuador","ECU","Oats","fabio" +"5597","Ecuador","ECU","Millet and products","fabio" +"5598","Ecuador","ECU","Sorghum and products","fabio" +"5599","Ecuador","ECU","Cereals, Other","fabio" +"5600","Ecuador","ECU","Potatoes and products","fabio" +"5601","Ecuador","ECU","Cassava and products","fabio" +"5602","Ecuador","ECU","Sweet potatoes","fabio" +"5603","Ecuador","ECU","Roots, Other","fabio" +"5604","Ecuador","ECU","Yams","fabio" +"5605","Ecuador","ECU","Sugar cane","fabio" +"5606","Ecuador","ECU","Sugar beet","fabio" +"5607","Ecuador","ECU","Beans","fabio" +"5608","Ecuador","ECU","Peas","fabio" +"5609","Ecuador","ECU","Pulses, Other and products","fabio" +"5610","Ecuador","ECU","Nuts and products","fabio" +"5611","Ecuador","ECU","Soyabeans","fabio" +"5612","Ecuador","ECU","Groundnuts (Shelled Eq)","fabio" +"5613","Ecuador","ECU","Sunflower seed","fabio" +"5614","Ecuador","ECU","Rape and Mustardseed","fabio" +"5615","Ecuador","ECU","Seed cotton","fabio" +"5616","Ecuador","ECU","Coconuts - Incl Copra","fabio" +"5617","Ecuador","ECU","Sesame seed","fabio" +"5618","Ecuador","ECU","Oil, palm fruit","fabio" +"5619","Ecuador","ECU","Olives (including preserved)","fabio" +"5620","Ecuador","ECU","Oilcrops, Other","fabio" +"5621","Ecuador","ECU","Tomatoes and products","fabio" +"5622","Ecuador","ECU","Onions","fabio" +"5623","Ecuador","ECU","Vegetables, Other","fabio" +"5624","Ecuador","ECU","Oranges, Mandarines","fabio" +"5625","Ecuador","ECU","Lemons, Limes and products","fabio" +"5626","Ecuador","ECU","Grapefruit and products","fabio" +"5627","Ecuador","ECU","Citrus, Other","fabio" +"5628","Ecuador","ECU","Bananas","fabio" +"5629","Ecuador","ECU","Plantains","fabio" +"5630","Ecuador","ECU","Apples and products","fabio" +"5631","Ecuador","ECU","Pineapples and products","fabio" +"5632","Ecuador","ECU","Dates","fabio" +"5633","Ecuador","ECU","Grapes and products (excl wine)","fabio" +"5634","Ecuador","ECU","Fruits, Other","fabio" +"5635","Ecuador","ECU","Coffee and products","fabio" +"5636","Ecuador","ECU","Cocoa Beans and products","fabio" +"5637","Ecuador","ECU","Tea (including mate)","fabio" +"5638","Ecuador","ECU","Hops","fabio" +"5639","Ecuador","ECU","Pepper","fabio" +"5640","Ecuador","ECU","Pimento","fabio" +"5641","Ecuador","ECU","Cloves","fabio" +"5642","Ecuador","ECU","Spices, Other","fabio" +"5643","Ecuador","ECU","Jute","fabio" +"5644","Ecuador","ECU","Jute-Like Fibres","fabio" +"5645","Ecuador","ECU","Soft-Fibres, Other","fabio" +"5646","Ecuador","ECU","Sisal","fabio" +"5647","Ecuador","ECU","Abaca","fabio" +"5648","Ecuador","ECU","Hard Fibres, Other","fabio" +"5649","Ecuador","ECU","Tobacco","fabio" +"5650","Ecuador","ECU","Rubber","fabio" +"5651","Ecuador","ECU","Fodder crops","fabio" +"5652","Ecuador","ECU","Grazing","fabio" +"5653","Ecuador","ECU","Cottonseed","fabio" +"5654","Ecuador","ECU","Palm kernels","fabio" +"5655","Ecuador","ECU","Sugar non-centrifugal","fabio" +"5656","Ecuador","ECU","Molasses","fabio" +"5657","Ecuador","ECU","Sugar, Refined Equiv","fabio" +"5658","Ecuador","ECU","Sweeteners, Other","fabio" +"5659","Ecuador","ECU","Soyabean Oil","fabio" +"5660","Ecuador","ECU","Groundnut Oil","fabio" +"5661","Ecuador","ECU","Sunflowerseed Oil","fabio" +"5662","Ecuador","ECU","Rape and Mustard Oil","fabio" +"5663","Ecuador","ECU","Cottonseed Oil","fabio" +"5664","Ecuador","ECU","Palmkernel Oil","fabio" +"5665","Ecuador","ECU","Palm Oil","fabio" +"5666","Ecuador","ECU","Coconut Oil","fabio" +"5667","Ecuador","ECU","Sesameseed Oil","fabio" +"5668","Ecuador","ECU","Olive Oil","fabio" +"5669","Ecuador","ECU","Ricebran Oil","fabio" +"5670","Ecuador","ECU","Maize Germ Oil","fabio" +"5671","Ecuador","ECU","Oilcrops Oil, Other","fabio" +"5672","Ecuador","ECU","Soyabean Cake","fabio" +"5673","Ecuador","ECU","Groundnut Cake","fabio" +"5674","Ecuador","ECU","Sunflowerseed Cake","fabio" +"5675","Ecuador","ECU","Rape and Mustard Cake","fabio" +"5676","Ecuador","ECU","Cottonseed Cake","fabio" +"5677","Ecuador","ECU","Palmkernel Cake","fabio" +"5678","Ecuador","ECU","Copra Cake","fabio" +"5679","Ecuador","ECU","Sesameseed Cake","fabio" +"5680","Ecuador","ECU","Oilseed Cakes, Other","fabio" +"5681","Ecuador","ECU","Wine","fabio" +"5682","Ecuador","ECU","Beer","fabio" +"5683","Ecuador","ECU","Beverages, Fermented","fabio" +"5684","Ecuador","ECU","Beverages, Alcoholic","fabio" +"5685","Ecuador","ECU","Alcohol, Non-Food","fabio" +"5686","Ecuador","ECU","Cotton lint","fabio" +"5687","Ecuador","ECU","Cattle","fabio" +"5688","Ecuador","ECU","Buffaloes","fabio" +"5689","Ecuador","ECU","Sheep","fabio" +"5690","Ecuador","ECU","Goats","fabio" +"5691","Ecuador","ECU","Pigs","fabio" +"5692","Ecuador","ECU","Poultry Birds","fabio" +"5693","Ecuador","ECU","Horses","fabio" +"5694","Ecuador","ECU","Asses","fabio" +"5695","Ecuador","ECU","Mules","fabio" +"5696","Ecuador","ECU","Camels","fabio" +"5697","Ecuador","ECU","Camelids, other","fabio" +"5698","Ecuador","ECU","Rabbits and hares","fabio" +"5699","Ecuador","ECU","Rodents, other","fabio" +"5700","Ecuador","ECU","Live animals, other","fabio" +"5701","Ecuador","ECU","Milk - Excluding Butter","fabio" +"5702","Ecuador","ECU","Butter, Ghee","fabio" +"5703","Ecuador","ECU","Eggs","fabio" +"5704","Ecuador","ECU","Wool (Clean Eq.)","fabio" +"5705","Ecuador","ECU","Bovine Meat","fabio" +"5706","Ecuador","ECU","Mutton & Goat Meat","fabio" +"5707","Ecuador","ECU","Pigmeat","fabio" +"5708","Ecuador","ECU","Poultry Meat","fabio" +"5709","Ecuador","ECU","Meat, Other","fabio" +"5710","Ecuador","ECU","Offals, Edible","fabio" +"5711","Ecuador","ECU","Fats, Animals, Raw","fabio" +"5712","Ecuador","ECU","Hides and skins","fabio" +"5713","Ecuador","ECU","Meat Meal","fabio" +"5714","Ecuador","ECU","Pet food","fabio" +"5715","Ecuador","ECU","Honey","fabio" +"5716","Ecuador","ECU","Silk","fabio" +"5717","Ecuador","ECU","Fish, Seafood","fabio" +"5718","Ecuador","ECU","Wood fuel","fabio" +"5719","Ecuador","ECU","Industrial roundwood, coniferous","fabio" +"5720","Ecuador","ECU","Industrial roundwood, non-coniferous","fabio" +"5721","Egypt","EGY","Rice (Milled Equivalent)","fabio" +"5722","Egypt","EGY","Wheat and products","fabio" +"5723","Egypt","EGY","Barley and products","fabio" +"5724","Egypt","EGY","Maize and products","fabio" +"5725","Egypt","EGY","Rye and products","fabio" +"5726","Egypt","EGY","Oats","fabio" +"5727","Egypt","EGY","Millet and products","fabio" +"5728","Egypt","EGY","Sorghum and products","fabio" +"5729","Egypt","EGY","Cereals, Other","fabio" +"5730","Egypt","EGY","Potatoes and products","fabio" +"5731","Egypt","EGY","Cassava and products","fabio" +"5732","Egypt","EGY","Sweet potatoes","fabio" +"5733","Egypt","EGY","Roots, Other","fabio" +"5734","Egypt","EGY","Yams","fabio" +"5735","Egypt","EGY","Sugar cane","fabio" +"5736","Egypt","EGY","Sugar beet","fabio" +"5737","Egypt","EGY","Beans","fabio" +"5738","Egypt","EGY","Peas","fabio" +"5739","Egypt","EGY","Pulses, Other and products","fabio" +"5740","Egypt","EGY","Nuts and products","fabio" +"5741","Egypt","EGY","Soyabeans","fabio" +"5742","Egypt","EGY","Groundnuts (Shelled Eq)","fabio" +"5743","Egypt","EGY","Sunflower seed","fabio" +"5744","Egypt","EGY","Rape and Mustardseed","fabio" +"5745","Egypt","EGY","Seed cotton","fabio" +"5746","Egypt","EGY","Coconuts - Incl Copra","fabio" +"5747","Egypt","EGY","Sesame seed","fabio" +"5748","Egypt","EGY","Oil, palm fruit","fabio" +"5749","Egypt","EGY","Olives (including preserved)","fabio" +"5750","Egypt","EGY","Oilcrops, Other","fabio" +"5751","Egypt","EGY","Tomatoes and products","fabio" +"5752","Egypt","EGY","Onions","fabio" +"5753","Egypt","EGY","Vegetables, Other","fabio" +"5754","Egypt","EGY","Oranges, Mandarines","fabio" +"5755","Egypt","EGY","Lemons, Limes and products","fabio" +"5756","Egypt","EGY","Grapefruit and products","fabio" +"5757","Egypt","EGY","Citrus, Other","fabio" +"5758","Egypt","EGY","Bananas","fabio" +"5759","Egypt","EGY","Plantains","fabio" +"5760","Egypt","EGY","Apples and products","fabio" +"5761","Egypt","EGY","Pineapples and products","fabio" +"5762","Egypt","EGY","Dates","fabio" +"5763","Egypt","EGY","Grapes and products (excl wine)","fabio" +"5764","Egypt","EGY","Fruits, Other","fabio" +"5765","Egypt","EGY","Coffee and products","fabio" +"5766","Egypt","EGY","Cocoa Beans and products","fabio" +"5767","Egypt","EGY","Tea (including mate)","fabio" +"5768","Egypt","EGY","Hops","fabio" +"5769","Egypt","EGY","Pepper","fabio" +"5770","Egypt","EGY","Pimento","fabio" +"5771","Egypt","EGY","Cloves","fabio" +"5772","Egypt","EGY","Spices, Other","fabio" +"5773","Egypt","EGY","Jute","fabio" +"5774","Egypt","EGY","Jute-Like Fibres","fabio" +"5775","Egypt","EGY","Soft-Fibres, Other","fabio" +"5776","Egypt","EGY","Sisal","fabio" +"5777","Egypt","EGY","Abaca","fabio" +"5778","Egypt","EGY","Hard Fibres, Other","fabio" +"5779","Egypt","EGY","Tobacco","fabio" +"5780","Egypt","EGY","Rubber","fabio" +"5781","Egypt","EGY","Fodder crops","fabio" +"5782","Egypt","EGY","Grazing","fabio" +"5783","Egypt","EGY","Cottonseed","fabio" +"5784","Egypt","EGY","Palm kernels","fabio" +"5785","Egypt","EGY","Sugar non-centrifugal","fabio" +"5786","Egypt","EGY","Molasses","fabio" +"5787","Egypt","EGY","Sugar, Refined Equiv","fabio" +"5788","Egypt","EGY","Sweeteners, Other","fabio" +"5789","Egypt","EGY","Soyabean Oil","fabio" +"5790","Egypt","EGY","Groundnut Oil","fabio" +"5791","Egypt","EGY","Sunflowerseed Oil","fabio" +"5792","Egypt","EGY","Rape and Mustard Oil","fabio" +"5793","Egypt","EGY","Cottonseed Oil","fabio" +"5794","Egypt","EGY","Palmkernel Oil","fabio" +"5795","Egypt","EGY","Palm Oil","fabio" +"5796","Egypt","EGY","Coconut Oil","fabio" +"5797","Egypt","EGY","Sesameseed Oil","fabio" +"5798","Egypt","EGY","Olive Oil","fabio" +"5799","Egypt","EGY","Ricebran Oil","fabio" +"5800","Egypt","EGY","Maize Germ Oil","fabio" +"5801","Egypt","EGY","Oilcrops Oil, Other","fabio" +"5802","Egypt","EGY","Soyabean Cake","fabio" +"5803","Egypt","EGY","Groundnut Cake","fabio" +"5804","Egypt","EGY","Sunflowerseed Cake","fabio" +"5805","Egypt","EGY","Rape and Mustard Cake","fabio" +"5806","Egypt","EGY","Cottonseed Cake","fabio" +"5807","Egypt","EGY","Palmkernel Cake","fabio" +"5808","Egypt","EGY","Copra Cake","fabio" +"5809","Egypt","EGY","Sesameseed Cake","fabio" +"5810","Egypt","EGY","Oilseed Cakes, Other","fabio" +"5811","Egypt","EGY","Wine","fabio" +"5812","Egypt","EGY","Beer","fabio" +"5813","Egypt","EGY","Beverages, Fermented","fabio" +"5814","Egypt","EGY","Beverages, Alcoholic","fabio" +"5815","Egypt","EGY","Alcohol, Non-Food","fabio" +"5816","Egypt","EGY","Cotton lint","fabio" +"5817","Egypt","EGY","Cattle","fabio" +"5818","Egypt","EGY","Buffaloes","fabio" +"5819","Egypt","EGY","Sheep","fabio" +"5820","Egypt","EGY","Goats","fabio" +"5821","Egypt","EGY","Pigs","fabio" +"5822","Egypt","EGY","Poultry Birds","fabio" +"5823","Egypt","EGY","Horses","fabio" +"5824","Egypt","EGY","Asses","fabio" +"5825","Egypt","EGY","Mules","fabio" +"5826","Egypt","EGY","Camels","fabio" +"5827","Egypt","EGY","Camelids, other","fabio" +"5828","Egypt","EGY","Rabbits and hares","fabio" +"5829","Egypt","EGY","Rodents, other","fabio" +"5830","Egypt","EGY","Live animals, other","fabio" +"5831","Egypt","EGY","Milk - Excluding Butter","fabio" +"5832","Egypt","EGY","Butter, Ghee","fabio" +"5833","Egypt","EGY","Eggs","fabio" +"5834","Egypt","EGY","Wool (Clean Eq.)","fabio" +"5835","Egypt","EGY","Bovine Meat","fabio" +"5836","Egypt","EGY","Mutton & Goat Meat","fabio" +"5837","Egypt","EGY","Pigmeat","fabio" +"5838","Egypt","EGY","Poultry Meat","fabio" +"5839","Egypt","EGY","Meat, Other","fabio" +"5840","Egypt","EGY","Offals, Edible","fabio" +"5841","Egypt","EGY","Fats, Animals, Raw","fabio" +"5842","Egypt","EGY","Hides and skins","fabio" +"5843","Egypt","EGY","Meat Meal","fabio" +"5844","Egypt","EGY","Pet food","fabio" +"5845","Egypt","EGY","Honey","fabio" +"5846","Egypt","EGY","Silk","fabio" +"5847","Egypt","EGY","Fish, Seafood","fabio" +"5848","Egypt","EGY","Wood fuel","fabio" +"5849","Egypt","EGY","Industrial roundwood, coniferous","fabio" +"5850","Egypt","EGY","Industrial roundwood, non-coniferous","fabio" +"5851","El Salvador","SLV","Rice (Milled Equivalent)","fabio" +"5852","El Salvador","SLV","Wheat and products","fabio" +"5853","El Salvador","SLV","Barley and products","fabio" +"5854","El Salvador","SLV","Maize and products","fabio" +"5855","El Salvador","SLV","Rye and products","fabio" +"5856","El Salvador","SLV","Oats","fabio" +"5857","El Salvador","SLV","Millet and products","fabio" +"5858","El Salvador","SLV","Sorghum and products","fabio" +"5859","El Salvador","SLV","Cereals, Other","fabio" +"5860","El Salvador","SLV","Potatoes and products","fabio" +"5861","El Salvador","SLV","Cassava and products","fabio" +"5862","El Salvador","SLV","Sweet potatoes","fabio" +"5863","El Salvador","SLV","Roots, Other","fabio" +"5864","El Salvador","SLV","Yams","fabio" +"5865","El Salvador","SLV","Sugar cane","fabio" +"5866","El Salvador","SLV","Sugar beet","fabio" +"5867","El Salvador","SLV","Beans","fabio" +"5868","El Salvador","SLV","Peas","fabio" +"5869","El Salvador","SLV","Pulses, Other and products","fabio" +"5870","El Salvador","SLV","Nuts and products","fabio" +"5871","El Salvador","SLV","Soyabeans","fabio" +"5872","El Salvador","SLV","Groundnuts (Shelled Eq)","fabio" +"5873","El Salvador","SLV","Sunflower seed","fabio" +"5874","El Salvador","SLV","Rape and Mustardseed","fabio" +"5875","El Salvador","SLV","Seed cotton","fabio" +"5876","El Salvador","SLV","Coconuts - Incl Copra","fabio" +"5877","El Salvador","SLV","Sesame seed","fabio" +"5878","El Salvador","SLV","Oil, palm fruit","fabio" +"5879","El Salvador","SLV","Olives (including preserved)","fabio" +"5880","El Salvador","SLV","Oilcrops, Other","fabio" +"5881","El Salvador","SLV","Tomatoes and products","fabio" +"5882","El Salvador","SLV","Onions","fabio" +"5883","El Salvador","SLV","Vegetables, Other","fabio" +"5884","El Salvador","SLV","Oranges, Mandarines","fabio" +"5885","El Salvador","SLV","Lemons, Limes and products","fabio" +"5886","El Salvador","SLV","Grapefruit and products","fabio" +"5887","El Salvador","SLV","Citrus, Other","fabio" +"5888","El Salvador","SLV","Bananas","fabio" +"5889","El Salvador","SLV","Plantains","fabio" +"5890","El Salvador","SLV","Apples and products","fabio" +"5891","El Salvador","SLV","Pineapples and products","fabio" +"5892","El Salvador","SLV","Dates","fabio" +"5893","El Salvador","SLV","Grapes and products (excl wine)","fabio" +"5894","El Salvador","SLV","Fruits, Other","fabio" +"5895","El Salvador","SLV","Coffee and products","fabio" +"5896","El Salvador","SLV","Cocoa Beans and products","fabio" +"5897","El Salvador","SLV","Tea (including mate)","fabio" +"5898","El Salvador","SLV","Hops","fabio" +"5899","El Salvador","SLV","Pepper","fabio" +"5900","El Salvador","SLV","Pimento","fabio" +"5901","El Salvador","SLV","Cloves","fabio" +"5902","El Salvador","SLV","Spices, Other","fabio" +"5903","El Salvador","SLV","Jute","fabio" +"5904","El Salvador","SLV","Jute-Like Fibres","fabio" +"5905","El Salvador","SLV","Soft-Fibres, Other","fabio" +"5906","El Salvador","SLV","Sisal","fabio" +"5907","El Salvador","SLV","Abaca","fabio" +"5908","El Salvador","SLV","Hard Fibres, Other","fabio" +"5909","El Salvador","SLV","Tobacco","fabio" +"5910","El Salvador","SLV","Rubber","fabio" +"5911","El Salvador","SLV","Fodder crops","fabio" +"5912","El Salvador","SLV","Grazing","fabio" +"5913","El Salvador","SLV","Cottonseed","fabio" +"5914","El Salvador","SLV","Palm kernels","fabio" +"5915","El Salvador","SLV","Sugar non-centrifugal","fabio" +"5916","El Salvador","SLV","Molasses","fabio" +"5917","El Salvador","SLV","Sugar, Refined Equiv","fabio" +"5918","El Salvador","SLV","Sweeteners, Other","fabio" +"5919","El Salvador","SLV","Soyabean Oil","fabio" +"5920","El Salvador","SLV","Groundnut Oil","fabio" +"5921","El Salvador","SLV","Sunflowerseed Oil","fabio" +"5922","El Salvador","SLV","Rape and Mustard Oil","fabio" +"5923","El Salvador","SLV","Cottonseed Oil","fabio" +"5924","El Salvador","SLV","Palmkernel Oil","fabio" +"5925","El Salvador","SLV","Palm Oil","fabio" +"5926","El Salvador","SLV","Coconut Oil","fabio" +"5927","El Salvador","SLV","Sesameseed Oil","fabio" +"5928","El Salvador","SLV","Olive Oil","fabio" +"5929","El Salvador","SLV","Ricebran Oil","fabio" +"5930","El Salvador","SLV","Maize Germ Oil","fabio" +"5931","El Salvador","SLV","Oilcrops Oil, Other","fabio" +"5932","El Salvador","SLV","Soyabean Cake","fabio" +"5933","El Salvador","SLV","Groundnut Cake","fabio" +"5934","El Salvador","SLV","Sunflowerseed Cake","fabio" +"5935","El Salvador","SLV","Rape and Mustard Cake","fabio" +"5936","El Salvador","SLV","Cottonseed Cake","fabio" +"5937","El Salvador","SLV","Palmkernel Cake","fabio" +"5938","El Salvador","SLV","Copra Cake","fabio" +"5939","El Salvador","SLV","Sesameseed Cake","fabio" +"5940","El Salvador","SLV","Oilseed Cakes, Other","fabio" +"5941","El Salvador","SLV","Wine","fabio" +"5942","El Salvador","SLV","Beer","fabio" +"5943","El Salvador","SLV","Beverages, Fermented","fabio" +"5944","El Salvador","SLV","Beverages, Alcoholic","fabio" +"5945","El Salvador","SLV","Alcohol, Non-Food","fabio" +"5946","El Salvador","SLV","Cotton lint","fabio" +"5947","El Salvador","SLV","Cattle","fabio" +"5948","El Salvador","SLV","Buffaloes","fabio" +"5949","El Salvador","SLV","Sheep","fabio" +"5950","El Salvador","SLV","Goats","fabio" +"5951","El Salvador","SLV","Pigs","fabio" +"5952","El Salvador","SLV","Poultry Birds","fabio" +"5953","El Salvador","SLV","Horses","fabio" +"5954","El Salvador","SLV","Asses","fabio" +"5955","El Salvador","SLV","Mules","fabio" +"5956","El Salvador","SLV","Camels","fabio" +"5957","El Salvador","SLV","Camelids, other","fabio" +"5958","El Salvador","SLV","Rabbits and hares","fabio" +"5959","El Salvador","SLV","Rodents, other","fabio" +"5960","El Salvador","SLV","Live animals, other","fabio" +"5961","El Salvador","SLV","Milk - Excluding Butter","fabio" +"5962","El Salvador","SLV","Butter, Ghee","fabio" +"5963","El Salvador","SLV","Eggs","fabio" +"5964","El Salvador","SLV","Wool (Clean Eq.)","fabio" +"5965","El Salvador","SLV","Bovine Meat","fabio" +"5966","El Salvador","SLV","Mutton & Goat Meat","fabio" +"5967","El Salvador","SLV","Pigmeat","fabio" +"5968","El Salvador","SLV","Poultry Meat","fabio" +"5969","El Salvador","SLV","Meat, Other","fabio" +"5970","El Salvador","SLV","Offals, Edible","fabio" +"5971","El Salvador","SLV","Fats, Animals, Raw","fabio" +"5972","El Salvador","SLV","Hides and skins","fabio" +"5973","El Salvador","SLV","Meat Meal","fabio" +"5974","El Salvador","SLV","Pet food","fabio" +"5975","El Salvador","SLV","Honey","fabio" +"5976","El Salvador","SLV","Silk","fabio" +"5977","El Salvador","SLV","Fish, Seafood","fabio" +"5978","El Salvador","SLV","Wood fuel","fabio" +"5979","El Salvador","SLV","Industrial roundwood, coniferous","fabio" +"5980","El Salvador","SLV","Industrial roundwood, non-coniferous","fabio" +"5981","Estonia","EST","Rice (Milled Equivalent)","fabio" +"5982","Estonia","EST","Wheat and products","fabio" +"5983","Estonia","EST","Barley and products","fabio" +"5984","Estonia","EST","Maize and products","fabio" +"5985","Estonia","EST","Rye and products","fabio" +"5986","Estonia","EST","Oats","fabio" +"5987","Estonia","EST","Millet and products","fabio" +"5988","Estonia","EST","Sorghum and products","fabio" +"5989","Estonia","EST","Cereals, Other","fabio" +"5990","Estonia","EST","Potatoes and products","fabio" +"5991","Estonia","EST","Cassava and products","fabio" +"5992","Estonia","EST","Sweet potatoes","fabio" +"5993","Estonia","EST","Roots, Other","fabio" +"5994","Estonia","EST","Yams","fabio" +"5995","Estonia","EST","Sugar cane","fabio" +"5996","Estonia","EST","Sugar beet","fabio" +"5997","Estonia","EST","Beans","fabio" +"5998","Estonia","EST","Peas","fabio" +"5999","Estonia","EST","Pulses, Other and products","fabio" +"6000","Estonia","EST","Nuts and products","fabio" +"6001","Estonia","EST","Soyabeans","fabio" +"6002","Estonia","EST","Groundnuts (Shelled Eq)","fabio" +"6003","Estonia","EST","Sunflower seed","fabio" +"6004","Estonia","EST","Rape and Mustardseed","fabio" +"6005","Estonia","EST","Seed cotton","fabio" +"6006","Estonia","EST","Coconuts - Incl Copra","fabio" +"6007","Estonia","EST","Sesame seed","fabio" +"6008","Estonia","EST","Oil, palm fruit","fabio" +"6009","Estonia","EST","Olives (including preserved)","fabio" +"6010","Estonia","EST","Oilcrops, Other","fabio" +"6011","Estonia","EST","Tomatoes and products","fabio" +"6012","Estonia","EST","Onions","fabio" +"6013","Estonia","EST","Vegetables, Other","fabio" +"6014","Estonia","EST","Oranges, Mandarines","fabio" +"6015","Estonia","EST","Lemons, Limes and products","fabio" +"6016","Estonia","EST","Grapefruit and products","fabio" +"6017","Estonia","EST","Citrus, Other","fabio" +"6018","Estonia","EST","Bananas","fabio" +"6019","Estonia","EST","Plantains","fabio" +"6020","Estonia","EST","Apples and products","fabio" +"6021","Estonia","EST","Pineapples and products","fabio" +"6022","Estonia","EST","Dates","fabio" +"6023","Estonia","EST","Grapes and products (excl wine)","fabio" +"6024","Estonia","EST","Fruits, Other","fabio" +"6025","Estonia","EST","Coffee and products","fabio" +"6026","Estonia","EST","Cocoa Beans and products","fabio" +"6027","Estonia","EST","Tea (including mate)","fabio" +"6028","Estonia","EST","Hops","fabio" +"6029","Estonia","EST","Pepper","fabio" +"6030","Estonia","EST","Pimento","fabio" +"6031","Estonia","EST","Cloves","fabio" +"6032","Estonia","EST","Spices, Other","fabio" +"6033","Estonia","EST","Jute","fabio" +"6034","Estonia","EST","Jute-Like Fibres","fabio" +"6035","Estonia","EST","Soft-Fibres, Other","fabio" +"6036","Estonia","EST","Sisal","fabio" +"6037","Estonia","EST","Abaca","fabio" +"6038","Estonia","EST","Hard Fibres, Other","fabio" +"6039","Estonia","EST","Tobacco","fabio" +"6040","Estonia","EST","Rubber","fabio" +"6041","Estonia","EST","Fodder crops","fabio" +"6042","Estonia","EST","Grazing","fabio" +"6043","Estonia","EST","Cottonseed","fabio" +"6044","Estonia","EST","Palm kernels","fabio" +"6045","Estonia","EST","Sugar non-centrifugal","fabio" +"6046","Estonia","EST","Molasses","fabio" +"6047","Estonia","EST","Sugar, Refined Equiv","fabio" +"6048","Estonia","EST","Sweeteners, Other","fabio" +"6049","Estonia","EST","Soyabean Oil","fabio" +"6050","Estonia","EST","Groundnut Oil","fabio" +"6051","Estonia","EST","Sunflowerseed Oil","fabio" +"6052","Estonia","EST","Rape and Mustard Oil","fabio" +"6053","Estonia","EST","Cottonseed Oil","fabio" +"6054","Estonia","EST","Palmkernel Oil","fabio" +"6055","Estonia","EST","Palm Oil","fabio" +"6056","Estonia","EST","Coconut Oil","fabio" +"6057","Estonia","EST","Sesameseed Oil","fabio" +"6058","Estonia","EST","Olive Oil","fabio" +"6059","Estonia","EST","Ricebran Oil","fabio" +"6060","Estonia","EST","Maize Germ Oil","fabio" +"6061","Estonia","EST","Oilcrops Oil, Other","fabio" +"6062","Estonia","EST","Soyabean Cake","fabio" +"6063","Estonia","EST","Groundnut Cake","fabio" +"6064","Estonia","EST","Sunflowerseed Cake","fabio" +"6065","Estonia","EST","Rape and Mustard Cake","fabio" +"6066","Estonia","EST","Cottonseed Cake","fabio" +"6067","Estonia","EST","Palmkernel Cake","fabio" +"6068","Estonia","EST","Copra Cake","fabio" +"6069","Estonia","EST","Sesameseed Cake","fabio" +"6070","Estonia","EST","Oilseed Cakes, Other","fabio" +"6071","Estonia","EST","Wine","fabio" +"6072","Estonia","EST","Beer","fabio" +"6073","Estonia","EST","Beverages, Fermented","fabio" +"6074","Estonia","EST","Beverages, Alcoholic","fabio" +"6075","Estonia","EST","Alcohol, Non-Food","fabio" +"6076","Estonia","EST","Cotton lint","fabio" +"6077","Estonia","EST","Cattle","fabio" +"6078","Estonia","EST","Buffaloes","fabio" +"6079","Estonia","EST","Sheep","fabio" +"6080","Estonia","EST","Goats","fabio" +"6081","Estonia","EST","Pigs","fabio" +"6082","Estonia","EST","Poultry Birds","fabio" +"6083","Estonia","EST","Horses","fabio" +"6084","Estonia","EST","Asses","fabio" +"6085","Estonia","EST","Mules","fabio" +"6086","Estonia","EST","Camels","fabio" +"6087","Estonia","EST","Camelids, other","fabio" +"6088","Estonia","EST","Rabbits and hares","fabio" +"6089","Estonia","EST","Rodents, other","fabio" +"6090","Estonia","EST","Live animals, other","fabio" +"6091","Estonia","EST","Milk - Excluding Butter","fabio" +"6092","Estonia","EST","Butter, Ghee","fabio" +"6093","Estonia","EST","Eggs","fabio" +"6094","Estonia","EST","Wool (Clean Eq.)","fabio" +"6095","Estonia","EST","Bovine Meat","fabio" +"6096","Estonia","EST","Mutton & Goat Meat","fabio" +"6097","Estonia","EST","Pigmeat","fabio" +"6098","Estonia","EST","Poultry Meat","fabio" +"6099","Estonia","EST","Meat, Other","fabio" +"6100","Estonia","EST","Offals, Edible","fabio" +"6101","Estonia","EST","Fats, Animals, Raw","fabio" +"6102","Estonia","EST","Hides and skins","fabio" +"6103","Estonia","EST","Meat Meal","fabio" +"6104","Estonia","EST","Pet food","fabio" +"6105","Estonia","EST","Honey","fabio" +"6106","Estonia","EST","Silk","fabio" +"6107","Estonia","EST","Fish, Seafood","fabio" +"6108","Estonia","EST","Wood fuel","fabio" +"6109","Estonia","EST","Industrial roundwood, coniferous","fabio" +"6110","Estonia","EST","Industrial roundwood, non-coniferous","fabio" +"6111","Fiji","FJI","Rice (Milled Equivalent)","fabio" +"6112","Fiji","FJI","Wheat and products","fabio" +"6113","Fiji","FJI","Barley and products","fabio" +"6114","Fiji","FJI","Maize and products","fabio" +"6115","Fiji","FJI","Rye and products","fabio" +"6116","Fiji","FJI","Oats","fabio" +"6117","Fiji","FJI","Millet and products","fabio" +"6118","Fiji","FJI","Sorghum and products","fabio" +"6119","Fiji","FJI","Cereals, Other","fabio" +"6120","Fiji","FJI","Potatoes and products","fabio" +"6121","Fiji","FJI","Cassava and products","fabio" +"6122","Fiji","FJI","Sweet potatoes","fabio" +"6123","Fiji","FJI","Roots, Other","fabio" +"6124","Fiji","FJI","Yams","fabio" +"6125","Fiji","FJI","Sugar cane","fabio" +"6126","Fiji","FJI","Sugar beet","fabio" +"6127","Fiji","FJI","Beans","fabio" +"6128","Fiji","FJI","Peas","fabio" +"6129","Fiji","FJI","Pulses, Other and products","fabio" +"6130","Fiji","FJI","Nuts and products","fabio" +"6131","Fiji","FJI","Soyabeans","fabio" +"6132","Fiji","FJI","Groundnuts (Shelled Eq)","fabio" +"6133","Fiji","FJI","Sunflower seed","fabio" +"6134","Fiji","FJI","Rape and Mustardseed","fabio" +"6135","Fiji","FJI","Seed cotton","fabio" +"6136","Fiji","FJI","Coconuts - Incl Copra","fabio" +"6137","Fiji","FJI","Sesame seed","fabio" +"6138","Fiji","FJI","Oil, palm fruit","fabio" +"6139","Fiji","FJI","Olives (including preserved)","fabio" +"6140","Fiji","FJI","Oilcrops, Other","fabio" +"6141","Fiji","FJI","Tomatoes and products","fabio" +"6142","Fiji","FJI","Onions","fabio" +"6143","Fiji","FJI","Vegetables, Other","fabio" +"6144","Fiji","FJI","Oranges, Mandarines","fabio" +"6145","Fiji","FJI","Lemons, Limes and products","fabio" +"6146","Fiji","FJI","Grapefruit and products","fabio" +"6147","Fiji","FJI","Citrus, Other","fabio" +"6148","Fiji","FJI","Bananas","fabio" +"6149","Fiji","FJI","Plantains","fabio" +"6150","Fiji","FJI","Apples and products","fabio" +"6151","Fiji","FJI","Pineapples and products","fabio" +"6152","Fiji","FJI","Dates","fabio" +"6153","Fiji","FJI","Grapes and products (excl wine)","fabio" +"6154","Fiji","FJI","Fruits, Other","fabio" +"6155","Fiji","FJI","Coffee and products","fabio" +"6156","Fiji","FJI","Cocoa Beans and products","fabio" +"6157","Fiji","FJI","Tea (including mate)","fabio" +"6158","Fiji","FJI","Hops","fabio" +"6159","Fiji","FJI","Pepper","fabio" +"6160","Fiji","FJI","Pimento","fabio" +"6161","Fiji","FJI","Cloves","fabio" +"6162","Fiji","FJI","Spices, Other","fabio" +"6163","Fiji","FJI","Jute","fabio" +"6164","Fiji","FJI","Jute-Like Fibres","fabio" +"6165","Fiji","FJI","Soft-Fibres, Other","fabio" +"6166","Fiji","FJI","Sisal","fabio" +"6167","Fiji","FJI","Abaca","fabio" +"6168","Fiji","FJI","Hard Fibres, Other","fabio" +"6169","Fiji","FJI","Tobacco","fabio" +"6170","Fiji","FJI","Rubber","fabio" +"6171","Fiji","FJI","Fodder crops","fabio" +"6172","Fiji","FJI","Grazing","fabio" +"6173","Fiji","FJI","Cottonseed","fabio" +"6174","Fiji","FJI","Palm kernels","fabio" +"6175","Fiji","FJI","Sugar non-centrifugal","fabio" +"6176","Fiji","FJI","Molasses","fabio" +"6177","Fiji","FJI","Sugar, Refined Equiv","fabio" +"6178","Fiji","FJI","Sweeteners, Other","fabio" +"6179","Fiji","FJI","Soyabean Oil","fabio" +"6180","Fiji","FJI","Groundnut Oil","fabio" +"6181","Fiji","FJI","Sunflowerseed Oil","fabio" +"6182","Fiji","FJI","Rape and Mustard Oil","fabio" +"6183","Fiji","FJI","Cottonseed Oil","fabio" +"6184","Fiji","FJI","Palmkernel Oil","fabio" +"6185","Fiji","FJI","Palm Oil","fabio" +"6186","Fiji","FJI","Coconut Oil","fabio" +"6187","Fiji","FJI","Sesameseed Oil","fabio" +"6188","Fiji","FJI","Olive Oil","fabio" +"6189","Fiji","FJI","Ricebran Oil","fabio" +"6190","Fiji","FJI","Maize Germ Oil","fabio" +"6191","Fiji","FJI","Oilcrops Oil, Other","fabio" +"6192","Fiji","FJI","Soyabean Cake","fabio" +"6193","Fiji","FJI","Groundnut Cake","fabio" +"6194","Fiji","FJI","Sunflowerseed Cake","fabio" +"6195","Fiji","FJI","Rape and Mustard Cake","fabio" +"6196","Fiji","FJI","Cottonseed Cake","fabio" +"6197","Fiji","FJI","Palmkernel Cake","fabio" +"6198","Fiji","FJI","Copra Cake","fabio" +"6199","Fiji","FJI","Sesameseed Cake","fabio" +"6200","Fiji","FJI","Oilseed Cakes, Other","fabio" +"6201","Fiji","FJI","Wine","fabio" +"6202","Fiji","FJI","Beer","fabio" +"6203","Fiji","FJI","Beverages, Fermented","fabio" +"6204","Fiji","FJI","Beverages, Alcoholic","fabio" +"6205","Fiji","FJI","Alcohol, Non-Food","fabio" +"6206","Fiji","FJI","Cotton lint","fabio" +"6207","Fiji","FJI","Cattle","fabio" +"6208","Fiji","FJI","Buffaloes","fabio" +"6209","Fiji","FJI","Sheep","fabio" +"6210","Fiji","FJI","Goats","fabio" +"6211","Fiji","FJI","Pigs","fabio" +"6212","Fiji","FJI","Poultry Birds","fabio" +"6213","Fiji","FJI","Horses","fabio" +"6214","Fiji","FJI","Asses","fabio" +"6215","Fiji","FJI","Mules","fabio" +"6216","Fiji","FJI","Camels","fabio" +"6217","Fiji","FJI","Camelids, other","fabio" +"6218","Fiji","FJI","Rabbits and hares","fabio" +"6219","Fiji","FJI","Rodents, other","fabio" +"6220","Fiji","FJI","Live animals, other","fabio" +"6221","Fiji","FJI","Milk - Excluding Butter","fabio" +"6222","Fiji","FJI","Butter, Ghee","fabio" +"6223","Fiji","FJI","Eggs","fabio" +"6224","Fiji","FJI","Wool (Clean Eq.)","fabio" +"6225","Fiji","FJI","Bovine Meat","fabio" +"6226","Fiji","FJI","Mutton & Goat Meat","fabio" +"6227","Fiji","FJI","Pigmeat","fabio" +"6228","Fiji","FJI","Poultry Meat","fabio" +"6229","Fiji","FJI","Meat, Other","fabio" +"6230","Fiji","FJI","Offals, Edible","fabio" +"6231","Fiji","FJI","Fats, Animals, Raw","fabio" +"6232","Fiji","FJI","Hides and skins","fabio" +"6233","Fiji","FJI","Meat Meal","fabio" +"6234","Fiji","FJI","Pet food","fabio" +"6235","Fiji","FJI","Honey","fabio" +"6236","Fiji","FJI","Silk","fabio" +"6237","Fiji","FJI","Fish, Seafood","fabio" +"6238","Fiji","FJI","Wood fuel","fabio" +"6239","Fiji","FJI","Industrial roundwood, coniferous","fabio" +"6240","Fiji","FJI","Industrial roundwood, non-coniferous","fabio" +"6241","Finland","FIN","Rice (Milled Equivalent)","fabio" +"6242","Finland","FIN","Wheat and products","fabio" +"6243","Finland","FIN","Barley and products","fabio" +"6244","Finland","FIN","Maize and products","fabio" +"6245","Finland","FIN","Rye and products","fabio" +"6246","Finland","FIN","Oats","fabio" +"6247","Finland","FIN","Millet and products","fabio" +"6248","Finland","FIN","Sorghum and products","fabio" +"6249","Finland","FIN","Cereals, Other","fabio" +"6250","Finland","FIN","Potatoes and products","fabio" +"6251","Finland","FIN","Cassava and products","fabio" +"6252","Finland","FIN","Sweet potatoes","fabio" +"6253","Finland","FIN","Roots, Other","fabio" +"6254","Finland","FIN","Yams","fabio" +"6255","Finland","FIN","Sugar cane","fabio" +"6256","Finland","FIN","Sugar beet","fabio" +"6257","Finland","FIN","Beans","fabio" +"6258","Finland","FIN","Peas","fabio" +"6259","Finland","FIN","Pulses, Other and products","fabio" +"6260","Finland","FIN","Nuts and products","fabio" +"6261","Finland","FIN","Soyabeans","fabio" +"6262","Finland","FIN","Groundnuts (Shelled Eq)","fabio" +"6263","Finland","FIN","Sunflower seed","fabio" +"6264","Finland","FIN","Rape and Mustardseed","fabio" +"6265","Finland","FIN","Seed cotton","fabio" +"6266","Finland","FIN","Coconuts - Incl Copra","fabio" +"6267","Finland","FIN","Sesame seed","fabio" +"6268","Finland","FIN","Oil, palm fruit","fabio" +"6269","Finland","FIN","Olives (including preserved)","fabio" +"6270","Finland","FIN","Oilcrops, Other","fabio" +"6271","Finland","FIN","Tomatoes and products","fabio" +"6272","Finland","FIN","Onions","fabio" +"6273","Finland","FIN","Vegetables, Other","fabio" +"6274","Finland","FIN","Oranges, Mandarines","fabio" +"6275","Finland","FIN","Lemons, Limes and products","fabio" +"6276","Finland","FIN","Grapefruit and products","fabio" +"6277","Finland","FIN","Citrus, Other","fabio" +"6278","Finland","FIN","Bananas","fabio" +"6279","Finland","FIN","Plantains","fabio" +"6280","Finland","FIN","Apples and products","fabio" +"6281","Finland","FIN","Pineapples and products","fabio" +"6282","Finland","FIN","Dates","fabio" +"6283","Finland","FIN","Grapes and products (excl wine)","fabio" +"6284","Finland","FIN","Fruits, Other","fabio" +"6285","Finland","FIN","Coffee and products","fabio" +"6286","Finland","FIN","Cocoa Beans and products","fabio" +"6287","Finland","FIN","Tea (including mate)","fabio" +"6288","Finland","FIN","Hops","fabio" +"6289","Finland","FIN","Pepper","fabio" +"6290","Finland","FIN","Pimento","fabio" +"6291","Finland","FIN","Cloves","fabio" +"6292","Finland","FIN","Spices, Other","fabio" +"6293","Finland","FIN","Jute","fabio" +"6294","Finland","FIN","Jute-Like Fibres","fabio" +"6295","Finland","FIN","Soft-Fibres, Other","fabio" +"6296","Finland","FIN","Sisal","fabio" +"6297","Finland","FIN","Abaca","fabio" +"6298","Finland","FIN","Hard Fibres, Other","fabio" +"6299","Finland","FIN","Tobacco","fabio" +"6300","Finland","FIN","Rubber","fabio" +"6301","Finland","FIN","Fodder crops","fabio" +"6302","Finland","FIN","Grazing","fabio" +"6303","Finland","FIN","Cottonseed","fabio" +"6304","Finland","FIN","Palm kernels","fabio" +"6305","Finland","FIN","Sugar non-centrifugal","fabio" +"6306","Finland","FIN","Molasses","fabio" +"6307","Finland","FIN","Sugar, Refined Equiv","fabio" +"6308","Finland","FIN","Sweeteners, Other","fabio" +"6309","Finland","FIN","Soyabean Oil","fabio" +"6310","Finland","FIN","Groundnut Oil","fabio" +"6311","Finland","FIN","Sunflowerseed Oil","fabio" +"6312","Finland","FIN","Rape and Mustard Oil","fabio" +"6313","Finland","FIN","Cottonseed Oil","fabio" +"6314","Finland","FIN","Palmkernel Oil","fabio" +"6315","Finland","FIN","Palm Oil","fabio" +"6316","Finland","FIN","Coconut Oil","fabio" +"6317","Finland","FIN","Sesameseed Oil","fabio" +"6318","Finland","FIN","Olive Oil","fabio" +"6319","Finland","FIN","Ricebran Oil","fabio" +"6320","Finland","FIN","Maize Germ Oil","fabio" +"6321","Finland","FIN","Oilcrops Oil, Other","fabio" +"6322","Finland","FIN","Soyabean Cake","fabio" +"6323","Finland","FIN","Groundnut Cake","fabio" +"6324","Finland","FIN","Sunflowerseed Cake","fabio" +"6325","Finland","FIN","Rape and Mustard Cake","fabio" +"6326","Finland","FIN","Cottonseed Cake","fabio" +"6327","Finland","FIN","Palmkernel Cake","fabio" +"6328","Finland","FIN","Copra Cake","fabio" +"6329","Finland","FIN","Sesameseed Cake","fabio" +"6330","Finland","FIN","Oilseed Cakes, Other","fabio" +"6331","Finland","FIN","Wine","fabio" +"6332","Finland","FIN","Beer","fabio" +"6333","Finland","FIN","Beverages, Fermented","fabio" +"6334","Finland","FIN","Beverages, Alcoholic","fabio" +"6335","Finland","FIN","Alcohol, Non-Food","fabio" +"6336","Finland","FIN","Cotton lint","fabio" +"6337","Finland","FIN","Cattle","fabio" +"6338","Finland","FIN","Buffaloes","fabio" +"6339","Finland","FIN","Sheep","fabio" +"6340","Finland","FIN","Goats","fabio" +"6341","Finland","FIN","Pigs","fabio" +"6342","Finland","FIN","Poultry Birds","fabio" +"6343","Finland","FIN","Horses","fabio" +"6344","Finland","FIN","Asses","fabio" +"6345","Finland","FIN","Mules","fabio" +"6346","Finland","FIN","Camels","fabio" +"6347","Finland","FIN","Camelids, other","fabio" +"6348","Finland","FIN","Rabbits and hares","fabio" +"6349","Finland","FIN","Rodents, other","fabio" +"6350","Finland","FIN","Live animals, other","fabio" +"6351","Finland","FIN","Milk - Excluding Butter","fabio" +"6352","Finland","FIN","Butter, Ghee","fabio" +"6353","Finland","FIN","Eggs","fabio" +"6354","Finland","FIN","Wool (Clean Eq.)","fabio" +"6355","Finland","FIN","Bovine Meat","fabio" +"6356","Finland","FIN","Mutton & Goat Meat","fabio" +"6357","Finland","FIN","Pigmeat","fabio" +"6358","Finland","FIN","Poultry Meat","fabio" +"6359","Finland","FIN","Meat, Other","fabio" +"6360","Finland","FIN","Offals, Edible","fabio" +"6361","Finland","FIN","Fats, Animals, Raw","fabio" +"6362","Finland","FIN","Hides and skins","fabio" +"6363","Finland","FIN","Meat Meal","fabio" +"6364","Finland","FIN","Pet food","fabio" +"6365","Finland","FIN","Honey","fabio" +"6366","Finland","FIN","Silk","fabio" +"6367","Finland","FIN","Fish, Seafood","fabio" +"6368","Finland","FIN","Wood fuel","fabio" +"6369","Finland","FIN","Industrial roundwood, coniferous","fabio" +"6370","Finland","FIN","Industrial roundwood, non-coniferous","fabio" +"6371","France","FRA","Rice (Milled Equivalent)","fabio" +"6372","France","FRA","Wheat and products","fabio" +"6373","France","FRA","Barley and products","fabio" +"6374","France","FRA","Maize and products","fabio" +"6375","France","FRA","Rye and products","fabio" +"6376","France","FRA","Oats","fabio" +"6377","France","FRA","Millet and products","fabio" +"6378","France","FRA","Sorghum and products","fabio" +"6379","France","FRA","Cereals, Other","fabio" +"6380","France","FRA","Potatoes and products","fabio" +"6381","France","FRA","Cassava and products","fabio" +"6382","France","FRA","Sweet potatoes","fabio" +"6383","France","FRA","Roots, Other","fabio" +"6384","France","FRA","Yams","fabio" +"6385","France","FRA","Sugar cane","fabio" +"6386","France","FRA","Sugar beet","fabio" +"6387","France","FRA","Beans","fabio" +"6388","France","FRA","Peas","fabio" +"6389","France","FRA","Pulses, Other and products","fabio" +"6390","France","FRA","Nuts and products","fabio" +"6391","France","FRA","Soyabeans","fabio" +"6392","France","FRA","Groundnuts (Shelled Eq)","fabio" +"6393","France","FRA","Sunflower seed","fabio" +"6394","France","FRA","Rape and Mustardseed","fabio" +"6395","France","FRA","Seed cotton","fabio" +"6396","France","FRA","Coconuts - Incl Copra","fabio" +"6397","France","FRA","Sesame seed","fabio" +"6398","France","FRA","Oil, palm fruit","fabio" +"6399","France","FRA","Olives (including preserved)","fabio" +"6400","France","FRA","Oilcrops, Other","fabio" +"6401","France","FRA","Tomatoes and products","fabio" +"6402","France","FRA","Onions","fabio" +"6403","France","FRA","Vegetables, Other","fabio" +"6404","France","FRA","Oranges, Mandarines","fabio" +"6405","France","FRA","Lemons, Limes and products","fabio" +"6406","France","FRA","Grapefruit and products","fabio" +"6407","France","FRA","Citrus, Other","fabio" +"6408","France","FRA","Bananas","fabio" +"6409","France","FRA","Plantains","fabio" +"6410","France","FRA","Apples and products","fabio" +"6411","France","FRA","Pineapples and products","fabio" +"6412","France","FRA","Dates","fabio" +"6413","France","FRA","Grapes and products (excl wine)","fabio" +"6414","France","FRA","Fruits, Other","fabio" +"6415","France","FRA","Coffee and products","fabio" +"6416","France","FRA","Cocoa Beans and products","fabio" +"6417","France","FRA","Tea (including mate)","fabio" +"6418","France","FRA","Hops","fabio" +"6419","France","FRA","Pepper","fabio" +"6420","France","FRA","Pimento","fabio" +"6421","France","FRA","Cloves","fabio" +"6422","France","FRA","Spices, Other","fabio" +"6423","France","FRA","Jute","fabio" +"6424","France","FRA","Jute-Like Fibres","fabio" +"6425","France","FRA","Soft-Fibres, Other","fabio" +"6426","France","FRA","Sisal","fabio" +"6427","France","FRA","Abaca","fabio" +"6428","France","FRA","Hard Fibres, Other","fabio" +"6429","France","FRA","Tobacco","fabio" +"6430","France","FRA","Rubber","fabio" +"6431","France","FRA","Fodder crops","fabio" +"6432","France","FRA","Grazing","fabio" +"6433","France","FRA","Cottonseed","fabio" +"6434","France","FRA","Palm kernels","fabio" +"6435","France","FRA","Sugar non-centrifugal","fabio" +"6436","France","FRA","Molasses","fabio" +"6437","France","FRA","Sugar, Refined Equiv","fabio" +"6438","France","FRA","Sweeteners, Other","fabio" +"6439","France","FRA","Soyabean Oil","fabio" +"6440","France","FRA","Groundnut Oil","fabio" +"6441","France","FRA","Sunflowerseed Oil","fabio" +"6442","France","FRA","Rape and Mustard Oil","fabio" +"6443","France","FRA","Cottonseed Oil","fabio" +"6444","France","FRA","Palmkernel Oil","fabio" +"6445","France","FRA","Palm Oil","fabio" +"6446","France","FRA","Coconut Oil","fabio" +"6447","France","FRA","Sesameseed Oil","fabio" +"6448","France","FRA","Olive Oil","fabio" +"6449","France","FRA","Ricebran Oil","fabio" +"6450","France","FRA","Maize Germ Oil","fabio" +"6451","France","FRA","Oilcrops Oil, Other","fabio" +"6452","France","FRA","Soyabean Cake","fabio" +"6453","France","FRA","Groundnut Cake","fabio" +"6454","France","FRA","Sunflowerseed Cake","fabio" +"6455","France","FRA","Rape and Mustard Cake","fabio" +"6456","France","FRA","Cottonseed Cake","fabio" +"6457","France","FRA","Palmkernel Cake","fabio" +"6458","France","FRA","Copra Cake","fabio" +"6459","France","FRA","Sesameseed Cake","fabio" +"6460","France","FRA","Oilseed Cakes, Other","fabio" +"6461","France","FRA","Wine","fabio" +"6462","France","FRA","Beer","fabio" +"6463","France","FRA","Beverages, Fermented","fabio" +"6464","France","FRA","Beverages, Alcoholic","fabio" +"6465","France","FRA","Alcohol, Non-Food","fabio" +"6466","France","FRA","Cotton lint","fabio" +"6467","France","FRA","Cattle","fabio" +"6468","France","FRA","Buffaloes","fabio" +"6469","France","FRA","Sheep","fabio" +"6470","France","FRA","Goats","fabio" +"6471","France","FRA","Pigs","fabio" +"6472","France","FRA","Poultry Birds","fabio" +"6473","France","FRA","Horses","fabio" +"6474","France","FRA","Asses","fabio" +"6475","France","FRA","Mules","fabio" +"6476","France","FRA","Camels","fabio" +"6477","France","FRA","Camelids, other","fabio" +"6478","France","FRA","Rabbits and hares","fabio" +"6479","France","FRA","Rodents, other","fabio" +"6480","France","FRA","Live animals, other","fabio" +"6481","France","FRA","Milk - Excluding Butter","fabio" +"6482","France","FRA","Butter, Ghee","fabio" +"6483","France","FRA","Eggs","fabio" +"6484","France","FRA","Wool (Clean Eq.)","fabio" +"6485","France","FRA","Bovine Meat","fabio" +"6486","France","FRA","Mutton & Goat Meat","fabio" +"6487","France","FRA","Pigmeat","fabio" +"6488","France","FRA","Poultry Meat","fabio" +"6489","France","FRA","Meat, Other","fabio" +"6490","France","FRA","Offals, Edible","fabio" +"6491","France","FRA","Fats, Animals, Raw","fabio" +"6492","France","FRA","Hides and skins","fabio" +"6493","France","FRA","Meat Meal","fabio" +"6494","France","FRA","Pet food","fabio" +"6495","France","FRA","Honey","fabio" +"6496","France","FRA","Silk","fabio" +"6497","France","FRA","Fish, Seafood","fabio" +"6498","France","FRA","Wood fuel","fabio" +"6499","France","FRA","Industrial roundwood, coniferous","fabio" +"6500","France","FRA","Industrial roundwood, non-coniferous","fabio" +"6501","French Polynesia","PYF","Rice (Milled Equivalent)","fabio" +"6502","French Polynesia","PYF","Wheat and products","fabio" +"6503","French Polynesia","PYF","Barley and products","fabio" +"6504","French Polynesia","PYF","Maize and products","fabio" +"6505","French Polynesia","PYF","Rye and products","fabio" +"6506","French Polynesia","PYF","Oats","fabio" +"6507","French Polynesia","PYF","Millet and products","fabio" +"6508","French Polynesia","PYF","Sorghum and products","fabio" +"6509","French Polynesia","PYF","Cereals, Other","fabio" +"6510","French Polynesia","PYF","Potatoes and products","fabio" +"6511","French Polynesia","PYF","Cassava and products","fabio" +"6512","French Polynesia","PYF","Sweet potatoes","fabio" +"6513","French Polynesia","PYF","Roots, Other","fabio" +"6514","French Polynesia","PYF","Yams","fabio" +"6515","French Polynesia","PYF","Sugar cane","fabio" +"6516","French Polynesia","PYF","Sugar beet","fabio" +"6517","French Polynesia","PYF","Beans","fabio" +"6518","French Polynesia","PYF","Peas","fabio" +"6519","French Polynesia","PYF","Pulses, Other and products","fabio" +"6520","French Polynesia","PYF","Nuts and products","fabio" +"6521","French Polynesia","PYF","Soyabeans","fabio" +"6522","French Polynesia","PYF","Groundnuts (Shelled Eq)","fabio" +"6523","French Polynesia","PYF","Sunflower seed","fabio" +"6524","French Polynesia","PYF","Rape and Mustardseed","fabio" +"6525","French Polynesia","PYF","Seed cotton","fabio" +"6526","French Polynesia","PYF","Coconuts - Incl Copra","fabio" +"6527","French Polynesia","PYF","Sesame seed","fabio" +"6528","French Polynesia","PYF","Oil, palm fruit","fabio" +"6529","French Polynesia","PYF","Olives (including preserved)","fabio" +"6530","French Polynesia","PYF","Oilcrops, Other","fabio" +"6531","French Polynesia","PYF","Tomatoes and products","fabio" +"6532","French Polynesia","PYF","Onions","fabio" +"6533","French Polynesia","PYF","Vegetables, Other","fabio" +"6534","French Polynesia","PYF","Oranges, Mandarines","fabio" +"6535","French Polynesia","PYF","Lemons, Limes and products","fabio" +"6536","French Polynesia","PYF","Grapefruit and products","fabio" +"6537","French Polynesia","PYF","Citrus, Other","fabio" +"6538","French Polynesia","PYF","Bananas","fabio" +"6539","French Polynesia","PYF","Plantains","fabio" +"6540","French Polynesia","PYF","Apples and products","fabio" +"6541","French Polynesia","PYF","Pineapples and products","fabio" +"6542","French Polynesia","PYF","Dates","fabio" +"6543","French Polynesia","PYF","Grapes and products (excl wine)","fabio" +"6544","French Polynesia","PYF","Fruits, Other","fabio" +"6545","French Polynesia","PYF","Coffee and products","fabio" +"6546","French Polynesia","PYF","Cocoa Beans and products","fabio" +"6547","French Polynesia","PYF","Tea (including mate)","fabio" +"6548","French Polynesia","PYF","Hops","fabio" +"6549","French Polynesia","PYF","Pepper","fabio" +"6550","French Polynesia","PYF","Pimento","fabio" +"6551","French Polynesia","PYF","Cloves","fabio" +"6552","French Polynesia","PYF","Spices, Other","fabio" +"6553","French Polynesia","PYF","Jute","fabio" +"6554","French Polynesia","PYF","Jute-Like Fibres","fabio" +"6555","French Polynesia","PYF","Soft-Fibres, Other","fabio" +"6556","French Polynesia","PYF","Sisal","fabio" +"6557","French Polynesia","PYF","Abaca","fabio" +"6558","French Polynesia","PYF","Hard Fibres, Other","fabio" +"6559","French Polynesia","PYF","Tobacco","fabio" +"6560","French Polynesia","PYF","Rubber","fabio" +"6561","French Polynesia","PYF","Fodder crops","fabio" +"6562","French Polynesia","PYF","Grazing","fabio" +"6563","French Polynesia","PYF","Cottonseed","fabio" +"6564","French Polynesia","PYF","Palm kernels","fabio" +"6565","French Polynesia","PYF","Sugar non-centrifugal","fabio" +"6566","French Polynesia","PYF","Molasses","fabio" +"6567","French Polynesia","PYF","Sugar, Refined Equiv","fabio" +"6568","French Polynesia","PYF","Sweeteners, Other","fabio" +"6569","French Polynesia","PYF","Soyabean Oil","fabio" +"6570","French Polynesia","PYF","Groundnut Oil","fabio" +"6571","French Polynesia","PYF","Sunflowerseed Oil","fabio" +"6572","French Polynesia","PYF","Rape and Mustard Oil","fabio" +"6573","French Polynesia","PYF","Cottonseed Oil","fabio" +"6574","French Polynesia","PYF","Palmkernel Oil","fabio" +"6575","French Polynesia","PYF","Palm Oil","fabio" +"6576","French Polynesia","PYF","Coconut Oil","fabio" +"6577","French Polynesia","PYF","Sesameseed Oil","fabio" +"6578","French Polynesia","PYF","Olive Oil","fabio" +"6579","French Polynesia","PYF","Ricebran Oil","fabio" +"6580","French Polynesia","PYF","Maize Germ Oil","fabio" +"6581","French Polynesia","PYF","Oilcrops Oil, Other","fabio" +"6582","French Polynesia","PYF","Soyabean Cake","fabio" +"6583","French Polynesia","PYF","Groundnut Cake","fabio" +"6584","French Polynesia","PYF","Sunflowerseed Cake","fabio" +"6585","French Polynesia","PYF","Rape and Mustard Cake","fabio" +"6586","French Polynesia","PYF","Cottonseed Cake","fabio" +"6587","French Polynesia","PYF","Palmkernel Cake","fabio" +"6588","French Polynesia","PYF","Copra Cake","fabio" +"6589","French Polynesia","PYF","Sesameseed Cake","fabio" +"6590","French Polynesia","PYF","Oilseed Cakes, Other","fabio" +"6591","French Polynesia","PYF","Wine","fabio" +"6592","French Polynesia","PYF","Beer","fabio" +"6593","French Polynesia","PYF","Beverages, Fermented","fabio" +"6594","French Polynesia","PYF","Beverages, Alcoholic","fabio" +"6595","French Polynesia","PYF","Alcohol, Non-Food","fabio" +"6596","French Polynesia","PYF","Cotton lint","fabio" +"6597","French Polynesia","PYF","Cattle","fabio" +"6598","French Polynesia","PYF","Buffaloes","fabio" +"6599","French Polynesia","PYF","Sheep","fabio" +"6600","French Polynesia","PYF","Goats","fabio" +"6601","French Polynesia","PYF","Pigs","fabio" +"6602","French Polynesia","PYF","Poultry Birds","fabio" +"6603","French Polynesia","PYF","Horses","fabio" +"6604","French Polynesia","PYF","Asses","fabio" +"6605","French Polynesia","PYF","Mules","fabio" +"6606","French Polynesia","PYF","Camels","fabio" +"6607","French Polynesia","PYF","Camelids, other","fabio" +"6608","French Polynesia","PYF","Rabbits and hares","fabio" +"6609","French Polynesia","PYF","Rodents, other","fabio" +"6610","French Polynesia","PYF","Live animals, other","fabio" +"6611","French Polynesia","PYF","Milk - Excluding Butter","fabio" +"6612","French Polynesia","PYF","Butter, Ghee","fabio" +"6613","French Polynesia","PYF","Eggs","fabio" +"6614","French Polynesia","PYF","Wool (Clean Eq.)","fabio" +"6615","French Polynesia","PYF","Bovine Meat","fabio" +"6616","French Polynesia","PYF","Mutton & Goat Meat","fabio" +"6617","French Polynesia","PYF","Pigmeat","fabio" +"6618","French Polynesia","PYF","Poultry Meat","fabio" +"6619","French Polynesia","PYF","Meat, Other","fabio" +"6620","French Polynesia","PYF","Offals, Edible","fabio" +"6621","French Polynesia","PYF","Fats, Animals, Raw","fabio" +"6622","French Polynesia","PYF","Hides and skins","fabio" +"6623","French Polynesia","PYF","Meat Meal","fabio" +"6624","French Polynesia","PYF","Pet food","fabio" +"6625","French Polynesia","PYF","Honey","fabio" +"6626","French Polynesia","PYF","Silk","fabio" +"6627","French Polynesia","PYF","Fish, Seafood","fabio" +"6628","French Polynesia","PYF","Wood fuel","fabio" +"6629","French Polynesia","PYF","Industrial roundwood, coniferous","fabio" +"6630","French Polynesia","PYF","Industrial roundwood, non-coniferous","fabio" +"6631","Djibouti","DJI","Rice (Milled Equivalent)","fabio" +"6632","Djibouti","DJI","Wheat and products","fabio" +"6633","Djibouti","DJI","Barley and products","fabio" +"6634","Djibouti","DJI","Maize and products","fabio" +"6635","Djibouti","DJI","Rye and products","fabio" +"6636","Djibouti","DJI","Oats","fabio" +"6637","Djibouti","DJI","Millet and products","fabio" +"6638","Djibouti","DJI","Sorghum and products","fabio" +"6639","Djibouti","DJI","Cereals, Other","fabio" +"6640","Djibouti","DJI","Potatoes and products","fabio" +"6641","Djibouti","DJI","Cassava and products","fabio" +"6642","Djibouti","DJI","Sweet potatoes","fabio" +"6643","Djibouti","DJI","Roots, Other","fabio" +"6644","Djibouti","DJI","Yams","fabio" +"6645","Djibouti","DJI","Sugar cane","fabio" +"6646","Djibouti","DJI","Sugar beet","fabio" +"6647","Djibouti","DJI","Beans","fabio" +"6648","Djibouti","DJI","Peas","fabio" +"6649","Djibouti","DJI","Pulses, Other and products","fabio" +"6650","Djibouti","DJI","Nuts and products","fabio" +"6651","Djibouti","DJI","Soyabeans","fabio" +"6652","Djibouti","DJI","Groundnuts (Shelled Eq)","fabio" +"6653","Djibouti","DJI","Sunflower seed","fabio" +"6654","Djibouti","DJI","Rape and Mustardseed","fabio" +"6655","Djibouti","DJI","Seed cotton","fabio" +"6656","Djibouti","DJI","Coconuts - Incl Copra","fabio" +"6657","Djibouti","DJI","Sesame seed","fabio" +"6658","Djibouti","DJI","Oil, palm fruit","fabio" +"6659","Djibouti","DJI","Olives (including preserved)","fabio" +"6660","Djibouti","DJI","Oilcrops, Other","fabio" +"6661","Djibouti","DJI","Tomatoes and products","fabio" +"6662","Djibouti","DJI","Onions","fabio" +"6663","Djibouti","DJI","Vegetables, Other","fabio" +"6664","Djibouti","DJI","Oranges, Mandarines","fabio" +"6665","Djibouti","DJI","Lemons, Limes and products","fabio" +"6666","Djibouti","DJI","Grapefruit and products","fabio" +"6667","Djibouti","DJI","Citrus, Other","fabio" +"6668","Djibouti","DJI","Bananas","fabio" +"6669","Djibouti","DJI","Plantains","fabio" +"6670","Djibouti","DJI","Apples and products","fabio" +"6671","Djibouti","DJI","Pineapples and products","fabio" +"6672","Djibouti","DJI","Dates","fabio" +"6673","Djibouti","DJI","Grapes and products (excl wine)","fabio" +"6674","Djibouti","DJI","Fruits, Other","fabio" +"6675","Djibouti","DJI","Coffee and products","fabio" +"6676","Djibouti","DJI","Cocoa Beans and products","fabio" +"6677","Djibouti","DJI","Tea (including mate)","fabio" +"6678","Djibouti","DJI","Hops","fabio" +"6679","Djibouti","DJI","Pepper","fabio" +"6680","Djibouti","DJI","Pimento","fabio" +"6681","Djibouti","DJI","Cloves","fabio" +"6682","Djibouti","DJI","Spices, Other","fabio" +"6683","Djibouti","DJI","Jute","fabio" +"6684","Djibouti","DJI","Jute-Like Fibres","fabio" +"6685","Djibouti","DJI","Soft-Fibres, Other","fabio" +"6686","Djibouti","DJI","Sisal","fabio" +"6687","Djibouti","DJI","Abaca","fabio" +"6688","Djibouti","DJI","Hard Fibres, Other","fabio" +"6689","Djibouti","DJI","Tobacco","fabio" +"6690","Djibouti","DJI","Rubber","fabio" +"6691","Djibouti","DJI","Fodder crops","fabio" +"6692","Djibouti","DJI","Grazing","fabio" +"6693","Djibouti","DJI","Cottonseed","fabio" +"6694","Djibouti","DJI","Palm kernels","fabio" +"6695","Djibouti","DJI","Sugar non-centrifugal","fabio" +"6696","Djibouti","DJI","Molasses","fabio" +"6697","Djibouti","DJI","Sugar, Refined Equiv","fabio" +"6698","Djibouti","DJI","Sweeteners, Other","fabio" +"6699","Djibouti","DJI","Soyabean Oil","fabio" +"6700","Djibouti","DJI","Groundnut Oil","fabio" +"6701","Djibouti","DJI","Sunflowerseed Oil","fabio" +"6702","Djibouti","DJI","Rape and Mustard Oil","fabio" +"6703","Djibouti","DJI","Cottonseed Oil","fabio" +"6704","Djibouti","DJI","Palmkernel Oil","fabio" +"6705","Djibouti","DJI","Palm Oil","fabio" +"6706","Djibouti","DJI","Coconut Oil","fabio" +"6707","Djibouti","DJI","Sesameseed Oil","fabio" +"6708","Djibouti","DJI","Olive Oil","fabio" +"6709","Djibouti","DJI","Ricebran Oil","fabio" +"6710","Djibouti","DJI","Maize Germ Oil","fabio" +"6711","Djibouti","DJI","Oilcrops Oil, Other","fabio" +"6712","Djibouti","DJI","Soyabean Cake","fabio" +"6713","Djibouti","DJI","Groundnut Cake","fabio" +"6714","Djibouti","DJI","Sunflowerseed Cake","fabio" +"6715","Djibouti","DJI","Rape and Mustard Cake","fabio" +"6716","Djibouti","DJI","Cottonseed Cake","fabio" +"6717","Djibouti","DJI","Palmkernel Cake","fabio" +"6718","Djibouti","DJI","Copra Cake","fabio" +"6719","Djibouti","DJI","Sesameseed Cake","fabio" +"6720","Djibouti","DJI","Oilseed Cakes, Other","fabio" +"6721","Djibouti","DJI","Wine","fabio" +"6722","Djibouti","DJI","Beer","fabio" +"6723","Djibouti","DJI","Beverages, Fermented","fabio" +"6724","Djibouti","DJI","Beverages, Alcoholic","fabio" +"6725","Djibouti","DJI","Alcohol, Non-Food","fabio" +"6726","Djibouti","DJI","Cotton lint","fabio" +"6727","Djibouti","DJI","Cattle","fabio" +"6728","Djibouti","DJI","Buffaloes","fabio" +"6729","Djibouti","DJI","Sheep","fabio" +"6730","Djibouti","DJI","Goats","fabio" +"6731","Djibouti","DJI","Pigs","fabio" +"6732","Djibouti","DJI","Poultry Birds","fabio" +"6733","Djibouti","DJI","Horses","fabio" +"6734","Djibouti","DJI","Asses","fabio" +"6735","Djibouti","DJI","Mules","fabio" +"6736","Djibouti","DJI","Camels","fabio" +"6737","Djibouti","DJI","Camelids, other","fabio" +"6738","Djibouti","DJI","Rabbits and hares","fabio" +"6739","Djibouti","DJI","Rodents, other","fabio" +"6740","Djibouti","DJI","Live animals, other","fabio" +"6741","Djibouti","DJI","Milk - Excluding Butter","fabio" +"6742","Djibouti","DJI","Butter, Ghee","fabio" +"6743","Djibouti","DJI","Eggs","fabio" +"6744","Djibouti","DJI","Wool (Clean Eq.)","fabio" +"6745","Djibouti","DJI","Bovine Meat","fabio" +"6746","Djibouti","DJI","Mutton & Goat Meat","fabio" +"6747","Djibouti","DJI","Pigmeat","fabio" +"6748","Djibouti","DJI","Poultry Meat","fabio" +"6749","Djibouti","DJI","Meat, Other","fabio" +"6750","Djibouti","DJI","Offals, Edible","fabio" +"6751","Djibouti","DJI","Fats, Animals, Raw","fabio" +"6752","Djibouti","DJI","Hides and skins","fabio" +"6753","Djibouti","DJI","Meat Meal","fabio" +"6754","Djibouti","DJI","Pet food","fabio" +"6755","Djibouti","DJI","Honey","fabio" +"6756","Djibouti","DJI","Silk","fabio" +"6757","Djibouti","DJI","Fish, Seafood","fabio" +"6758","Djibouti","DJI","Wood fuel","fabio" +"6759","Djibouti","DJI","Industrial roundwood, coniferous","fabio" +"6760","Djibouti","DJI","Industrial roundwood, non-coniferous","fabio" +"6761","Georgia","GEO","Rice (Milled Equivalent)","fabio" +"6762","Georgia","GEO","Wheat and products","fabio" +"6763","Georgia","GEO","Barley and products","fabio" +"6764","Georgia","GEO","Maize and products","fabio" +"6765","Georgia","GEO","Rye and products","fabio" +"6766","Georgia","GEO","Oats","fabio" +"6767","Georgia","GEO","Millet and products","fabio" +"6768","Georgia","GEO","Sorghum and products","fabio" +"6769","Georgia","GEO","Cereals, Other","fabio" +"6770","Georgia","GEO","Potatoes and products","fabio" +"6771","Georgia","GEO","Cassava and products","fabio" +"6772","Georgia","GEO","Sweet potatoes","fabio" +"6773","Georgia","GEO","Roots, Other","fabio" +"6774","Georgia","GEO","Yams","fabio" +"6775","Georgia","GEO","Sugar cane","fabio" +"6776","Georgia","GEO","Sugar beet","fabio" +"6777","Georgia","GEO","Beans","fabio" +"6778","Georgia","GEO","Peas","fabio" +"6779","Georgia","GEO","Pulses, Other and products","fabio" +"6780","Georgia","GEO","Nuts and products","fabio" +"6781","Georgia","GEO","Soyabeans","fabio" +"6782","Georgia","GEO","Groundnuts (Shelled Eq)","fabio" +"6783","Georgia","GEO","Sunflower seed","fabio" +"6784","Georgia","GEO","Rape and Mustardseed","fabio" +"6785","Georgia","GEO","Seed cotton","fabio" +"6786","Georgia","GEO","Coconuts - Incl Copra","fabio" +"6787","Georgia","GEO","Sesame seed","fabio" +"6788","Georgia","GEO","Oil, palm fruit","fabio" +"6789","Georgia","GEO","Olives (including preserved)","fabio" +"6790","Georgia","GEO","Oilcrops, Other","fabio" +"6791","Georgia","GEO","Tomatoes and products","fabio" +"6792","Georgia","GEO","Onions","fabio" +"6793","Georgia","GEO","Vegetables, Other","fabio" +"6794","Georgia","GEO","Oranges, Mandarines","fabio" +"6795","Georgia","GEO","Lemons, Limes and products","fabio" +"6796","Georgia","GEO","Grapefruit and products","fabio" +"6797","Georgia","GEO","Citrus, Other","fabio" +"6798","Georgia","GEO","Bananas","fabio" +"6799","Georgia","GEO","Plantains","fabio" +"6800","Georgia","GEO","Apples and products","fabio" +"6801","Georgia","GEO","Pineapples and products","fabio" +"6802","Georgia","GEO","Dates","fabio" +"6803","Georgia","GEO","Grapes and products (excl wine)","fabio" +"6804","Georgia","GEO","Fruits, Other","fabio" +"6805","Georgia","GEO","Coffee and products","fabio" +"6806","Georgia","GEO","Cocoa Beans and products","fabio" +"6807","Georgia","GEO","Tea (including mate)","fabio" +"6808","Georgia","GEO","Hops","fabio" +"6809","Georgia","GEO","Pepper","fabio" +"6810","Georgia","GEO","Pimento","fabio" +"6811","Georgia","GEO","Cloves","fabio" +"6812","Georgia","GEO","Spices, Other","fabio" +"6813","Georgia","GEO","Jute","fabio" +"6814","Georgia","GEO","Jute-Like Fibres","fabio" +"6815","Georgia","GEO","Soft-Fibres, Other","fabio" +"6816","Georgia","GEO","Sisal","fabio" +"6817","Georgia","GEO","Abaca","fabio" +"6818","Georgia","GEO","Hard Fibres, Other","fabio" +"6819","Georgia","GEO","Tobacco","fabio" +"6820","Georgia","GEO","Rubber","fabio" +"6821","Georgia","GEO","Fodder crops","fabio" +"6822","Georgia","GEO","Grazing","fabio" +"6823","Georgia","GEO","Cottonseed","fabio" +"6824","Georgia","GEO","Palm kernels","fabio" +"6825","Georgia","GEO","Sugar non-centrifugal","fabio" +"6826","Georgia","GEO","Molasses","fabio" +"6827","Georgia","GEO","Sugar, Refined Equiv","fabio" +"6828","Georgia","GEO","Sweeteners, Other","fabio" +"6829","Georgia","GEO","Soyabean Oil","fabio" +"6830","Georgia","GEO","Groundnut Oil","fabio" +"6831","Georgia","GEO","Sunflowerseed Oil","fabio" +"6832","Georgia","GEO","Rape and Mustard Oil","fabio" +"6833","Georgia","GEO","Cottonseed Oil","fabio" +"6834","Georgia","GEO","Palmkernel Oil","fabio" +"6835","Georgia","GEO","Palm Oil","fabio" +"6836","Georgia","GEO","Coconut Oil","fabio" +"6837","Georgia","GEO","Sesameseed Oil","fabio" +"6838","Georgia","GEO","Olive Oil","fabio" +"6839","Georgia","GEO","Ricebran Oil","fabio" +"6840","Georgia","GEO","Maize Germ Oil","fabio" +"6841","Georgia","GEO","Oilcrops Oil, Other","fabio" +"6842","Georgia","GEO","Soyabean Cake","fabio" +"6843","Georgia","GEO","Groundnut Cake","fabio" +"6844","Georgia","GEO","Sunflowerseed Cake","fabio" +"6845","Georgia","GEO","Rape and Mustard Cake","fabio" +"6846","Georgia","GEO","Cottonseed Cake","fabio" +"6847","Georgia","GEO","Palmkernel Cake","fabio" +"6848","Georgia","GEO","Copra Cake","fabio" +"6849","Georgia","GEO","Sesameseed Cake","fabio" +"6850","Georgia","GEO","Oilseed Cakes, Other","fabio" +"6851","Georgia","GEO","Wine","fabio" +"6852","Georgia","GEO","Beer","fabio" +"6853","Georgia","GEO","Beverages, Fermented","fabio" +"6854","Georgia","GEO","Beverages, Alcoholic","fabio" +"6855","Georgia","GEO","Alcohol, Non-Food","fabio" +"6856","Georgia","GEO","Cotton lint","fabio" +"6857","Georgia","GEO","Cattle","fabio" +"6858","Georgia","GEO","Buffaloes","fabio" +"6859","Georgia","GEO","Sheep","fabio" +"6860","Georgia","GEO","Goats","fabio" +"6861","Georgia","GEO","Pigs","fabio" +"6862","Georgia","GEO","Poultry Birds","fabio" +"6863","Georgia","GEO","Horses","fabio" +"6864","Georgia","GEO","Asses","fabio" +"6865","Georgia","GEO","Mules","fabio" +"6866","Georgia","GEO","Camels","fabio" +"6867","Georgia","GEO","Camelids, other","fabio" +"6868","Georgia","GEO","Rabbits and hares","fabio" +"6869","Georgia","GEO","Rodents, other","fabio" +"6870","Georgia","GEO","Live animals, other","fabio" +"6871","Georgia","GEO","Milk - Excluding Butter","fabio" +"6872","Georgia","GEO","Butter, Ghee","fabio" +"6873","Georgia","GEO","Eggs","fabio" +"6874","Georgia","GEO","Wool (Clean Eq.)","fabio" +"6875","Georgia","GEO","Bovine Meat","fabio" +"6876","Georgia","GEO","Mutton & Goat Meat","fabio" +"6877","Georgia","GEO","Pigmeat","fabio" +"6878","Georgia","GEO","Poultry Meat","fabio" +"6879","Georgia","GEO","Meat, Other","fabio" +"6880","Georgia","GEO","Offals, Edible","fabio" +"6881","Georgia","GEO","Fats, Animals, Raw","fabio" +"6882","Georgia","GEO","Hides and skins","fabio" +"6883","Georgia","GEO","Meat Meal","fabio" +"6884","Georgia","GEO","Pet food","fabio" +"6885","Georgia","GEO","Honey","fabio" +"6886","Georgia","GEO","Silk","fabio" +"6887","Georgia","GEO","Fish, Seafood","fabio" +"6888","Georgia","GEO","Wood fuel","fabio" +"6889","Georgia","GEO","Industrial roundwood, coniferous","fabio" +"6890","Georgia","GEO","Industrial roundwood, non-coniferous","fabio" +"6891","Gabon","GAB","Rice (Milled Equivalent)","fabio" +"6892","Gabon","GAB","Wheat and products","fabio" +"6893","Gabon","GAB","Barley and products","fabio" +"6894","Gabon","GAB","Maize and products","fabio" +"6895","Gabon","GAB","Rye and products","fabio" +"6896","Gabon","GAB","Oats","fabio" +"6897","Gabon","GAB","Millet and products","fabio" +"6898","Gabon","GAB","Sorghum and products","fabio" +"6899","Gabon","GAB","Cereals, Other","fabio" +"6900","Gabon","GAB","Potatoes and products","fabio" +"6901","Gabon","GAB","Cassava and products","fabio" +"6902","Gabon","GAB","Sweet potatoes","fabio" +"6903","Gabon","GAB","Roots, Other","fabio" +"6904","Gabon","GAB","Yams","fabio" +"6905","Gabon","GAB","Sugar cane","fabio" +"6906","Gabon","GAB","Sugar beet","fabio" +"6907","Gabon","GAB","Beans","fabio" +"6908","Gabon","GAB","Peas","fabio" +"6909","Gabon","GAB","Pulses, Other and products","fabio" +"6910","Gabon","GAB","Nuts and products","fabio" +"6911","Gabon","GAB","Soyabeans","fabio" +"6912","Gabon","GAB","Groundnuts (Shelled Eq)","fabio" +"6913","Gabon","GAB","Sunflower seed","fabio" +"6914","Gabon","GAB","Rape and Mustardseed","fabio" +"6915","Gabon","GAB","Seed cotton","fabio" +"6916","Gabon","GAB","Coconuts - Incl Copra","fabio" +"6917","Gabon","GAB","Sesame seed","fabio" +"6918","Gabon","GAB","Oil, palm fruit","fabio" +"6919","Gabon","GAB","Olives (including preserved)","fabio" +"6920","Gabon","GAB","Oilcrops, Other","fabio" +"6921","Gabon","GAB","Tomatoes and products","fabio" +"6922","Gabon","GAB","Onions","fabio" +"6923","Gabon","GAB","Vegetables, Other","fabio" +"6924","Gabon","GAB","Oranges, Mandarines","fabio" +"6925","Gabon","GAB","Lemons, Limes and products","fabio" +"6926","Gabon","GAB","Grapefruit and products","fabio" +"6927","Gabon","GAB","Citrus, Other","fabio" +"6928","Gabon","GAB","Bananas","fabio" +"6929","Gabon","GAB","Plantains","fabio" +"6930","Gabon","GAB","Apples and products","fabio" +"6931","Gabon","GAB","Pineapples and products","fabio" +"6932","Gabon","GAB","Dates","fabio" +"6933","Gabon","GAB","Grapes and products (excl wine)","fabio" +"6934","Gabon","GAB","Fruits, Other","fabio" +"6935","Gabon","GAB","Coffee and products","fabio" +"6936","Gabon","GAB","Cocoa Beans and products","fabio" +"6937","Gabon","GAB","Tea (including mate)","fabio" +"6938","Gabon","GAB","Hops","fabio" +"6939","Gabon","GAB","Pepper","fabio" +"6940","Gabon","GAB","Pimento","fabio" +"6941","Gabon","GAB","Cloves","fabio" +"6942","Gabon","GAB","Spices, Other","fabio" +"6943","Gabon","GAB","Jute","fabio" +"6944","Gabon","GAB","Jute-Like Fibres","fabio" +"6945","Gabon","GAB","Soft-Fibres, Other","fabio" +"6946","Gabon","GAB","Sisal","fabio" +"6947","Gabon","GAB","Abaca","fabio" +"6948","Gabon","GAB","Hard Fibres, Other","fabio" +"6949","Gabon","GAB","Tobacco","fabio" +"6950","Gabon","GAB","Rubber","fabio" +"6951","Gabon","GAB","Fodder crops","fabio" +"6952","Gabon","GAB","Grazing","fabio" +"6953","Gabon","GAB","Cottonseed","fabio" +"6954","Gabon","GAB","Palm kernels","fabio" +"6955","Gabon","GAB","Sugar non-centrifugal","fabio" +"6956","Gabon","GAB","Molasses","fabio" +"6957","Gabon","GAB","Sugar, Refined Equiv","fabio" +"6958","Gabon","GAB","Sweeteners, Other","fabio" +"6959","Gabon","GAB","Soyabean Oil","fabio" +"6960","Gabon","GAB","Groundnut Oil","fabio" +"6961","Gabon","GAB","Sunflowerseed Oil","fabio" +"6962","Gabon","GAB","Rape and Mustard Oil","fabio" +"6963","Gabon","GAB","Cottonseed Oil","fabio" +"6964","Gabon","GAB","Palmkernel Oil","fabio" +"6965","Gabon","GAB","Palm Oil","fabio" +"6966","Gabon","GAB","Coconut Oil","fabio" +"6967","Gabon","GAB","Sesameseed Oil","fabio" +"6968","Gabon","GAB","Olive Oil","fabio" +"6969","Gabon","GAB","Ricebran Oil","fabio" +"6970","Gabon","GAB","Maize Germ Oil","fabio" +"6971","Gabon","GAB","Oilcrops Oil, Other","fabio" +"6972","Gabon","GAB","Soyabean Cake","fabio" +"6973","Gabon","GAB","Groundnut Cake","fabio" +"6974","Gabon","GAB","Sunflowerseed Cake","fabio" +"6975","Gabon","GAB","Rape and Mustard Cake","fabio" +"6976","Gabon","GAB","Cottonseed Cake","fabio" +"6977","Gabon","GAB","Palmkernel Cake","fabio" +"6978","Gabon","GAB","Copra Cake","fabio" +"6979","Gabon","GAB","Sesameseed Cake","fabio" +"6980","Gabon","GAB","Oilseed Cakes, Other","fabio" +"6981","Gabon","GAB","Wine","fabio" +"6982","Gabon","GAB","Beer","fabio" +"6983","Gabon","GAB","Beverages, Fermented","fabio" +"6984","Gabon","GAB","Beverages, Alcoholic","fabio" +"6985","Gabon","GAB","Alcohol, Non-Food","fabio" +"6986","Gabon","GAB","Cotton lint","fabio" +"6987","Gabon","GAB","Cattle","fabio" +"6988","Gabon","GAB","Buffaloes","fabio" +"6989","Gabon","GAB","Sheep","fabio" +"6990","Gabon","GAB","Goats","fabio" +"6991","Gabon","GAB","Pigs","fabio" +"6992","Gabon","GAB","Poultry Birds","fabio" +"6993","Gabon","GAB","Horses","fabio" +"6994","Gabon","GAB","Asses","fabio" +"6995","Gabon","GAB","Mules","fabio" +"6996","Gabon","GAB","Camels","fabio" +"6997","Gabon","GAB","Camelids, other","fabio" +"6998","Gabon","GAB","Rabbits and hares","fabio" +"6999","Gabon","GAB","Rodents, other","fabio" +"7000","Gabon","GAB","Live animals, other","fabio" +"7001","Gabon","GAB","Milk - Excluding Butter","fabio" +"7002","Gabon","GAB","Butter, Ghee","fabio" +"7003","Gabon","GAB","Eggs","fabio" +"7004","Gabon","GAB","Wool (Clean Eq.)","fabio" +"7005","Gabon","GAB","Bovine Meat","fabio" +"7006","Gabon","GAB","Mutton & Goat Meat","fabio" +"7007","Gabon","GAB","Pigmeat","fabio" +"7008","Gabon","GAB","Poultry Meat","fabio" +"7009","Gabon","GAB","Meat, Other","fabio" +"7010","Gabon","GAB","Offals, Edible","fabio" +"7011","Gabon","GAB","Fats, Animals, Raw","fabio" +"7012","Gabon","GAB","Hides and skins","fabio" +"7013","Gabon","GAB","Meat Meal","fabio" +"7014","Gabon","GAB","Pet food","fabio" +"7015","Gabon","GAB","Honey","fabio" +"7016","Gabon","GAB","Silk","fabio" +"7017","Gabon","GAB","Fish, Seafood","fabio" +"7018","Gabon","GAB","Wood fuel","fabio" +"7019","Gabon","GAB","Industrial roundwood, coniferous","fabio" +"7020","Gabon","GAB","Industrial roundwood, non-coniferous","fabio" +"7021","Gambia","GMB","Rice (Milled Equivalent)","fabio" +"7022","Gambia","GMB","Wheat and products","fabio" +"7023","Gambia","GMB","Barley and products","fabio" +"7024","Gambia","GMB","Maize and products","fabio" +"7025","Gambia","GMB","Rye and products","fabio" +"7026","Gambia","GMB","Oats","fabio" +"7027","Gambia","GMB","Millet and products","fabio" +"7028","Gambia","GMB","Sorghum and products","fabio" +"7029","Gambia","GMB","Cereals, Other","fabio" +"7030","Gambia","GMB","Potatoes and products","fabio" +"7031","Gambia","GMB","Cassava and products","fabio" +"7032","Gambia","GMB","Sweet potatoes","fabio" +"7033","Gambia","GMB","Roots, Other","fabio" +"7034","Gambia","GMB","Yams","fabio" +"7035","Gambia","GMB","Sugar cane","fabio" +"7036","Gambia","GMB","Sugar beet","fabio" +"7037","Gambia","GMB","Beans","fabio" +"7038","Gambia","GMB","Peas","fabio" +"7039","Gambia","GMB","Pulses, Other and products","fabio" +"7040","Gambia","GMB","Nuts and products","fabio" +"7041","Gambia","GMB","Soyabeans","fabio" +"7042","Gambia","GMB","Groundnuts (Shelled Eq)","fabio" +"7043","Gambia","GMB","Sunflower seed","fabio" +"7044","Gambia","GMB","Rape and Mustardseed","fabio" +"7045","Gambia","GMB","Seed cotton","fabio" +"7046","Gambia","GMB","Coconuts - Incl Copra","fabio" +"7047","Gambia","GMB","Sesame seed","fabio" +"7048","Gambia","GMB","Oil, palm fruit","fabio" +"7049","Gambia","GMB","Olives (including preserved)","fabio" +"7050","Gambia","GMB","Oilcrops, Other","fabio" +"7051","Gambia","GMB","Tomatoes and products","fabio" +"7052","Gambia","GMB","Onions","fabio" +"7053","Gambia","GMB","Vegetables, Other","fabio" +"7054","Gambia","GMB","Oranges, Mandarines","fabio" +"7055","Gambia","GMB","Lemons, Limes and products","fabio" +"7056","Gambia","GMB","Grapefruit and products","fabio" +"7057","Gambia","GMB","Citrus, Other","fabio" +"7058","Gambia","GMB","Bananas","fabio" +"7059","Gambia","GMB","Plantains","fabio" +"7060","Gambia","GMB","Apples and products","fabio" +"7061","Gambia","GMB","Pineapples and products","fabio" +"7062","Gambia","GMB","Dates","fabio" +"7063","Gambia","GMB","Grapes and products (excl wine)","fabio" +"7064","Gambia","GMB","Fruits, Other","fabio" +"7065","Gambia","GMB","Coffee and products","fabio" +"7066","Gambia","GMB","Cocoa Beans and products","fabio" +"7067","Gambia","GMB","Tea (including mate)","fabio" +"7068","Gambia","GMB","Hops","fabio" +"7069","Gambia","GMB","Pepper","fabio" +"7070","Gambia","GMB","Pimento","fabio" +"7071","Gambia","GMB","Cloves","fabio" +"7072","Gambia","GMB","Spices, Other","fabio" +"7073","Gambia","GMB","Jute","fabio" +"7074","Gambia","GMB","Jute-Like Fibres","fabio" +"7075","Gambia","GMB","Soft-Fibres, Other","fabio" +"7076","Gambia","GMB","Sisal","fabio" +"7077","Gambia","GMB","Abaca","fabio" +"7078","Gambia","GMB","Hard Fibres, Other","fabio" +"7079","Gambia","GMB","Tobacco","fabio" +"7080","Gambia","GMB","Rubber","fabio" +"7081","Gambia","GMB","Fodder crops","fabio" +"7082","Gambia","GMB","Grazing","fabio" +"7083","Gambia","GMB","Cottonseed","fabio" +"7084","Gambia","GMB","Palm kernels","fabio" +"7085","Gambia","GMB","Sugar non-centrifugal","fabio" +"7086","Gambia","GMB","Molasses","fabio" +"7087","Gambia","GMB","Sugar, Refined Equiv","fabio" +"7088","Gambia","GMB","Sweeteners, Other","fabio" +"7089","Gambia","GMB","Soyabean Oil","fabio" +"7090","Gambia","GMB","Groundnut Oil","fabio" +"7091","Gambia","GMB","Sunflowerseed Oil","fabio" +"7092","Gambia","GMB","Rape and Mustard Oil","fabio" +"7093","Gambia","GMB","Cottonseed Oil","fabio" +"7094","Gambia","GMB","Palmkernel Oil","fabio" +"7095","Gambia","GMB","Palm Oil","fabio" +"7096","Gambia","GMB","Coconut Oil","fabio" +"7097","Gambia","GMB","Sesameseed Oil","fabio" +"7098","Gambia","GMB","Olive Oil","fabio" +"7099","Gambia","GMB","Ricebran Oil","fabio" +"7100","Gambia","GMB","Maize Germ Oil","fabio" +"7101","Gambia","GMB","Oilcrops Oil, Other","fabio" +"7102","Gambia","GMB","Soyabean Cake","fabio" +"7103","Gambia","GMB","Groundnut Cake","fabio" +"7104","Gambia","GMB","Sunflowerseed Cake","fabio" +"7105","Gambia","GMB","Rape and Mustard Cake","fabio" +"7106","Gambia","GMB","Cottonseed Cake","fabio" +"7107","Gambia","GMB","Palmkernel Cake","fabio" +"7108","Gambia","GMB","Copra Cake","fabio" +"7109","Gambia","GMB","Sesameseed Cake","fabio" +"7110","Gambia","GMB","Oilseed Cakes, Other","fabio" +"7111","Gambia","GMB","Wine","fabio" +"7112","Gambia","GMB","Beer","fabio" +"7113","Gambia","GMB","Beverages, Fermented","fabio" +"7114","Gambia","GMB","Beverages, Alcoholic","fabio" +"7115","Gambia","GMB","Alcohol, Non-Food","fabio" +"7116","Gambia","GMB","Cotton lint","fabio" +"7117","Gambia","GMB","Cattle","fabio" +"7118","Gambia","GMB","Buffaloes","fabio" +"7119","Gambia","GMB","Sheep","fabio" +"7120","Gambia","GMB","Goats","fabio" +"7121","Gambia","GMB","Pigs","fabio" +"7122","Gambia","GMB","Poultry Birds","fabio" +"7123","Gambia","GMB","Horses","fabio" +"7124","Gambia","GMB","Asses","fabio" +"7125","Gambia","GMB","Mules","fabio" +"7126","Gambia","GMB","Camels","fabio" +"7127","Gambia","GMB","Camelids, other","fabio" +"7128","Gambia","GMB","Rabbits and hares","fabio" +"7129","Gambia","GMB","Rodents, other","fabio" +"7130","Gambia","GMB","Live animals, other","fabio" +"7131","Gambia","GMB","Milk - Excluding Butter","fabio" +"7132","Gambia","GMB","Butter, Ghee","fabio" +"7133","Gambia","GMB","Eggs","fabio" +"7134","Gambia","GMB","Wool (Clean Eq.)","fabio" +"7135","Gambia","GMB","Bovine Meat","fabio" +"7136","Gambia","GMB","Mutton & Goat Meat","fabio" +"7137","Gambia","GMB","Pigmeat","fabio" +"7138","Gambia","GMB","Poultry Meat","fabio" +"7139","Gambia","GMB","Meat, Other","fabio" +"7140","Gambia","GMB","Offals, Edible","fabio" +"7141","Gambia","GMB","Fats, Animals, Raw","fabio" +"7142","Gambia","GMB","Hides and skins","fabio" +"7143","Gambia","GMB","Meat Meal","fabio" +"7144","Gambia","GMB","Pet food","fabio" +"7145","Gambia","GMB","Honey","fabio" +"7146","Gambia","GMB","Silk","fabio" +"7147","Gambia","GMB","Fish, Seafood","fabio" +"7148","Gambia","GMB","Wood fuel","fabio" +"7149","Gambia","GMB","Industrial roundwood, coniferous","fabio" +"7150","Gambia","GMB","Industrial roundwood, non-coniferous","fabio" +"7151","Germany","DEU","Rice (Milled Equivalent)","fabio" +"7152","Germany","DEU","Wheat and products","fabio" +"7153","Germany","DEU","Barley and products","fabio" +"7154","Germany","DEU","Maize and products","fabio" +"7155","Germany","DEU","Rye and products","fabio" +"7156","Germany","DEU","Oats","fabio" +"7157","Germany","DEU","Millet and products","fabio" +"7158","Germany","DEU","Sorghum and products","fabio" +"7159","Germany","DEU","Cereals, Other","fabio" +"7160","Germany","DEU","Potatoes and products","fabio" +"7161","Germany","DEU","Cassava and products","fabio" +"7162","Germany","DEU","Sweet potatoes","fabio" +"7163","Germany","DEU","Roots, Other","fabio" +"7164","Germany","DEU","Yams","fabio" +"7165","Germany","DEU","Sugar cane","fabio" +"7166","Germany","DEU","Sugar beet","fabio" +"7167","Germany","DEU","Beans","fabio" +"7168","Germany","DEU","Peas","fabio" +"7169","Germany","DEU","Pulses, Other and products","fabio" +"7170","Germany","DEU","Nuts and products","fabio" +"7171","Germany","DEU","Soyabeans","fabio" +"7172","Germany","DEU","Groundnuts (Shelled Eq)","fabio" +"7173","Germany","DEU","Sunflower seed","fabio" +"7174","Germany","DEU","Rape and Mustardseed","fabio" +"7175","Germany","DEU","Seed cotton","fabio" +"7176","Germany","DEU","Coconuts - Incl Copra","fabio" +"7177","Germany","DEU","Sesame seed","fabio" +"7178","Germany","DEU","Oil, palm fruit","fabio" +"7179","Germany","DEU","Olives (including preserved)","fabio" +"7180","Germany","DEU","Oilcrops, Other","fabio" +"7181","Germany","DEU","Tomatoes and products","fabio" +"7182","Germany","DEU","Onions","fabio" +"7183","Germany","DEU","Vegetables, Other","fabio" +"7184","Germany","DEU","Oranges, Mandarines","fabio" +"7185","Germany","DEU","Lemons, Limes and products","fabio" +"7186","Germany","DEU","Grapefruit and products","fabio" +"7187","Germany","DEU","Citrus, Other","fabio" +"7188","Germany","DEU","Bananas","fabio" +"7189","Germany","DEU","Plantains","fabio" +"7190","Germany","DEU","Apples and products","fabio" +"7191","Germany","DEU","Pineapples and products","fabio" +"7192","Germany","DEU","Dates","fabio" +"7193","Germany","DEU","Grapes and products (excl wine)","fabio" +"7194","Germany","DEU","Fruits, Other","fabio" +"7195","Germany","DEU","Coffee and products","fabio" +"7196","Germany","DEU","Cocoa Beans and products","fabio" +"7197","Germany","DEU","Tea (including mate)","fabio" +"7198","Germany","DEU","Hops","fabio" +"7199","Germany","DEU","Pepper","fabio" +"7200","Germany","DEU","Pimento","fabio" +"7201","Germany","DEU","Cloves","fabio" +"7202","Germany","DEU","Spices, Other","fabio" +"7203","Germany","DEU","Jute","fabio" +"7204","Germany","DEU","Jute-Like Fibres","fabio" +"7205","Germany","DEU","Soft-Fibres, Other","fabio" +"7206","Germany","DEU","Sisal","fabio" +"7207","Germany","DEU","Abaca","fabio" +"7208","Germany","DEU","Hard Fibres, Other","fabio" +"7209","Germany","DEU","Tobacco","fabio" +"7210","Germany","DEU","Rubber","fabio" +"7211","Germany","DEU","Fodder crops","fabio" +"7212","Germany","DEU","Grazing","fabio" +"7213","Germany","DEU","Cottonseed","fabio" +"7214","Germany","DEU","Palm kernels","fabio" +"7215","Germany","DEU","Sugar non-centrifugal","fabio" +"7216","Germany","DEU","Molasses","fabio" +"7217","Germany","DEU","Sugar, Refined Equiv","fabio" +"7218","Germany","DEU","Sweeteners, Other","fabio" +"7219","Germany","DEU","Soyabean Oil","fabio" +"7220","Germany","DEU","Groundnut Oil","fabio" +"7221","Germany","DEU","Sunflowerseed Oil","fabio" +"7222","Germany","DEU","Rape and Mustard Oil","fabio" +"7223","Germany","DEU","Cottonseed Oil","fabio" +"7224","Germany","DEU","Palmkernel Oil","fabio" +"7225","Germany","DEU","Palm Oil","fabio" +"7226","Germany","DEU","Coconut Oil","fabio" +"7227","Germany","DEU","Sesameseed Oil","fabio" +"7228","Germany","DEU","Olive Oil","fabio" +"7229","Germany","DEU","Ricebran Oil","fabio" +"7230","Germany","DEU","Maize Germ Oil","fabio" +"7231","Germany","DEU","Oilcrops Oil, Other","fabio" +"7232","Germany","DEU","Soyabean Cake","fabio" +"7233","Germany","DEU","Groundnut Cake","fabio" +"7234","Germany","DEU","Sunflowerseed Cake","fabio" +"7235","Germany","DEU","Rape and Mustard Cake","fabio" +"7236","Germany","DEU","Cottonseed Cake","fabio" +"7237","Germany","DEU","Palmkernel Cake","fabio" +"7238","Germany","DEU","Copra Cake","fabio" +"7239","Germany","DEU","Sesameseed Cake","fabio" +"7240","Germany","DEU","Oilseed Cakes, Other","fabio" +"7241","Germany","DEU","Wine","fabio" +"7242","Germany","DEU","Beer","fabio" +"7243","Germany","DEU","Beverages, Fermented","fabio" +"7244","Germany","DEU","Beverages, Alcoholic","fabio" +"7245","Germany","DEU","Alcohol, Non-Food","fabio" +"7246","Germany","DEU","Cotton lint","fabio" +"7247","Germany","DEU","Cattle","fabio" +"7248","Germany","DEU","Buffaloes","fabio" +"7249","Germany","DEU","Sheep","fabio" +"7250","Germany","DEU","Goats","fabio" +"7251","Germany","DEU","Pigs","fabio" +"7252","Germany","DEU","Poultry Birds","fabio" +"7253","Germany","DEU","Horses","fabio" +"7254","Germany","DEU","Asses","fabio" +"7255","Germany","DEU","Mules","fabio" +"7256","Germany","DEU","Camels","fabio" +"7257","Germany","DEU","Camelids, other","fabio" +"7258","Germany","DEU","Rabbits and hares","fabio" +"7259","Germany","DEU","Rodents, other","fabio" +"7260","Germany","DEU","Live animals, other","fabio" +"7261","Germany","DEU","Milk - Excluding Butter","fabio" +"7262","Germany","DEU","Butter, Ghee","fabio" +"7263","Germany","DEU","Eggs","fabio" +"7264","Germany","DEU","Wool (Clean Eq.)","fabio" +"7265","Germany","DEU","Bovine Meat","fabio" +"7266","Germany","DEU","Mutton & Goat Meat","fabio" +"7267","Germany","DEU","Pigmeat","fabio" +"7268","Germany","DEU","Poultry Meat","fabio" +"7269","Germany","DEU","Meat, Other","fabio" +"7270","Germany","DEU","Offals, Edible","fabio" +"7271","Germany","DEU","Fats, Animals, Raw","fabio" +"7272","Germany","DEU","Hides and skins","fabio" +"7273","Germany","DEU","Meat Meal","fabio" +"7274","Germany","DEU","Pet food","fabio" +"7275","Germany","DEU","Honey","fabio" +"7276","Germany","DEU","Silk","fabio" +"7277","Germany","DEU","Fish, Seafood","fabio" +"7278","Germany","DEU","Wood fuel","fabio" +"7279","Germany","DEU","Industrial roundwood, coniferous","fabio" +"7280","Germany","DEU","Industrial roundwood, non-coniferous","fabio" +"7281","Bosnia and Herzegovina","BIH","Rice (Milled Equivalent)","fabio" +"7282","Bosnia and Herzegovina","BIH","Wheat and products","fabio" +"7283","Bosnia and Herzegovina","BIH","Barley and products","fabio" +"7284","Bosnia and Herzegovina","BIH","Maize and products","fabio" +"7285","Bosnia and Herzegovina","BIH","Rye and products","fabio" +"7286","Bosnia and Herzegovina","BIH","Oats","fabio" +"7287","Bosnia and Herzegovina","BIH","Millet and products","fabio" +"7288","Bosnia and Herzegovina","BIH","Sorghum and products","fabio" +"7289","Bosnia and Herzegovina","BIH","Cereals, Other","fabio" +"7290","Bosnia and Herzegovina","BIH","Potatoes and products","fabio" +"7291","Bosnia and Herzegovina","BIH","Cassava and products","fabio" +"7292","Bosnia and Herzegovina","BIH","Sweet potatoes","fabio" +"7293","Bosnia and Herzegovina","BIH","Roots, Other","fabio" +"7294","Bosnia and Herzegovina","BIH","Yams","fabio" +"7295","Bosnia and Herzegovina","BIH","Sugar cane","fabio" +"7296","Bosnia and Herzegovina","BIH","Sugar beet","fabio" +"7297","Bosnia and Herzegovina","BIH","Beans","fabio" +"7298","Bosnia and Herzegovina","BIH","Peas","fabio" +"7299","Bosnia and Herzegovina","BIH","Pulses, Other and products","fabio" +"7300","Bosnia and Herzegovina","BIH","Nuts and products","fabio" +"7301","Bosnia and Herzegovina","BIH","Soyabeans","fabio" +"7302","Bosnia and Herzegovina","BIH","Groundnuts (Shelled Eq)","fabio" +"7303","Bosnia and Herzegovina","BIH","Sunflower seed","fabio" +"7304","Bosnia and Herzegovina","BIH","Rape and Mustardseed","fabio" +"7305","Bosnia and Herzegovina","BIH","Seed cotton","fabio" +"7306","Bosnia and Herzegovina","BIH","Coconuts - Incl Copra","fabio" +"7307","Bosnia and Herzegovina","BIH","Sesame seed","fabio" +"7308","Bosnia and Herzegovina","BIH","Oil, palm fruit","fabio" +"7309","Bosnia and Herzegovina","BIH","Olives (including preserved)","fabio" +"7310","Bosnia and Herzegovina","BIH","Oilcrops, Other","fabio" +"7311","Bosnia and Herzegovina","BIH","Tomatoes and products","fabio" +"7312","Bosnia and Herzegovina","BIH","Onions","fabio" +"7313","Bosnia and Herzegovina","BIH","Vegetables, Other","fabio" +"7314","Bosnia and Herzegovina","BIH","Oranges, Mandarines","fabio" +"7315","Bosnia and Herzegovina","BIH","Lemons, Limes and products","fabio" +"7316","Bosnia and Herzegovina","BIH","Grapefruit and products","fabio" +"7317","Bosnia and Herzegovina","BIH","Citrus, Other","fabio" +"7318","Bosnia and Herzegovina","BIH","Bananas","fabio" +"7319","Bosnia and Herzegovina","BIH","Plantains","fabio" +"7320","Bosnia and Herzegovina","BIH","Apples and products","fabio" +"7321","Bosnia and Herzegovina","BIH","Pineapples and products","fabio" +"7322","Bosnia and Herzegovina","BIH","Dates","fabio" +"7323","Bosnia and Herzegovina","BIH","Grapes and products (excl wine)","fabio" +"7324","Bosnia and Herzegovina","BIH","Fruits, Other","fabio" +"7325","Bosnia and Herzegovina","BIH","Coffee and products","fabio" +"7326","Bosnia and Herzegovina","BIH","Cocoa Beans and products","fabio" +"7327","Bosnia and Herzegovina","BIH","Tea (including mate)","fabio" +"7328","Bosnia and Herzegovina","BIH","Hops","fabio" +"7329","Bosnia and Herzegovina","BIH","Pepper","fabio" +"7330","Bosnia and Herzegovina","BIH","Pimento","fabio" +"7331","Bosnia and Herzegovina","BIH","Cloves","fabio" +"7332","Bosnia and Herzegovina","BIH","Spices, Other","fabio" +"7333","Bosnia and Herzegovina","BIH","Jute","fabio" +"7334","Bosnia and Herzegovina","BIH","Jute-Like Fibres","fabio" +"7335","Bosnia and Herzegovina","BIH","Soft-Fibres, Other","fabio" +"7336","Bosnia and Herzegovina","BIH","Sisal","fabio" +"7337","Bosnia and Herzegovina","BIH","Abaca","fabio" +"7338","Bosnia and Herzegovina","BIH","Hard Fibres, Other","fabio" +"7339","Bosnia and Herzegovina","BIH","Tobacco","fabio" +"7340","Bosnia and Herzegovina","BIH","Rubber","fabio" +"7341","Bosnia and Herzegovina","BIH","Fodder crops","fabio" +"7342","Bosnia and Herzegovina","BIH","Grazing","fabio" +"7343","Bosnia and Herzegovina","BIH","Cottonseed","fabio" +"7344","Bosnia and Herzegovina","BIH","Palm kernels","fabio" +"7345","Bosnia and Herzegovina","BIH","Sugar non-centrifugal","fabio" +"7346","Bosnia and Herzegovina","BIH","Molasses","fabio" +"7347","Bosnia and Herzegovina","BIH","Sugar, Refined Equiv","fabio" +"7348","Bosnia and Herzegovina","BIH","Sweeteners, Other","fabio" +"7349","Bosnia and Herzegovina","BIH","Soyabean Oil","fabio" +"7350","Bosnia and Herzegovina","BIH","Groundnut Oil","fabio" +"7351","Bosnia and Herzegovina","BIH","Sunflowerseed Oil","fabio" +"7352","Bosnia and Herzegovina","BIH","Rape and Mustard Oil","fabio" +"7353","Bosnia and Herzegovina","BIH","Cottonseed Oil","fabio" +"7354","Bosnia and Herzegovina","BIH","Palmkernel Oil","fabio" +"7355","Bosnia and Herzegovina","BIH","Palm Oil","fabio" +"7356","Bosnia and Herzegovina","BIH","Coconut Oil","fabio" +"7357","Bosnia and Herzegovina","BIH","Sesameseed Oil","fabio" +"7358","Bosnia and Herzegovina","BIH","Olive Oil","fabio" +"7359","Bosnia and Herzegovina","BIH","Ricebran Oil","fabio" +"7360","Bosnia and Herzegovina","BIH","Maize Germ Oil","fabio" +"7361","Bosnia and Herzegovina","BIH","Oilcrops Oil, Other","fabio" +"7362","Bosnia and Herzegovina","BIH","Soyabean Cake","fabio" +"7363","Bosnia and Herzegovina","BIH","Groundnut Cake","fabio" +"7364","Bosnia and Herzegovina","BIH","Sunflowerseed Cake","fabio" +"7365","Bosnia and Herzegovina","BIH","Rape and Mustard Cake","fabio" +"7366","Bosnia and Herzegovina","BIH","Cottonseed Cake","fabio" +"7367","Bosnia and Herzegovina","BIH","Palmkernel Cake","fabio" +"7368","Bosnia and Herzegovina","BIH","Copra Cake","fabio" +"7369","Bosnia and Herzegovina","BIH","Sesameseed Cake","fabio" +"7370","Bosnia and Herzegovina","BIH","Oilseed Cakes, Other","fabio" +"7371","Bosnia and Herzegovina","BIH","Wine","fabio" +"7372","Bosnia and Herzegovina","BIH","Beer","fabio" +"7373","Bosnia and Herzegovina","BIH","Beverages, Fermented","fabio" +"7374","Bosnia and Herzegovina","BIH","Beverages, Alcoholic","fabio" +"7375","Bosnia and Herzegovina","BIH","Alcohol, Non-Food","fabio" +"7376","Bosnia and Herzegovina","BIH","Cotton lint","fabio" +"7377","Bosnia and Herzegovina","BIH","Cattle","fabio" +"7378","Bosnia and Herzegovina","BIH","Buffaloes","fabio" +"7379","Bosnia and Herzegovina","BIH","Sheep","fabio" +"7380","Bosnia and Herzegovina","BIH","Goats","fabio" +"7381","Bosnia and Herzegovina","BIH","Pigs","fabio" +"7382","Bosnia and Herzegovina","BIH","Poultry Birds","fabio" +"7383","Bosnia and Herzegovina","BIH","Horses","fabio" +"7384","Bosnia and Herzegovina","BIH","Asses","fabio" +"7385","Bosnia and Herzegovina","BIH","Mules","fabio" +"7386","Bosnia and Herzegovina","BIH","Camels","fabio" +"7387","Bosnia and Herzegovina","BIH","Camelids, other","fabio" +"7388","Bosnia and Herzegovina","BIH","Rabbits and hares","fabio" +"7389","Bosnia and Herzegovina","BIH","Rodents, other","fabio" +"7390","Bosnia and Herzegovina","BIH","Live animals, other","fabio" +"7391","Bosnia and Herzegovina","BIH","Milk - Excluding Butter","fabio" +"7392","Bosnia and Herzegovina","BIH","Butter, Ghee","fabio" +"7393","Bosnia and Herzegovina","BIH","Eggs","fabio" +"7394","Bosnia and Herzegovina","BIH","Wool (Clean Eq.)","fabio" +"7395","Bosnia and Herzegovina","BIH","Bovine Meat","fabio" +"7396","Bosnia and Herzegovina","BIH","Mutton & Goat Meat","fabio" +"7397","Bosnia and Herzegovina","BIH","Pigmeat","fabio" +"7398","Bosnia and Herzegovina","BIH","Poultry Meat","fabio" +"7399","Bosnia and Herzegovina","BIH","Meat, Other","fabio" +"7400","Bosnia and Herzegovina","BIH","Offals, Edible","fabio" +"7401","Bosnia and Herzegovina","BIH","Fats, Animals, Raw","fabio" +"7402","Bosnia and Herzegovina","BIH","Hides and skins","fabio" +"7403","Bosnia and Herzegovina","BIH","Meat Meal","fabio" +"7404","Bosnia and Herzegovina","BIH","Pet food","fabio" +"7405","Bosnia and Herzegovina","BIH","Honey","fabio" +"7406","Bosnia and Herzegovina","BIH","Silk","fabio" +"7407","Bosnia and Herzegovina","BIH","Fish, Seafood","fabio" +"7408","Bosnia and Herzegovina","BIH","Wood fuel","fabio" +"7409","Bosnia and Herzegovina","BIH","Industrial roundwood, coniferous","fabio" +"7410","Bosnia and Herzegovina","BIH","Industrial roundwood, non-coniferous","fabio" +"7411","Ghana","GHA","Rice (Milled Equivalent)","fabio" +"7412","Ghana","GHA","Wheat and products","fabio" +"7413","Ghana","GHA","Barley and products","fabio" +"7414","Ghana","GHA","Maize and products","fabio" +"7415","Ghana","GHA","Rye and products","fabio" +"7416","Ghana","GHA","Oats","fabio" +"7417","Ghana","GHA","Millet and products","fabio" +"7418","Ghana","GHA","Sorghum and products","fabio" +"7419","Ghana","GHA","Cereals, Other","fabio" +"7420","Ghana","GHA","Potatoes and products","fabio" +"7421","Ghana","GHA","Cassava and products","fabio" +"7422","Ghana","GHA","Sweet potatoes","fabio" +"7423","Ghana","GHA","Roots, Other","fabio" +"7424","Ghana","GHA","Yams","fabio" +"7425","Ghana","GHA","Sugar cane","fabio" +"7426","Ghana","GHA","Sugar beet","fabio" +"7427","Ghana","GHA","Beans","fabio" +"7428","Ghana","GHA","Peas","fabio" +"7429","Ghana","GHA","Pulses, Other and products","fabio" +"7430","Ghana","GHA","Nuts and products","fabio" +"7431","Ghana","GHA","Soyabeans","fabio" +"7432","Ghana","GHA","Groundnuts (Shelled Eq)","fabio" +"7433","Ghana","GHA","Sunflower seed","fabio" +"7434","Ghana","GHA","Rape and Mustardseed","fabio" +"7435","Ghana","GHA","Seed cotton","fabio" +"7436","Ghana","GHA","Coconuts - Incl Copra","fabio" +"7437","Ghana","GHA","Sesame seed","fabio" +"7438","Ghana","GHA","Oil, palm fruit","fabio" +"7439","Ghana","GHA","Olives (including preserved)","fabio" +"7440","Ghana","GHA","Oilcrops, Other","fabio" +"7441","Ghana","GHA","Tomatoes and products","fabio" +"7442","Ghana","GHA","Onions","fabio" +"7443","Ghana","GHA","Vegetables, Other","fabio" +"7444","Ghana","GHA","Oranges, Mandarines","fabio" +"7445","Ghana","GHA","Lemons, Limes and products","fabio" +"7446","Ghana","GHA","Grapefruit and products","fabio" +"7447","Ghana","GHA","Citrus, Other","fabio" +"7448","Ghana","GHA","Bananas","fabio" +"7449","Ghana","GHA","Plantains","fabio" +"7450","Ghana","GHA","Apples and products","fabio" +"7451","Ghana","GHA","Pineapples and products","fabio" +"7452","Ghana","GHA","Dates","fabio" +"7453","Ghana","GHA","Grapes and products (excl wine)","fabio" +"7454","Ghana","GHA","Fruits, Other","fabio" +"7455","Ghana","GHA","Coffee and products","fabio" +"7456","Ghana","GHA","Cocoa Beans and products","fabio" +"7457","Ghana","GHA","Tea (including mate)","fabio" +"7458","Ghana","GHA","Hops","fabio" +"7459","Ghana","GHA","Pepper","fabio" +"7460","Ghana","GHA","Pimento","fabio" +"7461","Ghana","GHA","Cloves","fabio" +"7462","Ghana","GHA","Spices, Other","fabio" +"7463","Ghana","GHA","Jute","fabio" +"7464","Ghana","GHA","Jute-Like Fibres","fabio" +"7465","Ghana","GHA","Soft-Fibres, Other","fabio" +"7466","Ghana","GHA","Sisal","fabio" +"7467","Ghana","GHA","Abaca","fabio" +"7468","Ghana","GHA","Hard Fibres, Other","fabio" +"7469","Ghana","GHA","Tobacco","fabio" +"7470","Ghana","GHA","Rubber","fabio" +"7471","Ghana","GHA","Fodder crops","fabio" +"7472","Ghana","GHA","Grazing","fabio" +"7473","Ghana","GHA","Cottonseed","fabio" +"7474","Ghana","GHA","Palm kernels","fabio" +"7475","Ghana","GHA","Sugar non-centrifugal","fabio" +"7476","Ghana","GHA","Molasses","fabio" +"7477","Ghana","GHA","Sugar, Refined Equiv","fabio" +"7478","Ghana","GHA","Sweeteners, Other","fabio" +"7479","Ghana","GHA","Soyabean Oil","fabio" +"7480","Ghana","GHA","Groundnut Oil","fabio" +"7481","Ghana","GHA","Sunflowerseed Oil","fabio" +"7482","Ghana","GHA","Rape and Mustard Oil","fabio" +"7483","Ghana","GHA","Cottonseed Oil","fabio" +"7484","Ghana","GHA","Palmkernel Oil","fabio" +"7485","Ghana","GHA","Palm Oil","fabio" +"7486","Ghana","GHA","Coconut Oil","fabio" +"7487","Ghana","GHA","Sesameseed Oil","fabio" +"7488","Ghana","GHA","Olive Oil","fabio" +"7489","Ghana","GHA","Ricebran Oil","fabio" +"7490","Ghana","GHA","Maize Germ Oil","fabio" +"7491","Ghana","GHA","Oilcrops Oil, Other","fabio" +"7492","Ghana","GHA","Soyabean Cake","fabio" +"7493","Ghana","GHA","Groundnut Cake","fabio" +"7494","Ghana","GHA","Sunflowerseed Cake","fabio" +"7495","Ghana","GHA","Rape and Mustard Cake","fabio" +"7496","Ghana","GHA","Cottonseed Cake","fabio" +"7497","Ghana","GHA","Palmkernel Cake","fabio" +"7498","Ghana","GHA","Copra Cake","fabio" +"7499","Ghana","GHA","Sesameseed Cake","fabio" +"7500","Ghana","GHA","Oilseed Cakes, Other","fabio" +"7501","Ghana","GHA","Wine","fabio" +"7502","Ghana","GHA","Beer","fabio" +"7503","Ghana","GHA","Beverages, Fermented","fabio" +"7504","Ghana","GHA","Beverages, Alcoholic","fabio" +"7505","Ghana","GHA","Alcohol, Non-Food","fabio" +"7506","Ghana","GHA","Cotton lint","fabio" +"7507","Ghana","GHA","Cattle","fabio" +"7508","Ghana","GHA","Buffaloes","fabio" +"7509","Ghana","GHA","Sheep","fabio" +"7510","Ghana","GHA","Goats","fabio" +"7511","Ghana","GHA","Pigs","fabio" +"7512","Ghana","GHA","Poultry Birds","fabio" +"7513","Ghana","GHA","Horses","fabio" +"7514","Ghana","GHA","Asses","fabio" +"7515","Ghana","GHA","Mules","fabio" +"7516","Ghana","GHA","Camels","fabio" +"7517","Ghana","GHA","Camelids, other","fabio" +"7518","Ghana","GHA","Rabbits and hares","fabio" +"7519","Ghana","GHA","Rodents, other","fabio" +"7520","Ghana","GHA","Live animals, other","fabio" +"7521","Ghana","GHA","Milk - Excluding Butter","fabio" +"7522","Ghana","GHA","Butter, Ghee","fabio" +"7523","Ghana","GHA","Eggs","fabio" +"7524","Ghana","GHA","Wool (Clean Eq.)","fabio" +"7525","Ghana","GHA","Bovine Meat","fabio" +"7526","Ghana","GHA","Mutton & Goat Meat","fabio" +"7527","Ghana","GHA","Pigmeat","fabio" +"7528","Ghana","GHA","Poultry Meat","fabio" +"7529","Ghana","GHA","Meat, Other","fabio" +"7530","Ghana","GHA","Offals, Edible","fabio" +"7531","Ghana","GHA","Fats, Animals, Raw","fabio" +"7532","Ghana","GHA","Hides and skins","fabio" +"7533","Ghana","GHA","Meat Meal","fabio" +"7534","Ghana","GHA","Pet food","fabio" +"7535","Ghana","GHA","Honey","fabio" +"7536","Ghana","GHA","Silk","fabio" +"7537","Ghana","GHA","Fish, Seafood","fabio" +"7538","Ghana","GHA","Wood fuel","fabio" +"7539","Ghana","GHA","Industrial roundwood, coniferous","fabio" +"7540","Ghana","GHA","Industrial roundwood, non-coniferous","fabio" +"7541","Kiribati","KIR","Rice (Milled Equivalent)","fabio" +"7542","Kiribati","KIR","Wheat and products","fabio" +"7543","Kiribati","KIR","Barley and products","fabio" +"7544","Kiribati","KIR","Maize and products","fabio" +"7545","Kiribati","KIR","Rye and products","fabio" +"7546","Kiribati","KIR","Oats","fabio" +"7547","Kiribati","KIR","Millet and products","fabio" +"7548","Kiribati","KIR","Sorghum and products","fabio" +"7549","Kiribati","KIR","Cereals, Other","fabio" +"7550","Kiribati","KIR","Potatoes and products","fabio" +"7551","Kiribati","KIR","Cassava and products","fabio" +"7552","Kiribati","KIR","Sweet potatoes","fabio" +"7553","Kiribati","KIR","Roots, Other","fabio" +"7554","Kiribati","KIR","Yams","fabio" +"7555","Kiribati","KIR","Sugar cane","fabio" +"7556","Kiribati","KIR","Sugar beet","fabio" +"7557","Kiribati","KIR","Beans","fabio" +"7558","Kiribati","KIR","Peas","fabio" +"7559","Kiribati","KIR","Pulses, Other and products","fabio" +"7560","Kiribati","KIR","Nuts and products","fabio" +"7561","Kiribati","KIR","Soyabeans","fabio" +"7562","Kiribati","KIR","Groundnuts (Shelled Eq)","fabio" +"7563","Kiribati","KIR","Sunflower seed","fabio" +"7564","Kiribati","KIR","Rape and Mustardseed","fabio" +"7565","Kiribati","KIR","Seed cotton","fabio" +"7566","Kiribati","KIR","Coconuts - Incl Copra","fabio" +"7567","Kiribati","KIR","Sesame seed","fabio" +"7568","Kiribati","KIR","Oil, palm fruit","fabio" +"7569","Kiribati","KIR","Olives (including preserved)","fabio" +"7570","Kiribati","KIR","Oilcrops, Other","fabio" +"7571","Kiribati","KIR","Tomatoes and products","fabio" +"7572","Kiribati","KIR","Onions","fabio" +"7573","Kiribati","KIR","Vegetables, Other","fabio" +"7574","Kiribati","KIR","Oranges, Mandarines","fabio" +"7575","Kiribati","KIR","Lemons, Limes and products","fabio" +"7576","Kiribati","KIR","Grapefruit and products","fabio" +"7577","Kiribati","KIR","Citrus, Other","fabio" +"7578","Kiribati","KIR","Bananas","fabio" +"7579","Kiribati","KIR","Plantains","fabio" +"7580","Kiribati","KIR","Apples and products","fabio" +"7581","Kiribati","KIR","Pineapples and products","fabio" +"7582","Kiribati","KIR","Dates","fabio" +"7583","Kiribati","KIR","Grapes and products (excl wine)","fabio" +"7584","Kiribati","KIR","Fruits, Other","fabio" +"7585","Kiribati","KIR","Coffee and products","fabio" +"7586","Kiribati","KIR","Cocoa Beans and products","fabio" +"7587","Kiribati","KIR","Tea (including mate)","fabio" +"7588","Kiribati","KIR","Hops","fabio" +"7589","Kiribati","KIR","Pepper","fabio" +"7590","Kiribati","KIR","Pimento","fabio" +"7591","Kiribati","KIR","Cloves","fabio" +"7592","Kiribati","KIR","Spices, Other","fabio" +"7593","Kiribati","KIR","Jute","fabio" +"7594","Kiribati","KIR","Jute-Like Fibres","fabio" +"7595","Kiribati","KIR","Soft-Fibres, Other","fabio" +"7596","Kiribati","KIR","Sisal","fabio" +"7597","Kiribati","KIR","Abaca","fabio" +"7598","Kiribati","KIR","Hard Fibres, Other","fabio" +"7599","Kiribati","KIR","Tobacco","fabio" +"7600","Kiribati","KIR","Rubber","fabio" +"7601","Kiribati","KIR","Fodder crops","fabio" +"7602","Kiribati","KIR","Grazing","fabio" +"7603","Kiribati","KIR","Cottonseed","fabio" +"7604","Kiribati","KIR","Palm kernels","fabio" +"7605","Kiribati","KIR","Sugar non-centrifugal","fabio" +"7606","Kiribati","KIR","Molasses","fabio" +"7607","Kiribati","KIR","Sugar, Refined Equiv","fabio" +"7608","Kiribati","KIR","Sweeteners, Other","fabio" +"7609","Kiribati","KIR","Soyabean Oil","fabio" +"7610","Kiribati","KIR","Groundnut Oil","fabio" +"7611","Kiribati","KIR","Sunflowerseed Oil","fabio" +"7612","Kiribati","KIR","Rape and Mustard Oil","fabio" +"7613","Kiribati","KIR","Cottonseed Oil","fabio" +"7614","Kiribati","KIR","Palmkernel Oil","fabio" +"7615","Kiribati","KIR","Palm Oil","fabio" +"7616","Kiribati","KIR","Coconut Oil","fabio" +"7617","Kiribati","KIR","Sesameseed Oil","fabio" +"7618","Kiribati","KIR","Olive Oil","fabio" +"7619","Kiribati","KIR","Ricebran Oil","fabio" +"7620","Kiribati","KIR","Maize Germ Oil","fabio" +"7621","Kiribati","KIR","Oilcrops Oil, Other","fabio" +"7622","Kiribati","KIR","Soyabean Cake","fabio" +"7623","Kiribati","KIR","Groundnut Cake","fabio" +"7624","Kiribati","KIR","Sunflowerseed Cake","fabio" +"7625","Kiribati","KIR","Rape and Mustard Cake","fabio" +"7626","Kiribati","KIR","Cottonseed Cake","fabio" +"7627","Kiribati","KIR","Palmkernel Cake","fabio" +"7628","Kiribati","KIR","Copra Cake","fabio" +"7629","Kiribati","KIR","Sesameseed Cake","fabio" +"7630","Kiribati","KIR","Oilseed Cakes, Other","fabio" +"7631","Kiribati","KIR","Wine","fabio" +"7632","Kiribati","KIR","Beer","fabio" +"7633","Kiribati","KIR","Beverages, Fermented","fabio" +"7634","Kiribati","KIR","Beverages, Alcoholic","fabio" +"7635","Kiribati","KIR","Alcohol, Non-Food","fabio" +"7636","Kiribati","KIR","Cotton lint","fabio" +"7637","Kiribati","KIR","Cattle","fabio" +"7638","Kiribati","KIR","Buffaloes","fabio" +"7639","Kiribati","KIR","Sheep","fabio" +"7640","Kiribati","KIR","Goats","fabio" +"7641","Kiribati","KIR","Pigs","fabio" +"7642","Kiribati","KIR","Poultry Birds","fabio" +"7643","Kiribati","KIR","Horses","fabio" +"7644","Kiribati","KIR","Asses","fabio" +"7645","Kiribati","KIR","Mules","fabio" +"7646","Kiribati","KIR","Camels","fabio" +"7647","Kiribati","KIR","Camelids, other","fabio" +"7648","Kiribati","KIR","Rabbits and hares","fabio" +"7649","Kiribati","KIR","Rodents, other","fabio" +"7650","Kiribati","KIR","Live animals, other","fabio" +"7651","Kiribati","KIR","Milk - Excluding Butter","fabio" +"7652","Kiribati","KIR","Butter, Ghee","fabio" +"7653","Kiribati","KIR","Eggs","fabio" +"7654","Kiribati","KIR","Wool (Clean Eq.)","fabio" +"7655","Kiribati","KIR","Bovine Meat","fabio" +"7656","Kiribati","KIR","Mutton & Goat Meat","fabio" +"7657","Kiribati","KIR","Pigmeat","fabio" +"7658","Kiribati","KIR","Poultry Meat","fabio" +"7659","Kiribati","KIR","Meat, Other","fabio" +"7660","Kiribati","KIR","Offals, Edible","fabio" +"7661","Kiribati","KIR","Fats, Animals, Raw","fabio" +"7662","Kiribati","KIR","Hides and skins","fabio" +"7663","Kiribati","KIR","Meat Meal","fabio" +"7664","Kiribati","KIR","Pet food","fabio" +"7665","Kiribati","KIR","Honey","fabio" +"7666","Kiribati","KIR","Silk","fabio" +"7667","Kiribati","KIR","Fish, Seafood","fabio" +"7668","Kiribati","KIR","Wood fuel","fabio" +"7669","Kiribati","KIR","Industrial roundwood, coniferous","fabio" +"7670","Kiribati","KIR","Industrial roundwood, non-coniferous","fabio" +"7671","Greece","GRC","Rice (Milled Equivalent)","fabio" +"7672","Greece","GRC","Wheat and products","fabio" +"7673","Greece","GRC","Barley and products","fabio" +"7674","Greece","GRC","Maize and products","fabio" +"7675","Greece","GRC","Rye and products","fabio" +"7676","Greece","GRC","Oats","fabio" +"7677","Greece","GRC","Millet and products","fabio" +"7678","Greece","GRC","Sorghum and products","fabio" +"7679","Greece","GRC","Cereals, Other","fabio" +"7680","Greece","GRC","Potatoes and products","fabio" +"7681","Greece","GRC","Cassava and products","fabio" +"7682","Greece","GRC","Sweet potatoes","fabio" +"7683","Greece","GRC","Roots, Other","fabio" +"7684","Greece","GRC","Yams","fabio" +"7685","Greece","GRC","Sugar cane","fabio" +"7686","Greece","GRC","Sugar beet","fabio" +"7687","Greece","GRC","Beans","fabio" +"7688","Greece","GRC","Peas","fabio" +"7689","Greece","GRC","Pulses, Other and products","fabio" +"7690","Greece","GRC","Nuts and products","fabio" +"7691","Greece","GRC","Soyabeans","fabio" +"7692","Greece","GRC","Groundnuts (Shelled Eq)","fabio" +"7693","Greece","GRC","Sunflower seed","fabio" +"7694","Greece","GRC","Rape and Mustardseed","fabio" +"7695","Greece","GRC","Seed cotton","fabio" +"7696","Greece","GRC","Coconuts - Incl Copra","fabio" +"7697","Greece","GRC","Sesame seed","fabio" +"7698","Greece","GRC","Oil, palm fruit","fabio" +"7699","Greece","GRC","Olives (including preserved)","fabio" +"7700","Greece","GRC","Oilcrops, Other","fabio" +"7701","Greece","GRC","Tomatoes and products","fabio" +"7702","Greece","GRC","Onions","fabio" +"7703","Greece","GRC","Vegetables, Other","fabio" +"7704","Greece","GRC","Oranges, Mandarines","fabio" +"7705","Greece","GRC","Lemons, Limes and products","fabio" +"7706","Greece","GRC","Grapefruit and products","fabio" +"7707","Greece","GRC","Citrus, Other","fabio" +"7708","Greece","GRC","Bananas","fabio" +"7709","Greece","GRC","Plantains","fabio" +"7710","Greece","GRC","Apples and products","fabio" +"7711","Greece","GRC","Pineapples and products","fabio" +"7712","Greece","GRC","Dates","fabio" +"7713","Greece","GRC","Grapes and products (excl wine)","fabio" +"7714","Greece","GRC","Fruits, Other","fabio" +"7715","Greece","GRC","Coffee and products","fabio" +"7716","Greece","GRC","Cocoa Beans and products","fabio" +"7717","Greece","GRC","Tea (including mate)","fabio" +"7718","Greece","GRC","Hops","fabio" +"7719","Greece","GRC","Pepper","fabio" +"7720","Greece","GRC","Pimento","fabio" +"7721","Greece","GRC","Cloves","fabio" +"7722","Greece","GRC","Spices, Other","fabio" +"7723","Greece","GRC","Jute","fabio" +"7724","Greece","GRC","Jute-Like Fibres","fabio" +"7725","Greece","GRC","Soft-Fibres, Other","fabio" +"7726","Greece","GRC","Sisal","fabio" +"7727","Greece","GRC","Abaca","fabio" +"7728","Greece","GRC","Hard Fibres, Other","fabio" +"7729","Greece","GRC","Tobacco","fabio" +"7730","Greece","GRC","Rubber","fabio" +"7731","Greece","GRC","Fodder crops","fabio" +"7732","Greece","GRC","Grazing","fabio" +"7733","Greece","GRC","Cottonseed","fabio" +"7734","Greece","GRC","Palm kernels","fabio" +"7735","Greece","GRC","Sugar non-centrifugal","fabio" +"7736","Greece","GRC","Molasses","fabio" +"7737","Greece","GRC","Sugar, Refined Equiv","fabio" +"7738","Greece","GRC","Sweeteners, Other","fabio" +"7739","Greece","GRC","Soyabean Oil","fabio" +"7740","Greece","GRC","Groundnut Oil","fabio" +"7741","Greece","GRC","Sunflowerseed Oil","fabio" +"7742","Greece","GRC","Rape and Mustard Oil","fabio" +"7743","Greece","GRC","Cottonseed Oil","fabio" +"7744","Greece","GRC","Palmkernel Oil","fabio" +"7745","Greece","GRC","Palm Oil","fabio" +"7746","Greece","GRC","Coconut Oil","fabio" +"7747","Greece","GRC","Sesameseed Oil","fabio" +"7748","Greece","GRC","Olive Oil","fabio" +"7749","Greece","GRC","Ricebran Oil","fabio" +"7750","Greece","GRC","Maize Germ Oil","fabio" +"7751","Greece","GRC","Oilcrops Oil, Other","fabio" +"7752","Greece","GRC","Soyabean Cake","fabio" +"7753","Greece","GRC","Groundnut Cake","fabio" +"7754","Greece","GRC","Sunflowerseed Cake","fabio" +"7755","Greece","GRC","Rape and Mustard Cake","fabio" +"7756","Greece","GRC","Cottonseed Cake","fabio" +"7757","Greece","GRC","Palmkernel Cake","fabio" +"7758","Greece","GRC","Copra Cake","fabio" +"7759","Greece","GRC","Sesameseed Cake","fabio" +"7760","Greece","GRC","Oilseed Cakes, Other","fabio" +"7761","Greece","GRC","Wine","fabio" +"7762","Greece","GRC","Beer","fabio" +"7763","Greece","GRC","Beverages, Fermented","fabio" +"7764","Greece","GRC","Beverages, Alcoholic","fabio" +"7765","Greece","GRC","Alcohol, Non-Food","fabio" +"7766","Greece","GRC","Cotton lint","fabio" +"7767","Greece","GRC","Cattle","fabio" +"7768","Greece","GRC","Buffaloes","fabio" +"7769","Greece","GRC","Sheep","fabio" +"7770","Greece","GRC","Goats","fabio" +"7771","Greece","GRC","Pigs","fabio" +"7772","Greece","GRC","Poultry Birds","fabio" +"7773","Greece","GRC","Horses","fabio" +"7774","Greece","GRC","Asses","fabio" +"7775","Greece","GRC","Mules","fabio" +"7776","Greece","GRC","Camels","fabio" +"7777","Greece","GRC","Camelids, other","fabio" +"7778","Greece","GRC","Rabbits and hares","fabio" +"7779","Greece","GRC","Rodents, other","fabio" +"7780","Greece","GRC","Live animals, other","fabio" +"7781","Greece","GRC","Milk - Excluding Butter","fabio" +"7782","Greece","GRC","Butter, Ghee","fabio" +"7783","Greece","GRC","Eggs","fabio" +"7784","Greece","GRC","Wool (Clean Eq.)","fabio" +"7785","Greece","GRC","Bovine Meat","fabio" +"7786","Greece","GRC","Mutton & Goat Meat","fabio" +"7787","Greece","GRC","Pigmeat","fabio" +"7788","Greece","GRC","Poultry Meat","fabio" +"7789","Greece","GRC","Meat, Other","fabio" +"7790","Greece","GRC","Offals, Edible","fabio" +"7791","Greece","GRC","Fats, Animals, Raw","fabio" +"7792","Greece","GRC","Hides and skins","fabio" +"7793","Greece","GRC","Meat Meal","fabio" +"7794","Greece","GRC","Pet food","fabio" +"7795","Greece","GRC","Honey","fabio" +"7796","Greece","GRC","Silk","fabio" +"7797","Greece","GRC","Fish, Seafood","fabio" +"7798","Greece","GRC","Wood fuel","fabio" +"7799","Greece","GRC","Industrial roundwood, coniferous","fabio" +"7800","Greece","GRC","Industrial roundwood, non-coniferous","fabio" +"7801","Grenada","GRD","Rice (Milled Equivalent)","fabio" +"7802","Grenada","GRD","Wheat and products","fabio" +"7803","Grenada","GRD","Barley and products","fabio" +"7804","Grenada","GRD","Maize and products","fabio" +"7805","Grenada","GRD","Rye and products","fabio" +"7806","Grenada","GRD","Oats","fabio" +"7807","Grenada","GRD","Millet and products","fabio" +"7808","Grenada","GRD","Sorghum and products","fabio" +"7809","Grenada","GRD","Cereals, Other","fabio" +"7810","Grenada","GRD","Potatoes and products","fabio" +"7811","Grenada","GRD","Cassava and products","fabio" +"7812","Grenada","GRD","Sweet potatoes","fabio" +"7813","Grenada","GRD","Roots, Other","fabio" +"7814","Grenada","GRD","Yams","fabio" +"7815","Grenada","GRD","Sugar cane","fabio" +"7816","Grenada","GRD","Sugar beet","fabio" +"7817","Grenada","GRD","Beans","fabio" +"7818","Grenada","GRD","Peas","fabio" +"7819","Grenada","GRD","Pulses, Other and products","fabio" +"7820","Grenada","GRD","Nuts and products","fabio" +"7821","Grenada","GRD","Soyabeans","fabio" +"7822","Grenada","GRD","Groundnuts (Shelled Eq)","fabio" +"7823","Grenada","GRD","Sunflower seed","fabio" +"7824","Grenada","GRD","Rape and Mustardseed","fabio" +"7825","Grenada","GRD","Seed cotton","fabio" +"7826","Grenada","GRD","Coconuts - Incl Copra","fabio" +"7827","Grenada","GRD","Sesame seed","fabio" +"7828","Grenada","GRD","Oil, palm fruit","fabio" +"7829","Grenada","GRD","Olives (including preserved)","fabio" +"7830","Grenada","GRD","Oilcrops, Other","fabio" +"7831","Grenada","GRD","Tomatoes and products","fabio" +"7832","Grenada","GRD","Onions","fabio" +"7833","Grenada","GRD","Vegetables, Other","fabio" +"7834","Grenada","GRD","Oranges, Mandarines","fabio" +"7835","Grenada","GRD","Lemons, Limes and products","fabio" +"7836","Grenada","GRD","Grapefruit and products","fabio" +"7837","Grenada","GRD","Citrus, Other","fabio" +"7838","Grenada","GRD","Bananas","fabio" +"7839","Grenada","GRD","Plantains","fabio" +"7840","Grenada","GRD","Apples and products","fabio" +"7841","Grenada","GRD","Pineapples and products","fabio" +"7842","Grenada","GRD","Dates","fabio" +"7843","Grenada","GRD","Grapes and products (excl wine)","fabio" +"7844","Grenada","GRD","Fruits, Other","fabio" +"7845","Grenada","GRD","Coffee and products","fabio" +"7846","Grenada","GRD","Cocoa Beans and products","fabio" +"7847","Grenada","GRD","Tea (including mate)","fabio" +"7848","Grenada","GRD","Hops","fabio" +"7849","Grenada","GRD","Pepper","fabio" +"7850","Grenada","GRD","Pimento","fabio" +"7851","Grenada","GRD","Cloves","fabio" +"7852","Grenada","GRD","Spices, Other","fabio" +"7853","Grenada","GRD","Jute","fabio" +"7854","Grenada","GRD","Jute-Like Fibres","fabio" +"7855","Grenada","GRD","Soft-Fibres, Other","fabio" +"7856","Grenada","GRD","Sisal","fabio" +"7857","Grenada","GRD","Abaca","fabio" +"7858","Grenada","GRD","Hard Fibres, Other","fabio" +"7859","Grenada","GRD","Tobacco","fabio" +"7860","Grenada","GRD","Rubber","fabio" +"7861","Grenada","GRD","Fodder crops","fabio" +"7862","Grenada","GRD","Grazing","fabio" +"7863","Grenada","GRD","Cottonseed","fabio" +"7864","Grenada","GRD","Palm kernels","fabio" +"7865","Grenada","GRD","Sugar non-centrifugal","fabio" +"7866","Grenada","GRD","Molasses","fabio" +"7867","Grenada","GRD","Sugar, Refined Equiv","fabio" +"7868","Grenada","GRD","Sweeteners, Other","fabio" +"7869","Grenada","GRD","Soyabean Oil","fabio" +"7870","Grenada","GRD","Groundnut Oil","fabio" +"7871","Grenada","GRD","Sunflowerseed Oil","fabio" +"7872","Grenada","GRD","Rape and Mustard Oil","fabio" +"7873","Grenada","GRD","Cottonseed Oil","fabio" +"7874","Grenada","GRD","Palmkernel Oil","fabio" +"7875","Grenada","GRD","Palm Oil","fabio" +"7876","Grenada","GRD","Coconut Oil","fabio" +"7877","Grenada","GRD","Sesameseed Oil","fabio" +"7878","Grenada","GRD","Olive Oil","fabio" +"7879","Grenada","GRD","Ricebran Oil","fabio" +"7880","Grenada","GRD","Maize Germ Oil","fabio" +"7881","Grenada","GRD","Oilcrops Oil, Other","fabio" +"7882","Grenada","GRD","Soyabean Cake","fabio" +"7883","Grenada","GRD","Groundnut Cake","fabio" +"7884","Grenada","GRD","Sunflowerseed Cake","fabio" +"7885","Grenada","GRD","Rape and Mustard Cake","fabio" +"7886","Grenada","GRD","Cottonseed Cake","fabio" +"7887","Grenada","GRD","Palmkernel Cake","fabio" +"7888","Grenada","GRD","Copra Cake","fabio" +"7889","Grenada","GRD","Sesameseed Cake","fabio" +"7890","Grenada","GRD","Oilseed Cakes, Other","fabio" +"7891","Grenada","GRD","Wine","fabio" +"7892","Grenada","GRD","Beer","fabio" +"7893","Grenada","GRD","Beverages, Fermented","fabio" +"7894","Grenada","GRD","Beverages, Alcoholic","fabio" +"7895","Grenada","GRD","Alcohol, Non-Food","fabio" +"7896","Grenada","GRD","Cotton lint","fabio" +"7897","Grenada","GRD","Cattle","fabio" +"7898","Grenada","GRD","Buffaloes","fabio" +"7899","Grenada","GRD","Sheep","fabio" +"7900","Grenada","GRD","Goats","fabio" +"7901","Grenada","GRD","Pigs","fabio" +"7902","Grenada","GRD","Poultry Birds","fabio" +"7903","Grenada","GRD","Horses","fabio" +"7904","Grenada","GRD","Asses","fabio" +"7905","Grenada","GRD","Mules","fabio" +"7906","Grenada","GRD","Camels","fabio" +"7907","Grenada","GRD","Camelids, other","fabio" +"7908","Grenada","GRD","Rabbits and hares","fabio" +"7909","Grenada","GRD","Rodents, other","fabio" +"7910","Grenada","GRD","Live animals, other","fabio" +"7911","Grenada","GRD","Milk - Excluding Butter","fabio" +"7912","Grenada","GRD","Butter, Ghee","fabio" +"7913","Grenada","GRD","Eggs","fabio" +"7914","Grenada","GRD","Wool (Clean Eq.)","fabio" +"7915","Grenada","GRD","Bovine Meat","fabio" +"7916","Grenada","GRD","Mutton & Goat Meat","fabio" +"7917","Grenada","GRD","Pigmeat","fabio" +"7918","Grenada","GRD","Poultry Meat","fabio" +"7919","Grenada","GRD","Meat, Other","fabio" +"7920","Grenada","GRD","Offals, Edible","fabio" +"7921","Grenada","GRD","Fats, Animals, Raw","fabio" +"7922","Grenada","GRD","Hides and skins","fabio" +"7923","Grenada","GRD","Meat Meal","fabio" +"7924","Grenada","GRD","Pet food","fabio" +"7925","Grenada","GRD","Honey","fabio" +"7926","Grenada","GRD","Silk","fabio" +"7927","Grenada","GRD","Fish, Seafood","fabio" +"7928","Grenada","GRD","Wood fuel","fabio" +"7929","Grenada","GRD","Industrial roundwood, coniferous","fabio" +"7930","Grenada","GRD","Industrial roundwood, non-coniferous","fabio" +"7931","Guatemala","GTM","Rice (Milled Equivalent)","fabio" +"7932","Guatemala","GTM","Wheat and products","fabio" +"7933","Guatemala","GTM","Barley and products","fabio" +"7934","Guatemala","GTM","Maize and products","fabio" +"7935","Guatemala","GTM","Rye and products","fabio" +"7936","Guatemala","GTM","Oats","fabio" +"7937","Guatemala","GTM","Millet and products","fabio" +"7938","Guatemala","GTM","Sorghum and products","fabio" +"7939","Guatemala","GTM","Cereals, Other","fabio" +"7940","Guatemala","GTM","Potatoes and products","fabio" +"7941","Guatemala","GTM","Cassava and products","fabio" +"7942","Guatemala","GTM","Sweet potatoes","fabio" +"7943","Guatemala","GTM","Roots, Other","fabio" +"7944","Guatemala","GTM","Yams","fabio" +"7945","Guatemala","GTM","Sugar cane","fabio" +"7946","Guatemala","GTM","Sugar beet","fabio" +"7947","Guatemala","GTM","Beans","fabio" +"7948","Guatemala","GTM","Peas","fabio" +"7949","Guatemala","GTM","Pulses, Other and products","fabio" +"7950","Guatemala","GTM","Nuts and products","fabio" +"7951","Guatemala","GTM","Soyabeans","fabio" +"7952","Guatemala","GTM","Groundnuts (Shelled Eq)","fabio" +"7953","Guatemala","GTM","Sunflower seed","fabio" +"7954","Guatemala","GTM","Rape and Mustardseed","fabio" +"7955","Guatemala","GTM","Seed cotton","fabio" +"7956","Guatemala","GTM","Coconuts - Incl Copra","fabio" +"7957","Guatemala","GTM","Sesame seed","fabio" +"7958","Guatemala","GTM","Oil, palm fruit","fabio" +"7959","Guatemala","GTM","Olives (including preserved)","fabio" +"7960","Guatemala","GTM","Oilcrops, Other","fabio" +"7961","Guatemala","GTM","Tomatoes and products","fabio" +"7962","Guatemala","GTM","Onions","fabio" +"7963","Guatemala","GTM","Vegetables, Other","fabio" +"7964","Guatemala","GTM","Oranges, Mandarines","fabio" +"7965","Guatemala","GTM","Lemons, Limes and products","fabio" +"7966","Guatemala","GTM","Grapefruit and products","fabio" +"7967","Guatemala","GTM","Citrus, Other","fabio" +"7968","Guatemala","GTM","Bananas","fabio" +"7969","Guatemala","GTM","Plantains","fabio" +"7970","Guatemala","GTM","Apples and products","fabio" +"7971","Guatemala","GTM","Pineapples and products","fabio" +"7972","Guatemala","GTM","Dates","fabio" +"7973","Guatemala","GTM","Grapes and products (excl wine)","fabio" +"7974","Guatemala","GTM","Fruits, Other","fabio" +"7975","Guatemala","GTM","Coffee and products","fabio" +"7976","Guatemala","GTM","Cocoa Beans and products","fabio" +"7977","Guatemala","GTM","Tea (including mate)","fabio" +"7978","Guatemala","GTM","Hops","fabio" +"7979","Guatemala","GTM","Pepper","fabio" +"7980","Guatemala","GTM","Pimento","fabio" +"7981","Guatemala","GTM","Cloves","fabio" +"7982","Guatemala","GTM","Spices, Other","fabio" +"7983","Guatemala","GTM","Jute","fabio" +"7984","Guatemala","GTM","Jute-Like Fibres","fabio" +"7985","Guatemala","GTM","Soft-Fibres, Other","fabio" +"7986","Guatemala","GTM","Sisal","fabio" +"7987","Guatemala","GTM","Abaca","fabio" +"7988","Guatemala","GTM","Hard Fibres, Other","fabio" +"7989","Guatemala","GTM","Tobacco","fabio" +"7990","Guatemala","GTM","Rubber","fabio" +"7991","Guatemala","GTM","Fodder crops","fabio" +"7992","Guatemala","GTM","Grazing","fabio" +"7993","Guatemala","GTM","Cottonseed","fabio" +"7994","Guatemala","GTM","Palm kernels","fabio" +"7995","Guatemala","GTM","Sugar non-centrifugal","fabio" +"7996","Guatemala","GTM","Molasses","fabio" +"7997","Guatemala","GTM","Sugar, Refined Equiv","fabio" +"7998","Guatemala","GTM","Sweeteners, Other","fabio" +"7999","Guatemala","GTM","Soyabean Oil","fabio" +"8000","Guatemala","GTM","Groundnut Oil","fabio" +"8001","Guatemala","GTM","Sunflowerseed Oil","fabio" +"8002","Guatemala","GTM","Rape and Mustard Oil","fabio" +"8003","Guatemala","GTM","Cottonseed Oil","fabio" +"8004","Guatemala","GTM","Palmkernel Oil","fabio" +"8005","Guatemala","GTM","Palm Oil","fabio" +"8006","Guatemala","GTM","Coconut Oil","fabio" +"8007","Guatemala","GTM","Sesameseed Oil","fabio" +"8008","Guatemala","GTM","Olive Oil","fabio" +"8009","Guatemala","GTM","Ricebran Oil","fabio" +"8010","Guatemala","GTM","Maize Germ Oil","fabio" +"8011","Guatemala","GTM","Oilcrops Oil, Other","fabio" +"8012","Guatemala","GTM","Soyabean Cake","fabio" +"8013","Guatemala","GTM","Groundnut Cake","fabio" +"8014","Guatemala","GTM","Sunflowerseed Cake","fabio" +"8015","Guatemala","GTM","Rape and Mustard Cake","fabio" +"8016","Guatemala","GTM","Cottonseed Cake","fabio" +"8017","Guatemala","GTM","Palmkernel Cake","fabio" +"8018","Guatemala","GTM","Copra Cake","fabio" +"8019","Guatemala","GTM","Sesameseed Cake","fabio" +"8020","Guatemala","GTM","Oilseed Cakes, Other","fabio" +"8021","Guatemala","GTM","Wine","fabio" +"8022","Guatemala","GTM","Beer","fabio" +"8023","Guatemala","GTM","Beverages, Fermented","fabio" +"8024","Guatemala","GTM","Beverages, Alcoholic","fabio" +"8025","Guatemala","GTM","Alcohol, Non-Food","fabio" +"8026","Guatemala","GTM","Cotton lint","fabio" +"8027","Guatemala","GTM","Cattle","fabio" +"8028","Guatemala","GTM","Buffaloes","fabio" +"8029","Guatemala","GTM","Sheep","fabio" +"8030","Guatemala","GTM","Goats","fabio" +"8031","Guatemala","GTM","Pigs","fabio" +"8032","Guatemala","GTM","Poultry Birds","fabio" +"8033","Guatemala","GTM","Horses","fabio" +"8034","Guatemala","GTM","Asses","fabio" +"8035","Guatemala","GTM","Mules","fabio" +"8036","Guatemala","GTM","Camels","fabio" +"8037","Guatemala","GTM","Camelids, other","fabio" +"8038","Guatemala","GTM","Rabbits and hares","fabio" +"8039","Guatemala","GTM","Rodents, other","fabio" +"8040","Guatemala","GTM","Live animals, other","fabio" +"8041","Guatemala","GTM","Milk - Excluding Butter","fabio" +"8042","Guatemala","GTM","Butter, Ghee","fabio" +"8043","Guatemala","GTM","Eggs","fabio" +"8044","Guatemala","GTM","Wool (Clean Eq.)","fabio" +"8045","Guatemala","GTM","Bovine Meat","fabio" +"8046","Guatemala","GTM","Mutton & Goat Meat","fabio" +"8047","Guatemala","GTM","Pigmeat","fabio" +"8048","Guatemala","GTM","Poultry Meat","fabio" +"8049","Guatemala","GTM","Meat, Other","fabio" +"8050","Guatemala","GTM","Offals, Edible","fabio" +"8051","Guatemala","GTM","Fats, Animals, Raw","fabio" +"8052","Guatemala","GTM","Hides and skins","fabio" +"8053","Guatemala","GTM","Meat Meal","fabio" +"8054","Guatemala","GTM","Pet food","fabio" +"8055","Guatemala","GTM","Honey","fabio" +"8056","Guatemala","GTM","Silk","fabio" +"8057","Guatemala","GTM","Fish, Seafood","fabio" +"8058","Guatemala","GTM","Wood fuel","fabio" +"8059","Guatemala","GTM","Industrial roundwood, coniferous","fabio" +"8060","Guatemala","GTM","Industrial roundwood, non-coniferous","fabio" +"8061","Guinea","GIN","Rice (Milled Equivalent)","fabio" +"8062","Guinea","GIN","Wheat and products","fabio" +"8063","Guinea","GIN","Barley and products","fabio" +"8064","Guinea","GIN","Maize and products","fabio" +"8065","Guinea","GIN","Rye and products","fabio" +"8066","Guinea","GIN","Oats","fabio" +"8067","Guinea","GIN","Millet and products","fabio" +"8068","Guinea","GIN","Sorghum and products","fabio" +"8069","Guinea","GIN","Cereals, Other","fabio" +"8070","Guinea","GIN","Potatoes and products","fabio" +"8071","Guinea","GIN","Cassava and products","fabio" +"8072","Guinea","GIN","Sweet potatoes","fabio" +"8073","Guinea","GIN","Roots, Other","fabio" +"8074","Guinea","GIN","Yams","fabio" +"8075","Guinea","GIN","Sugar cane","fabio" +"8076","Guinea","GIN","Sugar beet","fabio" +"8077","Guinea","GIN","Beans","fabio" +"8078","Guinea","GIN","Peas","fabio" +"8079","Guinea","GIN","Pulses, Other and products","fabio" +"8080","Guinea","GIN","Nuts and products","fabio" +"8081","Guinea","GIN","Soyabeans","fabio" +"8082","Guinea","GIN","Groundnuts (Shelled Eq)","fabio" +"8083","Guinea","GIN","Sunflower seed","fabio" +"8084","Guinea","GIN","Rape and Mustardseed","fabio" +"8085","Guinea","GIN","Seed cotton","fabio" +"8086","Guinea","GIN","Coconuts - Incl Copra","fabio" +"8087","Guinea","GIN","Sesame seed","fabio" +"8088","Guinea","GIN","Oil, palm fruit","fabio" +"8089","Guinea","GIN","Olives (including preserved)","fabio" +"8090","Guinea","GIN","Oilcrops, Other","fabio" +"8091","Guinea","GIN","Tomatoes and products","fabio" +"8092","Guinea","GIN","Onions","fabio" +"8093","Guinea","GIN","Vegetables, Other","fabio" +"8094","Guinea","GIN","Oranges, Mandarines","fabio" +"8095","Guinea","GIN","Lemons, Limes and products","fabio" +"8096","Guinea","GIN","Grapefruit and products","fabio" +"8097","Guinea","GIN","Citrus, Other","fabio" +"8098","Guinea","GIN","Bananas","fabio" +"8099","Guinea","GIN","Plantains","fabio" +"8100","Guinea","GIN","Apples and products","fabio" +"8101","Guinea","GIN","Pineapples and products","fabio" +"8102","Guinea","GIN","Dates","fabio" +"8103","Guinea","GIN","Grapes and products (excl wine)","fabio" +"8104","Guinea","GIN","Fruits, Other","fabio" +"8105","Guinea","GIN","Coffee and products","fabio" +"8106","Guinea","GIN","Cocoa Beans and products","fabio" +"8107","Guinea","GIN","Tea (including mate)","fabio" +"8108","Guinea","GIN","Hops","fabio" +"8109","Guinea","GIN","Pepper","fabio" +"8110","Guinea","GIN","Pimento","fabio" +"8111","Guinea","GIN","Cloves","fabio" +"8112","Guinea","GIN","Spices, Other","fabio" +"8113","Guinea","GIN","Jute","fabio" +"8114","Guinea","GIN","Jute-Like Fibres","fabio" +"8115","Guinea","GIN","Soft-Fibres, Other","fabio" +"8116","Guinea","GIN","Sisal","fabio" +"8117","Guinea","GIN","Abaca","fabio" +"8118","Guinea","GIN","Hard Fibres, Other","fabio" +"8119","Guinea","GIN","Tobacco","fabio" +"8120","Guinea","GIN","Rubber","fabio" +"8121","Guinea","GIN","Fodder crops","fabio" +"8122","Guinea","GIN","Grazing","fabio" +"8123","Guinea","GIN","Cottonseed","fabio" +"8124","Guinea","GIN","Palm kernels","fabio" +"8125","Guinea","GIN","Sugar non-centrifugal","fabio" +"8126","Guinea","GIN","Molasses","fabio" +"8127","Guinea","GIN","Sugar, Refined Equiv","fabio" +"8128","Guinea","GIN","Sweeteners, Other","fabio" +"8129","Guinea","GIN","Soyabean Oil","fabio" +"8130","Guinea","GIN","Groundnut Oil","fabio" +"8131","Guinea","GIN","Sunflowerseed Oil","fabio" +"8132","Guinea","GIN","Rape and Mustard Oil","fabio" +"8133","Guinea","GIN","Cottonseed Oil","fabio" +"8134","Guinea","GIN","Palmkernel Oil","fabio" +"8135","Guinea","GIN","Palm Oil","fabio" +"8136","Guinea","GIN","Coconut Oil","fabio" +"8137","Guinea","GIN","Sesameseed Oil","fabio" +"8138","Guinea","GIN","Olive Oil","fabio" +"8139","Guinea","GIN","Ricebran Oil","fabio" +"8140","Guinea","GIN","Maize Germ Oil","fabio" +"8141","Guinea","GIN","Oilcrops Oil, Other","fabio" +"8142","Guinea","GIN","Soyabean Cake","fabio" +"8143","Guinea","GIN","Groundnut Cake","fabio" +"8144","Guinea","GIN","Sunflowerseed Cake","fabio" +"8145","Guinea","GIN","Rape and Mustard Cake","fabio" +"8146","Guinea","GIN","Cottonseed Cake","fabio" +"8147","Guinea","GIN","Palmkernel Cake","fabio" +"8148","Guinea","GIN","Copra Cake","fabio" +"8149","Guinea","GIN","Sesameseed Cake","fabio" +"8150","Guinea","GIN","Oilseed Cakes, Other","fabio" +"8151","Guinea","GIN","Wine","fabio" +"8152","Guinea","GIN","Beer","fabio" +"8153","Guinea","GIN","Beverages, Fermented","fabio" +"8154","Guinea","GIN","Beverages, Alcoholic","fabio" +"8155","Guinea","GIN","Alcohol, Non-Food","fabio" +"8156","Guinea","GIN","Cotton lint","fabio" +"8157","Guinea","GIN","Cattle","fabio" +"8158","Guinea","GIN","Buffaloes","fabio" +"8159","Guinea","GIN","Sheep","fabio" +"8160","Guinea","GIN","Goats","fabio" +"8161","Guinea","GIN","Pigs","fabio" +"8162","Guinea","GIN","Poultry Birds","fabio" +"8163","Guinea","GIN","Horses","fabio" +"8164","Guinea","GIN","Asses","fabio" +"8165","Guinea","GIN","Mules","fabio" +"8166","Guinea","GIN","Camels","fabio" +"8167","Guinea","GIN","Camelids, other","fabio" +"8168","Guinea","GIN","Rabbits and hares","fabio" +"8169","Guinea","GIN","Rodents, other","fabio" +"8170","Guinea","GIN","Live animals, other","fabio" +"8171","Guinea","GIN","Milk - Excluding Butter","fabio" +"8172","Guinea","GIN","Butter, Ghee","fabio" +"8173","Guinea","GIN","Eggs","fabio" +"8174","Guinea","GIN","Wool (Clean Eq.)","fabio" +"8175","Guinea","GIN","Bovine Meat","fabio" +"8176","Guinea","GIN","Mutton & Goat Meat","fabio" +"8177","Guinea","GIN","Pigmeat","fabio" +"8178","Guinea","GIN","Poultry Meat","fabio" +"8179","Guinea","GIN","Meat, Other","fabio" +"8180","Guinea","GIN","Offals, Edible","fabio" +"8181","Guinea","GIN","Fats, Animals, Raw","fabio" +"8182","Guinea","GIN","Hides and skins","fabio" +"8183","Guinea","GIN","Meat Meal","fabio" +"8184","Guinea","GIN","Pet food","fabio" +"8185","Guinea","GIN","Honey","fabio" +"8186","Guinea","GIN","Silk","fabio" +"8187","Guinea","GIN","Fish, Seafood","fabio" +"8188","Guinea","GIN","Wood fuel","fabio" +"8189","Guinea","GIN","Industrial roundwood, coniferous","fabio" +"8190","Guinea","GIN","Industrial roundwood, non-coniferous","fabio" +"8191","Guyana","GUY","Rice (Milled Equivalent)","fabio" +"8192","Guyana","GUY","Wheat and products","fabio" +"8193","Guyana","GUY","Barley and products","fabio" +"8194","Guyana","GUY","Maize and products","fabio" +"8195","Guyana","GUY","Rye and products","fabio" +"8196","Guyana","GUY","Oats","fabio" +"8197","Guyana","GUY","Millet and products","fabio" +"8198","Guyana","GUY","Sorghum and products","fabio" +"8199","Guyana","GUY","Cereals, Other","fabio" +"8200","Guyana","GUY","Potatoes and products","fabio" +"8201","Guyana","GUY","Cassava and products","fabio" +"8202","Guyana","GUY","Sweet potatoes","fabio" +"8203","Guyana","GUY","Roots, Other","fabio" +"8204","Guyana","GUY","Yams","fabio" +"8205","Guyana","GUY","Sugar cane","fabio" +"8206","Guyana","GUY","Sugar beet","fabio" +"8207","Guyana","GUY","Beans","fabio" +"8208","Guyana","GUY","Peas","fabio" +"8209","Guyana","GUY","Pulses, Other and products","fabio" +"8210","Guyana","GUY","Nuts and products","fabio" +"8211","Guyana","GUY","Soyabeans","fabio" +"8212","Guyana","GUY","Groundnuts (Shelled Eq)","fabio" +"8213","Guyana","GUY","Sunflower seed","fabio" +"8214","Guyana","GUY","Rape and Mustardseed","fabio" +"8215","Guyana","GUY","Seed cotton","fabio" +"8216","Guyana","GUY","Coconuts - Incl Copra","fabio" +"8217","Guyana","GUY","Sesame seed","fabio" +"8218","Guyana","GUY","Oil, palm fruit","fabio" +"8219","Guyana","GUY","Olives (including preserved)","fabio" +"8220","Guyana","GUY","Oilcrops, Other","fabio" +"8221","Guyana","GUY","Tomatoes and products","fabio" +"8222","Guyana","GUY","Onions","fabio" +"8223","Guyana","GUY","Vegetables, Other","fabio" +"8224","Guyana","GUY","Oranges, Mandarines","fabio" +"8225","Guyana","GUY","Lemons, Limes and products","fabio" +"8226","Guyana","GUY","Grapefruit and products","fabio" +"8227","Guyana","GUY","Citrus, Other","fabio" +"8228","Guyana","GUY","Bananas","fabio" +"8229","Guyana","GUY","Plantains","fabio" +"8230","Guyana","GUY","Apples and products","fabio" +"8231","Guyana","GUY","Pineapples and products","fabio" +"8232","Guyana","GUY","Dates","fabio" +"8233","Guyana","GUY","Grapes and products (excl wine)","fabio" +"8234","Guyana","GUY","Fruits, Other","fabio" +"8235","Guyana","GUY","Coffee and products","fabio" +"8236","Guyana","GUY","Cocoa Beans and products","fabio" +"8237","Guyana","GUY","Tea (including mate)","fabio" +"8238","Guyana","GUY","Hops","fabio" +"8239","Guyana","GUY","Pepper","fabio" +"8240","Guyana","GUY","Pimento","fabio" +"8241","Guyana","GUY","Cloves","fabio" +"8242","Guyana","GUY","Spices, Other","fabio" +"8243","Guyana","GUY","Jute","fabio" +"8244","Guyana","GUY","Jute-Like Fibres","fabio" +"8245","Guyana","GUY","Soft-Fibres, Other","fabio" +"8246","Guyana","GUY","Sisal","fabio" +"8247","Guyana","GUY","Abaca","fabio" +"8248","Guyana","GUY","Hard Fibres, Other","fabio" +"8249","Guyana","GUY","Tobacco","fabio" +"8250","Guyana","GUY","Rubber","fabio" +"8251","Guyana","GUY","Fodder crops","fabio" +"8252","Guyana","GUY","Grazing","fabio" +"8253","Guyana","GUY","Cottonseed","fabio" +"8254","Guyana","GUY","Palm kernels","fabio" +"8255","Guyana","GUY","Sugar non-centrifugal","fabio" +"8256","Guyana","GUY","Molasses","fabio" +"8257","Guyana","GUY","Sugar, Refined Equiv","fabio" +"8258","Guyana","GUY","Sweeteners, Other","fabio" +"8259","Guyana","GUY","Soyabean Oil","fabio" +"8260","Guyana","GUY","Groundnut Oil","fabio" +"8261","Guyana","GUY","Sunflowerseed Oil","fabio" +"8262","Guyana","GUY","Rape and Mustard Oil","fabio" +"8263","Guyana","GUY","Cottonseed Oil","fabio" +"8264","Guyana","GUY","Palmkernel Oil","fabio" +"8265","Guyana","GUY","Palm Oil","fabio" +"8266","Guyana","GUY","Coconut Oil","fabio" +"8267","Guyana","GUY","Sesameseed Oil","fabio" +"8268","Guyana","GUY","Olive Oil","fabio" +"8269","Guyana","GUY","Ricebran Oil","fabio" +"8270","Guyana","GUY","Maize Germ Oil","fabio" +"8271","Guyana","GUY","Oilcrops Oil, Other","fabio" +"8272","Guyana","GUY","Soyabean Cake","fabio" +"8273","Guyana","GUY","Groundnut Cake","fabio" +"8274","Guyana","GUY","Sunflowerseed Cake","fabio" +"8275","Guyana","GUY","Rape and Mustard Cake","fabio" +"8276","Guyana","GUY","Cottonseed Cake","fabio" +"8277","Guyana","GUY","Palmkernel Cake","fabio" +"8278","Guyana","GUY","Copra Cake","fabio" +"8279","Guyana","GUY","Sesameseed Cake","fabio" +"8280","Guyana","GUY","Oilseed Cakes, Other","fabio" +"8281","Guyana","GUY","Wine","fabio" +"8282","Guyana","GUY","Beer","fabio" +"8283","Guyana","GUY","Beverages, Fermented","fabio" +"8284","Guyana","GUY","Beverages, Alcoholic","fabio" +"8285","Guyana","GUY","Alcohol, Non-Food","fabio" +"8286","Guyana","GUY","Cotton lint","fabio" +"8287","Guyana","GUY","Cattle","fabio" +"8288","Guyana","GUY","Buffaloes","fabio" +"8289","Guyana","GUY","Sheep","fabio" +"8290","Guyana","GUY","Goats","fabio" +"8291","Guyana","GUY","Pigs","fabio" +"8292","Guyana","GUY","Poultry Birds","fabio" +"8293","Guyana","GUY","Horses","fabio" +"8294","Guyana","GUY","Asses","fabio" +"8295","Guyana","GUY","Mules","fabio" +"8296","Guyana","GUY","Camels","fabio" +"8297","Guyana","GUY","Camelids, other","fabio" +"8298","Guyana","GUY","Rabbits and hares","fabio" +"8299","Guyana","GUY","Rodents, other","fabio" +"8300","Guyana","GUY","Live animals, other","fabio" +"8301","Guyana","GUY","Milk - Excluding Butter","fabio" +"8302","Guyana","GUY","Butter, Ghee","fabio" +"8303","Guyana","GUY","Eggs","fabio" +"8304","Guyana","GUY","Wool (Clean Eq.)","fabio" +"8305","Guyana","GUY","Bovine Meat","fabio" +"8306","Guyana","GUY","Mutton & Goat Meat","fabio" +"8307","Guyana","GUY","Pigmeat","fabio" +"8308","Guyana","GUY","Poultry Meat","fabio" +"8309","Guyana","GUY","Meat, Other","fabio" +"8310","Guyana","GUY","Offals, Edible","fabio" +"8311","Guyana","GUY","Fats, Animals, Raw","fabio" +"8312","Guyana","GUY","Hides and skins","fabio" +"8313","Guyana","GUY","Meat Meal","fabio" +"8314","Guyana","GUY","Pet food","fabio" +"8315","Guyana","GUY","Honey","fabio" +"8316","Guyana","GUY","Silk","fabio" +"8317","Guyana","GUY","Fish, Seafood","fabio" +"8318","Guyana","GUY","Wood fuel","fabio" +"8319","Guyana","GUY","Industrial roundwood, coniferous","fabio" +"8320","Guyana","GUY","Industrial roundwood, non-coniferous","fabio" +"8321","Haiti","HTI","Rice (Milled Equivalent)","fabio" +"8322","Haiti","HTI","Wheat and products","fabio" +"8323","Haiti","HTI","Barley and products","fabio" +"8324","Haiti","HTI","Maize and products","fabio" +"8325","Haiti","HTI","Rye and products","fabio" +"8326","Haiti","HTI","Oats","fabio" +"8327","Haiti","HTI","Millet and products","fabio" +"8328","Haiti","HTI","Sorghum and products","fabio" +"8329","Haiti","HTI","Cereals, Other","fabio" +"8330","Haiti","HTI","Potatoes and products","fabio" +"8331","Haiti","HTI","Cassava and products","fabio" +"8332","Haiti","HTI","Sweet potatoes","fabio" +"8333","Haiti","HTI","Roots, Other","fabio" +"8334","Haiti","HTI","Yams","fabio" +"8335","Haiti","HTI","Sugar cane","fabio" +"8336","Haiti","HTI","Sugar beet","fabio" +"8337","Haiti","HTI","Beans","fabio" +"8338","Haiti","HTI","Peas","fabio" +"8339","Haiti","HTI","Pulses, Other and products","fabio" +"8340","Haiti","HTI","Nuts and products","fabio" +"8341","Haiti","HTI","Soyabeans","fabio" +"8342","Haiti","HTI","Groundnuts (Shelled Eq)","fabio" +"8343","Haiti","HTI","Sunflower seed","fabio" +"8344","Haiti","HTI","Rape and Mustardseed","fabio" +"8345","Haiti","HTI","Seed cotton","fabio" +"8346","Haiti","HTI","Coconuts - Incl Copra","fabio" +"8347","Haiti","HTI","Sesame seed","fabio" +"8348","Haiti","HTI","Oil, palm fruit","fabio" +"8349","Haiti","HTI","Olives (including preserved)","fabio" +"8350","Haiti","HTI","Oilcrops, Other","fabio" +"8351","Haiti","HTI","Tomatoes and products","fabio" +"8352","Haiti","HTI","Onions","fabio" +"8353","Haiti","HTI","Vegetables, Other","fabio" +"8354","Haiti","HTI","Oranges, Mandarines","fabio" +"8355","Haiti","HTI","Lemons, Limes and products","fabio" +"8356","Haiti","HTI","Grapefruit and products","fabio" +"8357","Haiti","HTI","Citrus, Other","fabio" +"8358","Haiti","HTI","Bananas","fabio" +"8359","Haiti","HTI","Plantains","fabio" +"8360","Haiti","HTI","Apples and products","fabio" +"8361","Haiti","HTI","Pineapples and products","fabio" +"8362","Haiti","HTI","Dates","fabio" +"8363","Haiti","HTI","Grapes and products (excl wine)","fabio" +"8364","Haiti","HTI","Fruits, Other","fabio" +"8365","Haiti","HTI","Coffee and products","fabio" +"8366","Haiti","HTI","Cocoa Beans and products","fabio" +"8367","Haiti","HTI","Tea (including mate)","fabio" +"8368","Haiti","HTI","Hops","fabio" +"8369","Haiti","HTI","Pepper","fabio" +"8370","Haiti","HTI","Pimento","fabio" +"8371","Haiti","HTI","Cloves","fabio" +"8372","Haiti","HTI","Spices, Other","fabio" +"8373","Haiti","HTI","Jute","fabio" +"8374","Haiti","HTI","Jute-Like Fibres","fabio" +"8375","Haiti","HTI","Soft-Fibres, Other","fabio" +"8376","Haiti","HTI","Sisal","fabio" +"8377","Haiti","HTI","Abaca","fabio" +"8378","Haiti","HTI","Hard Fibres, Other","fabio" +"8379","Haiti","HTI","Tobacco","fabio" +"8380","Haiti","HTI","Rubber","fabio" +"8381","Haiti","HTI","Fodder crops","fabio" +"8382","Haiti","HTI","Grazing","fabio" +"8383","Haiti","HTI","Cottonseed","fabio" +"8384","Haiti","HTI","Palm kernels","fabio" +"8385","Haiti","HTI","Sugar non-centrifugal","fabio" +"8386","Haiti","HTI","Molasses","fabio" +"8387","Haiti","HTI","Sugar, Refined Equiv","fabio" +"8388","Haiti","HTI","Sweeteners, Other","fabio" +"8389","Haiti","HTI","Soyabean Oil","fabio" +"8390","Haiti","HTI","Groundnut Oil","fabio" +"8391","Haiti","HTI","Sunflowerseed Oil","fabio" +"8392","Haiti","HTI","Rape and Mustard Oil","fabio" +"8393","Haiti","HTI","Cottonseed Oil","fabio" +"8394","Haiti","HTI","Palmkernel Oil","fabio" +"8395","Haiti","HTI","Palm Oil","fabio" +"8396","Haiti","HTI","Coconut Oil","fabio" +"8397","Haiti","HTI","Sesameseed Oil","fabio" +"8398","Haiti","HTI","Olive Oil","fabio" +"8399","Haiti","HTI","Ricebran Oil","fabio" +"8400","Haiti","HTI","Maize Germ Oil","fabio" +"8401","Haiti","HTI","Oilcrops Oil, Other","fabio" +"8402","Haiti","HTI","Soyabean Cake","fabio" +"8403","Haiti","HTI","Groundnut Cake","fabio" +"8404","Haiti","HTI","Sunflowerseed Cake","fabio" +"8405","Haiti","HTI","Rape and Mustard Cake","fabio" +"8406","Haiti","HTI","Cottonseed Cake","fabio" +"8407","Haiti","HTI","Palmkernel Cake","fabio" +"8408","Haiti","HTI","Copra Cake","fabio" +"8409","Haiti","HTI","Sesameseed Cake","fabio" +"8410","Haiti","HTI","Oilseed Cakes, Other","fabio" +"8411","Haiti","HTI","Wine","fabio" +"8412","Haiti","HTI","Beer","fabio" +"8413","Haiti","HTI","Beverages, Fermented","fabio" +"8414","Haiti","HTI","Beverages, Alcoholic","fabio" +"8415","Haiti","HTI","Alcohol, Non-Food","fabio" +"8416","Haiti","HTI","Cotton lint","fabio" +"8417","Haiti","HTI","Cattle","fabio" +"8418","Haiti","HTI","Buffaloes","fabio" +"8419","Haiti","HTI","Sheep","fabio" +"8420","Haiti","HTI","Goats","fabio" +"8421","Haiti","HTI","Pigs","fabio" +"8422","Haiti","HTI","Poultry Birds","fabio" +"8423","Haiti","HTI","Horses","fabio" +"8424","Haiti","HTI","Asses","fabio" +"8425","Haiti","HTI","Mules","fabio" +"8426","Haiti","HTI","Camels","fabio" +"8427","Haiti","HTI","Camelids, other","fabio" +"8428","Haiti","HTI","Rabbits and hares","fabio" +"8429","Haiti","HTI","Rodents, other","fabio" +"8430","Haiti","HTI","Live animals, other","fabio" +"8431","Haiti","HTI","Milk - Excluding Butter","fabio" +"8432","Haiti","HTI","Butter, Ghee","fabio" +"8433","Haiti","HTI","Eggs","fabio" +"8434","Haiti","HTI","Wool (Clean Eq.)","fabio" +"8435","Haiti","HTI","Bovine Meat","fabio" +"8436","Haiti","HTI","Mutton & Goat Meat","fabio" +"8437","Haiti","HTI","Pigmeat","fabio" +"8438","Haiti","HTI","Poultry Meat","fabio" +"8439","Haiti","HTI","Meat, Other","fabio" +"8440","Haiti","HTI","Offals, Edible","fabio" +"8441","Haiti","HTI","Fats, Animals, Raw","fabio" +"8442","Haiti","HTI","Hides and skins","fabio" +"8443","Haiti","HTI","Meat Meal","fabio" +"8444","Haiti","HTI","Pet food","fabio" +"8445","Haiti","HTI","Honey","fabio" +"8446","Haiti","HTI","Silk","fabio" +"8447","Haiti","HTI","Fish, Seafood","fabio" +"8448","Haiti","HTI","Wood fuel","fabio" +"8449","Haiti","HTI","Industrial roundwood, coniferous","fabio" +"8450","Haiti","HTI","Industrial roundwood, non-coniferous","fabio" +"8451","Honduras","HND","Rice (Milled Equivalent)","fabio" +"8452","Honduras","HND","Wheat and products","fabio" +"8453","Honduras","HND","Barley and products","fabio" +"8454","Honduras","HND","Maize and products","fabio" +"8455","Honduras","HND","Rye and products","fabio" +"8456","Honduras","HND","Oats","fabio" +"8457","Honduras","HND","Millet and products","fabio" +"8458","Honduras","HND","Sorghum and products","fabio" +"8459","Honduras","HND","Cereals, Other","fabio" +"8460","Honduras","HND","Potatoes and products","fabio" +"8461","Honduras","HND","Cassava and products","fabio" +"8462","Honduras","HND","Sweet potatoes","fabio" +"8463","Honduras","HND","Roots, Other","fabio" +"8464","Honduras","HND","Yams","fabio" +"8465","Honduras","HND","Sugar cane","fabio" +"8466","Honduras","HND","Sugar beet","fabio" +"8467","Honduras","HND","Beans","fabio" +"8468","Honduras","HND","Peas","fabio" +"8469","Honduras","HND","Pulses, Other and products","fabio" +"8470","Honduras","HND","Nuts and products","fabio" +"8471","Honduras","HND","Soyabeans","fabio" +"8472","Honduras","HND","Groundnuts (Shelled Eq)","fabio" +"8473","Honduras","HND","Sunflower seed","fabio" +"8474","Honduras","HND","Rape and Mustardseed","fabio" +"8475","Honduras","HND","Seed cotton","fabio" +"8476","Honduras","HND","Coconuts - Incl Copra","fabio" +"8477","Honduras","HND","Sesame seed","fabio" +"8478","Honduras","HND","Oil, palm fruit","fabio" +"8479","Honduras","HND","Olives (including preserved)","fabio" +"8480","Honduras","HND","Oilcrops, Other","fabio" +"8481","Honduras","HND","Tomatoes and products","fabio" +"8482","Honduras","HND","Onions","fabio" +"8483","Honduras","HND","Vegetables, Other","fabio" +"8484","Honduras","HND","Oranges, Mandarines","fabio" +"8485","Honduras","HND","Lemons, Limes and products","fabio" +"8486","Honduras","HND","Grapefruit and products","fabio" +"8487","Honduras","HND","Citrus, Other","fabio" +"8488","Honduras","HND","Bananas","fabio" +"8489","Honduras","HND","Plantains","fabio" +"8490","Honduras","HND","Apples and products","fabio" +"8491","Honduras","HND","Pineapples and products","fabio" +"8492","Honduras","HND","Dates","fabio" +"8493","Honduras","HND","Grapes and products (excl wine)","fabio" +"8494","Honduras","HND","Fruits, Other","fabio" +"8495","Honduras","HND","Coffee and products","fabio" +"8496","Honduras","HND","Cocoa Beans and products","fabio" +"8497","Honduras","HND","Tea (including mate)","fabio" +"8498","Honduras","HND","Hops","fabio" +"8499","Honduras","HND","Pepper","fabio" +"8500","Honduras","HND","Pimento","fabio" +"8501","Honduras","HND","Cloves","fabio" +"8502","Honduras","HND","Spices, Other","fabio" +"8503","Honduras","HND","Jute","fabio" +"8504","Honduras","HND","Jute-Like Fibres","fabio" +"8505","Honduras","HND","Soft-Fibres, Other","fabio" +"8506","Honduras","HND","Sisal","fabio" +"8507","Honduras","HND","Abaca","fabio" +"8508","Honduras","HND","Hard Fibres, Other","fabio" +"8509","Honduras","HND","Tobacco","fabio" +"8510","Honduras","HND","Rubber","fabio" +"8511","Honduras","HND","Fodder crops","fabio" +"8512","Honduras","HND","Grazing","fabio" +"8513","Honduras","HND","Cottonseed","fabio" +"8514","Honduras","HND","Palm kernels","fabio" +"8515","Honduras","HND","Sugar non-centrifugal","fabio" +"8516","Honduras","HND","Molasses","fabio" +"8517","Honduras","HND","Sugar, Refined Equiv","fabio" +"8518","Honduras","HND","Sweeteners, Other","fabio" +"8519","Honduras","HND","Soyabean Oil","fabio" +"8520","Honduras","HND","Groundnut Oil","fabio" +"8521","Honduras","HND","Sunflowerseed Oil","fabio" +"8522","Honduras","HND","Rape and Mustard Oil","fabio" +"8523","Honduras","HND","Cottonseed Oil","fabio" +"8524","Honduras","HND","Palmkernel Oil","fabio" +"8525","Honduras","HND","Palm Oil","fabio" +"8526","Honduras","HND","Coconut Oil","fabio" +"8527","Honduras","HND","Sesameseed Oil","fabio" +"8528","Honduras","HND","Olive Oil","fabio" +"8529","Honduras","HND","Ricebran Oil","fabio" +"8530","Honduras","HND","Maize Germ Oil","fabio" +"8531","Honduras","HND","Oilcrops Oil, Other","fabio" +"8532","Honduras","HND","Soyabean Cake","fabio" +"8533","Honduras","HND","Groundnut Cake","fabio" +"8534","Honduras","HND","Sunflowerseed Cake","fabio" +"8535","Honduras","HND","Rape and Mustard Cake","fabio" +"8536","Honduras","HND","Cottonseed Cake","fabio" +"8537","Honduras","HND","Palmkernel Cake","fabio" +"8538","Honduras","HND","Copra Cake","fabio" +"8539","Honduras","HND","Sesameseed Cake","fabio" +"8540","Honduras","HND","Oilseed Cakes, Other","fabio" +"8541","Honduras","HND","Wine","fabio" +"8542","Honduras","HND","Beer","fabio" +"8543","Honduras","HND","Beverages, Fermented","fabio" +"8544","Honduras","HND","Beverages, Alcoholic","fabio" +"8545","Honduras","HND","Alcohol, Non-Food","fabio" +"8546","Honduras","HND","Cotton lint","fabio" +"8547","Honduras","HND","Cattle","fabio" +"8548","Honduras","HND","Buffaloes","fabio" +"8549","Honduras","HND","Sheep","fabio" +"8550","Honduras","HND","Goats","fabio" +"8551","Honduras","HND","Pigs","fabio" +"8552","Honduras","HND","Poultry Birds","fabio" +"8553","Honduras","HND","Horses","fabio" +"8554","Honduras","HND","Asses","fabio" +"8555","Honduras","HND","Mules","fabio" +"8556","Honduras","HND","Camels","fabio" +"8557","Honduras","HND","Camelids, other","fabio" +"8558","Honduras","HND","Rabbits and hares","fabio" +"8559","Honduras","HND","Rodents, other","fabio" +"8560","Honduras","HND","Live animals, other","fabio" +"8561","Honduras","HND","Milk - Excluding Butter","fabio" +"8562","Honduras","HND","Butter, Ghee","fabio" +"8563","Honduras","HND","Eggs","fabio" +"8564","Honduras","HND","Wool (Clean Eq.)","fabio" +"8565","Honduras","HND","Bovine Meat","fabio" +"8566","Honduras","HND","Mutton & Goat Meat","fabio" +"8567","Honduras","HND","Pigmeat","fabio" +"8568","Honduras","HND","Poultry Meat","fabio" +"8569","Honduras","HND","Meat, Other","fabio" +"8570","Honduras","HND","Offals, Edible","fabio" +"8571","Honduras","HND","Fats, Animals, Raw","fabio" +"8572","Honduras","HND","Hides and skins","fabio" +"8573","Honduras","HND","Meat Meal","fabio" +"8574","Honduras","HND","Pet food","fabio" +"8575","Honduras","HND","Honey","fabio" +"8576","Honduras","HND","Silk","fabio" +"8577","Honduras","HND","Fish, Seafood","fabio" +"8578","Honduras","HND","Wood fuel","fabio" +"8579","Honduras","HND","Industrial roundwood, coniferous","fabio" +"8580","Honduras","HND","Industrial roundwood, non-coniferous","fabio" +"8581","China, Hong Kong SAR","HKG","Rice (Milled Equivalent)","fabio" +"8582","China, Hong Kong SAR","HKG","Wheat and products","fabio" +"8583","China, Hong Kong SAR","HKG","Barley and products","fabio" +"8584","China, Hong Kong SAR","HKG","Maize and products","fabio" +"8585","China, Hong Kong SAR","HKG","Rye and products","fabio" +"8586","China, Hong Kong SAR","HKG","Oats","fabio" +"8587","China, Hong Kong SAR","HKG","Millet and products","fabio" +"8588","China, Hong Kong SAR","HKG","Sorghum and products","fabio" +"8589","China, Hong Kong SAR","HKG","Cereals, Other","fabio" +"8590","China, Hong Kong SAR","HKG","Potatoes and products","fabio" +"8591","China, Hong Kong SAR","HKG","Cassava and products","fabio" +"8592","China, Hong Kong SAR","HKG","Sweet potatoes","fabio" +"8593","China, Hong Kong SAR","HKG","Roots, Other","fabio" +"8594","China, Hong Kong SAR","HKG","Yams","fabio" +"8595","China, Hong Kong SAR","HKG","Sugar cane","fabio" +"8596","China, Hong Kong SAR","HKG","Sugar beet","fabio" +"8597","China, Hong Kong SAR","HKG","Beans","fabio" +"8598","China, Hong Kong SAR","HKG","Peas","fabio" +"8599","China, Hong Kong SAR","HKG","Pulses, Other and products","fabio" +"8600","China, Hong Kong SAR","HKG","Nuts and products","fabio" +"8601","China, Hong Kong SAR","HKG","Soyabeans","fabio" +"8602","China, Hong Kong SAR","HKG","Groundnuts (Shelled Eq)","fabio" +"8603","China, Hong Kong SAR","HKG","Sunflower seed","fabio" +"8604","China, Hong Kong SAR","HKG","Rape and Mustardseed","fabio" +"8605","China, Hong Kong SAR","HKG","Seed cotton","fabio" +"8606","China, Hong Kong SAR","HKG","Coconuts - Incl Copra","fabio" +"8607","China, Hong Kong SAR","HKG","Sesame seed","fabio" +"8608","China, Hong Kong SAR","HKG","Oil, palm fruit","fabio" +"8609","China, Hong Kong SAR","HKG","Olives (including preserved)","fabio" +"8610","China, Hong Kong SAR","HKG","Oilcrops, Other","fabio" +"8611","China, Hong Kong SAR","HKG","Tomatoes and products","fabio" +"8612","China, Hong Kong SAR","HKG","Onions","fabio" +"8613","China, Hong Kong SAR","HKG","Vegetables, Other","fabio" +"8614","China, Hong Kong SAR","HKG","Oranges, Mandarines","fabio" +"8615","China, Hong Kong SAR","HKG","Lemons, Limes and products","fabio" +"8616","China, Hong Kong SAR","HKG","Grapefruit and products","fabio" +"8617","China, Hong Kong SAR","HKG","Citrus, Other","fabio" +"8618","China, Hong Kong SAR","HKG","Bananas","fabio" +"8619","China, Hong Kong SAR","HKG","Plantains","fabio" +"8620","China, Hong Kong SAR","HKG","Apples and products","fabio" +"8621","China, Hong Kong SAR","HKG","Pineapples and products","fabio" +"8622","China, Hong Kong SAR","HKG","Dates","fabio" +"8623","China, Hong Kong SAR","HKG","Grapes and products (excl wine)","fabio" +"8624","China, Hong Kong SAR","HKG","Fruits, Other","fabio" +"8625","China, Hong Kong SAR","HKG","Coffee and products","fabio" +"8626","China, Hong Kong SAR","HKG","Cocoa Beans and products","fabio" +"8627","China, Hong Kong SAR","HKG","Tea (including mate)","fabio" +"8628","China, Hong Kong SAR","HKG","Hops","fabio" +"8629","China, Hong Kong SAR","HKG","Pepper","fabio" +"8630","China, Hong Kong SAR","HKG","Pimento","fabio" +"8631","China, Hong Kong SAR","HKG","Cloves","fabio" +"8632","China, Hong Kong SAR","HKG","Spices, Other","fabio" +"8633","China, Hong Kong SAR","HKG","Jute","fabio" +"8634","China, Hong Kong SAR","HKG","Jute-Like Fibres","fabio" +"8635","China, Hong Kong SAR","HKG","Soft-Fibres, Other","fabio" +"8636","China, Hong Kong SAR","HKG","Sisal","fabio" +"8637","China, Hong Kong SAR","HKG","Abaca","fabio" +"8638","China, Hong Kong SAR","HKG","Hard Fibres, Other","fabio" +"8639","China, Hong Kong SAR","HKG","Tobacco","fabio" +"8640","China, Hong Kong SAR","HKG","Rubber","fabio" +"8641","China, Hong Kong SAR","HKG","Fodder crops","fabio" +"8642","China, Hong Kong SAR","HKG","Grazing","fabio" +"8643","China, Hong Kong SAR","HKG","Cottonseed","fabio" +"8644","China, Hong Kong SAR","HKG","Palm kernels","fabio" +"8645","China, Hong Kong SAR","HKG","Sugar non-centrifugal","fabio" +"8646","China, Hong Kong SAR","HKG","Molasses","fabio" +"8647","China, Hong Kong SAR","HKG","Sugar, Refined Equiv","fabio" +"8648","China, Hong Kong SAR","HKG","Sweeteners, Other","fabio" +"8649","China, Hong Kong SAR","HKG","Soyabean Oil","fabio" +"8650","China, Hong Kong SAR","HKG","Groundnut Oil","fabio" +"8651","China, Hong Kong SAR","HKG","Sunflowerseed Oil","fabio" +"8652","China, Hong Kong SAR","HKG","Rape and Mustard Oil","fabio" +"8653","China, Hong Kong SAR","HKG","Cottonseed Oil","fabio" +"8654","China, Hong Kong SAR","HKG","Palmkernel Oil","fabio" +"8655","China, Hong Kong SAR","HKG","Palm Oil","fabio" +"8656","China, Hong Kong SAR","HKG","Coconut Oil","fabio" +"8657","China, Hong Kong SAR","HKG","Sesameseed Oil","fabio" +"8658","China, Hong Kong SAR","HKG","Olive Oil","fabio" +"8659","China, Hong Kong SAR","HKG","Ricebran Oil","fabio" +"8660","China, Hong Kong SAR","HKG","Maize Germ Oil","fabio" +"8661","China, Hong Kong SAR","HKG","Oilcrops Oil, Other","fabio" +"8662","China, Hong Kong SAR","HKG","Soyabean Cake","fabio" +"8663","China, Hong Kong SAR","HKG","Groundnut Cake","fabio" +"8664","China, Hong Kong SAR","HKG","Sunflowerseed Cake","fabio" +"8665","China, Hong Kong SAR","HKG","Rape and Mustard Cake","fabio" +"8666","China, Hong Kong SAR","HKG","Cottonseed Cake","fabio" +"8667","China, Hong Kong SAR","HKG","Palmkernel Cake","fabio" +"8668","China, Hong Kong SAR","HKG","Copra Cake","fabio" +"8669","China, Hong Kong SAR","HKG","Sesameseed Cake","fabio" +"8670","China, Hong Kong SAR","HKG","Oilseed Cakes, Other","fabio" +"8671","China, Hong Kong SAR","HKG","Wine","fabio" +"8672","China, Hong Kong SAR","HKG","Beer","fabio" +"8673","China, Hong Kong SAR","HKG","Beverages, Fermented","fabio" +"8674","China, Hong Kong SAR","HKG","Beverages, Alcoholic","fabio" +"8675","China, Hong Kong SAR","HKG","Alcohol, Non-Food","fabio" +"8676","China, Hong Kong SAR","HKG","Cotton lint","fabio" +"8677","China, Hong Kong SAR","HKG","Cattle","fabio" +"8678","China, Hong Kong SAR","HKG","Buffaloes","fabio" +"8679","China, Hong Kong SAR","HKG","Sheep","fabio" +"8680","China, Hong Kong SAR","HKG","Goats","fabio" +"8681","China, Hong Kong SAR","HKG","Pigs","fabio" +"8682","China, Hong Kong SAR","HKG","Poultry Birds","fabio" +"8683","China, Hong Kong SAR","HKG","Horses","fabio" +"8684","China, Hong Kong SAR","HKG","Asses","fabio" +"8685","China, Hong Kong SAR","HKG","Mules","fabio" +"8686","China, Hong Kong SAR","HKG","Camels","fabio" +"8687","China, Hong Kong SAR","HKG","Camelids, other","fabio" +"8688","China, Hong Kong SAR","HKG","Rabbits and hares","fabio" +"8689","China, Hong Kong SAR","HKG","Rodents, other","fabio" +"8690","China, Hong Kong SAR","HKG","Live animals, other","fabio" +"8691","China, Hong Kong SAR","HKG","Milk - Excluding Butter","fabio" +"8692","China, Hong Kong SAR","HKG","Butter, Ghee","fabio" +"8693","China, Hong Kong SAR","HKG","Eggs","fabio" +"8694","China, Hong Kong SAR","HKG","Wool (Clean Eq.)","fabio" +"8695","China, Hong Kong SAR","HKG","Bovine Meat","fabio" +"8696","China, Hong Kong SAR","HKG","Mutton & Goat Meat","fabio" +"8697","China, Hong Kong SAR","HKG","Pigmeat","fabio" +"8698","China, Hong Kong SAR","HKG","Poultry Meat","fabio" +"8699","China, Hong Kong SAR","HKG","Meat, Other","fabio" +"8700","China, Hong Kong SAR","HKG","Offals, Edible","fabio" +"8701","China, Hong Kong SAR","HKG","Fats, Animals, Raw","fabio" +"8702","China, Hong Kong SAR","HKG","Hides and skins","fabio" +"8703","China, Hong Kong SAR","HKG","Meat Meal","fabio" +"8704","China, Hong Kong SAR","HKG","Pet food","fabio" +"8705","China, Hong Kong SAR","HKG","Honey","fabio" +"8706","China, Hong Kong SAR","HKG","Silk","fabio" +"8707","China, Hong Kong SAR","HKG","Fish, Seafood","fabio" +"8708","China, Hong Kong SAR","HKG","Wood fuel","fabio" +"8709","China, Hong Kong SAR","HKG","Industrial roundwood, coniferous","fabio" +"8710","China, Hong Kong SAR","HKG","Industrial roundwood, non-coniferous","fabio" +"8711","Hungary","HUN","Rice (Milled Equivalent)","fabio" +"8712","Hungary","HUN","Wheat and products","fabio" +"8713","Hungary","HUN","Barley and products","fabio" +"8714","Hungary","HUN","Maize and products","fabio" +"8715","Hungary","HUN","Rye and products","fabio" +"8716","Hungary","HUN","Oats","fabio" +"8717","Hungary","HUN","Millet and products","fabio" +"8718","Hungary","HUN","Sorghum and products","fabio" +"8719","Hungary","HUN","Cereals, Other","fabio" +"8720","Hungary","HUN","Potatoes and products","fabio" +"8721","Hungary","HUN","Cassava and products","fabio" +"8722","Hungary","HUN","Sweet potatoes","fabio" +"8723","Hungary","HUN","Roots, Other","fabio" +"8724","Hungary","HUN","Yams","fabio" +"8725","Hungary","HUN","Sugar cane","fabio" +"8726","Hungary","HUN","Sugar beet","fabio" +"8727","Hungary","HUN","Beans","fabio" +"8728","Hungary","HUN","Peas","fabio" +"8729","Hungary","HUN","Pulses, Other and products","fabio" +"8730","Hungary","HUN","Nuts and products","fabio" +"8731","Hungary","HUN","Soyabeans","fabio" +"8732","Hungary","HUN","Groundnuts (Shelled Eq)","fabio" +"8733","Hungary","HUN","Sunflower seed","fabio" +"8734","Hungary","HUN","Rape and Mustardseed","fabio" +"8735","Hungary","HUN","Seed cotton","fabio" +"8736","Hungary","HUN","Coconuts - Incl Copra","fabio" +"8737","Hungary","HUN","Sesame seed","fabio" +"8738","Hungary","HUN","Oil, palm fruit","fabio" +"8739","Hungary","HUN","Olives (including preserved)","fabio" +"8740","Hungary","HUN","Oilcrops, Other","fabio" +"8741","Hungary","HUN","Tomatoes and products","fabio" +"8742","Hungary","HUN","Onions","fabio" +"8743","Hungary","HUN","Vegetables, Other","fabio" +"8744","Hungary","HUN","Oranges, Mandarines","fabio" +"8745","Hungary","HUN","Lemons, Limes and products","fabio" +"8746","Hungary","HUN","Grapefruit and products","fabio" +"8747","Hungary","HUN","Citrus, Other","fabio" +"8748","Hungary","HUN","Bananas","fabio" +"8749","Hungary","HUN","Plantains","fabio" +"8750","Hungary","HUN","Apples and products","fabio" +"8751","Hungary","HUN","Pineapples and products","fabio" +"8752","Hungary","HUN","Dates","fabio" +"8753","Hungary","HUN","Grapes and products (excl wine)","fabio" +"8754","Hungary","HUN","Fruits, Other","fabio" +"8755","Hungary","HUN","Coffee and products","fabio" +"8756","Hungary","HUN","Cocoa Beans and products","fabio" +"8757","Hungary","HUN","Tea (including mate)","fabio" +"8758","Hungary","HUN","Hops","fabio" +"8759","Hungary","HUN","Pepper","fabio" +"8760","Hungary","HUN","Pimento","fabio" +"8761","Hungary","HUN","Cloves","fabio" +"8762","Hungary","HUN","Spices, Other","fabio" +"8763","Hungary","HUN","Jute","fabio" +"8764","Hungary","HUN","Jute-Like Fibres","fabio" +"8765","Hungary","HUN","Soft-Fibres, Other","fabio" +"8766","Hungary","HUN","Sisal","fabio" +"8767","Hungary","HUN","Abaca","fabio" +"8768","Hungary","HUN","Hard Fibres, Other","fabio" +"8769","Hungary","HUN","Tobacco","fabio" +"8770","Hungary","HUN","Rubber","fabio" +"8771","Hungary","HUN","Fodder crops","fabio" +"8772","Hungary","HUN","Grazing","fabio" +"8773","Hungary","HUN","Cottonseed","fabio" +"8774","Hungary","HUN","Palm kernels","fabio" +"8775","Hungary","HUN","Sugar non-centrifugal","fabio" +"8776","Hungary","HUN","Molasses","fabio" +"8777","Hungary","HUN","Sugar, Refined Equiv","fabio" +"8778","Hungary","HUN","Sweeteners, Other","fabio" +"8779","Hungary","HUN","Soyabean Oil","fabio" +"8780","Hungary","HUN","Groundnut Oil","fabio" +"8781","Hungary","HUN","Sunflowerseed Oil","fabio" +"8782","Hungary","HUN","Rape and Mustard Oil","fabio" +"8783","Hungary","HUN","Cottonseed Oil","fabio" +"8784","Hungary","HUN","Palmkernel Oil","fabio" +"8785","Hungary","HUN","Palm Oil","fabio" +"8786","Hungary","HUN","Coconut Oil","fabio" +"8787","Hungary","HUN","Sesameseed Oil","fabio" +"8788","Hungary","HUN","Olive Oil","fabio" +"8789","Hungary","HUN","Ricebran Oil","fabio" +"8790","Hungary","HUN","Maize Germ Oil","fabio" +"8791","Hungary","HUN","Oilcrops Oil, Other","fabio" +"8792","Hungary","HUN","Soyabean Cake","fabio" +"8793","Hungary","HUN","Groundnut Cake","fabio" +"8794","Hungary","HUN","Sunflowerseed Cake","fabio" +"8795","Hungary","HUN","Rape and Mustard Cake","fabio" +"8796","Hungary","HUN","Cottonseed Cake","fabio" +"8797","Hungary","HUN","Palmkernel Cake","fabio" +"8798","Hungary","HUN","Copra Cake","fabio" +"8799","Hungary","HUN","Sesameseed Cake","fabio" +"8800","Hungary","HUN","Oilseed Cakes, Other","fabio" +"8801","Hungary","HUN","Wine","fabio" +"8802","Hungary","HUN","Beer","fabio" +"8803","Hungary","HUN","Beverages, Fermented","fabio" +"8804","Hungary","HUN","Beverages, Alcoholic","fabio" +"8805","Hungary","HUN","Alcohol, Non-Food","fabio" +"8806","Hungary","HUN","Cotton lint","fabio" +"8807","Hungary","HUN","Cattle","fabio" +"8808","Hungary","HUN","Buffaloes","fabio" +"8809","Hungary","HUN","Sheep","fabio" +"8810","Hungary","HUN","Goats","fabio" +"8811","Hungary","HUN","Pigs","fabio" +"8812","Hungary","HUN","Poultry Birds","fabio" +"8813","Hungary","HUN","Horses","fabio" +"8814","Hungary","HUN","Asses","fabio" +"8815","Hungary","HUN","Mules","fabio" +"8816","Hungary","HUN","Camels","fabio" +"8817","Hungary","HUN","Camelids, other","fabio" +"8818","Hungary","HUN","Rabbits and hares","fabio" +"8819","Hungary","HUN","Rodents, other","fabio" +"8820","Hungary","HUN","Live animals, other","fabio" +"8821","Hungary","HUN","Milk - Excluding Butter","fabio" +"8822","Hungary","HUN","Butter, Ghee","fabio" +"8823","Hungary","HUN","Eggs","fabio" +"8824","Hungary","HUN","Wool (Clean Eq.)","fabio" +"8825","Hungary","HUN","Bovine Meat","fabio" +"8826","Hungary","HUN","Mutton & Goat Meat","fabio" +"8827","Hungary","HUN","Pigmeat","fabio" +"8828","Hungary","HUN","Poultry Meat","fabio" +"8829","Hungary","HUN","Meat, Other","fabio" +"8830","Hungary","HUN","Offals, Edible","fabio" +"8831","Hungary","HUN","Fats, Animals, Raw","fabio" +"8832","Hungary","HUN","Hides and skins","fabio" +"8833","Hungary","HUN","Meat Meal","fabio" +"8834","Hungary","HUN","Pet food","fabio" +"8835","Hungary","HUN","Honey","fabio" +"8836","Hungary","HUN","Silk","fabio" +"8837","Hungary","HUN","Fish, Seafood","fabio" +"8838","Hungary","HUN","Wood fuel","fabio" +"8839","Hungary","HUN","Industrial roundwood, coniferous","fabio" +"8840","Hungary","HUN","Industrial roundwood, non-coniferous","fabio" +"8841","Croatia","HRV","Rice (Milled Equivalent)","fabio" +"8842","Croatia","HRV","Wheat and products","fabio" +"8843","Croatia","HRV","Barley and products","fabio" +"8844","Croatia","HRV","Maize and products","fabio" +"8845","Croatia","HRV","Rye and products","fabio" +"8846","Croatia","HRV","Oats","fabio" +"8847","Croatia","HRV","Millet and products","fabio" +"8848","Croatia","HRV","Sorghum and products","fabio" +"8849","Croatia","HRV","Cereals, Other","fabio" +"8850","Croatia","HRV","Potatoes and products","fabio" +"8851","Croatia","HRV","Cassava and products","fabio" +"8852","Croatia","HRV","Sweet potatoes","fabio" +"8853","Croatia","HRV","Roots, Other","fabio" +"8854","Croatia","HRV","Yams","fabio" +"8855","Croatia","HRV","Sugar cane","fabio" +"8856","Croatia","HRV","Sugar beet","fabio" +"8857","Croatia","HRV","Beans","fabio" +"8858","Croatia","HRV","Peas","fabio" +"8859","Croatia","HRV","Pulses, Other and products","fabio" +"8860","Croatia","HRV","Nuts and products","fabio" +"8861","Croatia","HRV","Soyabeans","fabio" +"8862","Croatia","HRV","Groundnuts (Shelled Eq)","fabio" +"8863","Croatia","HRV","Sunflower seed","fabio" +"8864","Croatia","HRV","Rape and Mustardseed","fabio" +"8865","Croatia","HRV","Seed cotton","fabio" +"8866","Croatia","HRV","Coconuts - Incl Copra","fabio" +"8867","Croatia","HRV","Sesame seed","fabio" +"8868","Croatia","HRV","Oil, palm fruit","fabio" +"8869","Croatia","HRV","Olives (including preserved)","fabio" +"8870","Croatia","HRV","Oilcrops, Other","fabio" +"8871","Croatia","HRV","Tomatoes and products","fabio" +"8872","Croatia","HRV","Onions","fabio" +"8873","Croatia","HRV","Vegetables, Other","fabio" +"8874","Croatia","HRV","Oranges, Mandarines","fabio" +"8875","Croatia","HRV","Lemons, Limes and products","fabio" +"8876","Croatia","HRV","Grapefruit and products","fabio" +"8877","Croatia","HRV","Citrus, Other","fabio" +"8878","Croatia","HRV","Bananas","fabio" +"8879","Croatia","HRV","Plantains","fabio" +"8880","Croatia","HRV","Apples and products","fabio" +"8881","Croatia","HRV","Pineapples and products","fabio" +"8882","Croatia","HRV","Dates","fabio" +"8883","Croatia","HRV","Grapes and products (excl wine)","fabio" +"8884","Croatia","HRV","Fruits, Other","fabio" +"8885","Croatia","HRV","Coffee and products","fabio" +"8886","Croatia","HRV","Cocoa Beans and products","fabio" +"8887","Croatia","HRV","Tea (including mate)","fabio" +"8888","Croatia","HRV","Hops","fabio" +"8889","Croatia","HRV","Pepper","fabio" +"8890","Croatia","HRV","Pimento","fabio" +"8891","Croatia","HRV","Cloves","fabio" +"8892","Croatia","HRV","Spices, Other","fabio" +"8893","Croatia","HRV","Jute","fabio" +"8894","Croatia","HRV","Jute-Like Fibres","fabio" +"8895","Croatia","HRV","Soft-Fibres, Other","fabio" +"8896","Croatia","HRV","Sisal","fabio" +"8897","Croatia","HRV","Abaca","fabio" +"8898","Croatia","HRV","Hard Fibres, Other","fabio" +"8899","Croatia","HRV","Tobacco","fabio" +"8900","Croatia","HRV","Rubber","fabio" +"8901","Croatia","HRV","Fodder crops","fabio" +"8902","Croatia","HRV","Grazing","fabio" +"8903","Croatia","HRV","Cottonseed","fabio" +"8904","Croatia","HRV","Palm kernels","fabio" +"8905","Croatia","HRV","Sugar non-centrifugal","fabio" +"8906","Croatia","HRV","Molasses","fabio" +"8907","Croatia","HRV","Sugar, Refined Equiv","fabio" +"8908","Croatia","HRV","Sweeteners, Other","fabio" +"8909","Croatia","HRV","Soyabean Oil","fabio" +"8910","Croatia","HRV","Groundnut Oil","fabio" +"8911","Croatia","HRV","Sunflowerseed Oil","fabio" +"8912","Croatia","HRV","Rape and Mustard Oil","fabio" +"8913","Croatia","HRV","Cottonseed Oil","fabio" +"8914","Croatia","HRV","Palmkernel Oil","fabio" +"8915","Croatia","HRV","Palm Oil","fabio" +"8916","Croatia","HRV","Coconut Oil","fabio" +"8917","Croatia","HRV","Sesameseed Oil","fabio" +"8918","Croatia","HRV","Olive Oil","fabio" +"8919","Croatia","HRV","Ricebran Oil","fabio" +"8920","Croatia","HRV","Maize Germ Oil","fabio" +"8921","Croatia","HRV","Oilcrops Oil, Other","fabio" +"8922","Croatia","HRV","Soyabean Cake","fabio" +"8923","Croatia","HRV","Groundnut Cake","fabio" +"8924","Croatia","HRV","Sunflowerseed Cake","fabio" +"8925","Croatia","HRV","Rape and Mustard Cake","fabio" +"8926","Croatia","HRV","Cottonseed Cake","fabio" +"8927","Croatia","HRV","Palmkernel Cake","fabio" +"8928","Croatia","HRV","Copra Cake","fabio" +"8929","Croatia","HRV","Sesameseed Cake","fabio" +"8930","Croatia","HRV","Oilseed Cakes, Other","fabio" +"8931","Croatia","HRV","Wine","fabio" +"8932","Croatia","HRV","Beer","fabio" +"8933","Croatia","HRV","Beverages, Fermented","fabio" +"8934","Croatia","HRV","Beverages, Alcoholic","fabio" +"8935","Croatia","HRV","Alcohol, Non-Food","fabio" +"8936","Croatia","HRV","Cotton lint","fabio" +"8937","Croatia","HRV","Cattle","fabio" +"8938","Croatia","HRV","Buffaloes","fabio" +"8939","Croatia","HRV","Sheep","fabio" +"8940","Croatia","HRV","Goats","fabio" +"8941","Croatia","HRV","Pigs","fabio" +"8942","Croatia","HRV","Poultry Birds","fabio" +"8943","Croatia","HRV","Horses","fabio" +"8944","Croatia","HRV","Asses","fabio" +"8945","Croatia","HRV","Mules","fabio" +"8946","Croatia","HRV","Camels","fabio" +"8947","Croatia","HRV","Camelids, other","fabio" +"8948","Croatia","HRV","Rabbits and hares","fabio" +"8949","Croatia","HRV","Rodents, other","fabio" +"8950","Croatia","HRV","Live animals, other","fabio" +"8951","Croatia","HRV","Milk - Excluding Butter","fabio" +"8952","Croatia","HRV","Butter, Ghee","fabio" +"8953","Croatia","HRV","Eggs","fabio" +"8954","Croatia","HRV","Wool (Clean Eq.)","fabio" +"8955","Croatia","HRV","Bovine Meat","fabio" +"8956","Croatia","HRV","Mutton & Goat Meat","fabio" +"8957","Croatia","HRV","Pigmeat","fabio" +"8958","Croatia","HRV","Poultry Meat","fabio" +"8959","Croatia","HRV","Meat, Other","fabio" +"8960","Croatia","HRV","Offals, Edible","fabio" +"8961","Croatia","HRV","Fats, Animals, Raw","fabio" +"8962","Croatia","HRV","Hides and skins","fabio" +"8963","Croatia","HRV","Meat Meal","fabio" +"8964","Croatia","HRV","Pet food","fabio" +"8965","Croatia","HRV","Honey","fabio" +"8966","Croatia","HRV","Silk","fabio" +"8967","Croatia","HRV","Fish, Seafood","fabio" +"8968","Croatia","HRV","Wood fuel","fabio" +"8969","Croatia","HRV","Industrial roundwood, coniferous","fabio" +"8970","Croatia","HRV","Industrial roundwood, non-coniferous","fabio" +"8971","Iceland","ISL","Rice (Milled Equivalent)","fabio" +"8972","Iceland","ISL","Wheat and products","fabio" +"8973","Iceland","ISL","Barley and products","fabio" +"8974","Iceland","ISL","Maize and products","fabio" +"8975","Iceland","ISL","Rye and products","fabio" +"8976","Iceland","ISL","Oats","fabio" +"8977","Iceland","ISL","Millet and products","fabio" +"8978","Iceland","ISL","Sorghum and products","fabio" +"8979","Iceland","ISL","Cereals, Other","fabio" +"8980","Iceland","ISL","Potatoes and products","fabio" +"8981","Iceland","ISL","Cassava and products","fabio" +"8982","Iceland","ISL","Sweet potatoes","fabio" +"8983","Iceland","ISL","Roots, Other","fabio" +"8984","Iceland","ISL","Yams","fabio" +"8985","Iceland","ISL","Sugar cane","fabio" +"8986","Iceland","ISL","Sugar beet","fabio" +"8987","Iceland","ISL","Beans","fabio" +"8988","Iceland","ISL","Peas","fabio" +"8989","Iceland","ISL","Pulses, Other and products","fabio" +"8990","Iceland","ISL","Nuts and products","fabio" +"8991","Iceland","ISL","Soyabeans","fabio" +"8992","Iceland","ISL","Groundnuts (Shelled Eq)","fabio" +"8993","Iceland","ISL","Sunflower seed","fabio" +"8994","Iceland","ISL","Rape and Mustardseed","fabio" +"8995","Iceland","ISL","Seed cotton","fabio" +"8996","Iceland","ISL","Coconuts - Incl Copra","fabio" +"8997","Iceland","ISL","Sesame seed","fabio" +"8998","Iceland","ISL","Oil, palm fruit","fabio" +"8999","Iceland","ISL","Olives (including preserved)","fabio" +"9000","Iceland","ISL","Oilcrops, Other","fabio" +"9001","Iceland","ISL","Tomatoes and products","fabio" +"9002","Iceland","ISL","Onions","fabio" +"9003","Iceland","ISL","Vegetables, Other","fabio" +"9004","Iceland","ISL","Oranges, Mandarines","fabio" +"9005","Iceland","ISL","Lemons, Limes and products","fabio" +"9006","Iceland","ISL","Grapefruit and products","fabio" +"9007","Iceland","ISL","Citrus, Other","fabio" +"9008","Iceland","ISL","Bananas","fabio" +"9009","Iceland","ISL","Plantains","fabio" +"9010","Iceland","ISL","Apples and products","fabio" +"9011","Iceland","ISL","Pineapples and products","fabio" +"9012","Iceland","ISL","Dates","fabio" +"9013","Iceland","ISL","Grapes and products (excl wine)","fabio" +"9014","Iceland","ISL","Fruits, Other","fabio" +"9015","Iceland","ISL","Coffee and products","fabio" +"9016","Iceland","ISL","Cocoa Beans and products","fabio" +"9017","Iceland","ISL","Tea (including mate)","fabio" +"9018","Iceland","ISL","Hops","fabio" +"9019","Iceland","ISL","Pepper","fabio" +"9020","Iceland","ISL","Pimento","fabio" +"9021","Iceland","ISL","Cloves","fabio" +"9022","Iceland","ISL","Spices, Other","fabio" +"9023","Iceland","ISL","Jute","fabio" +"9024","Iceland","ISL","Jute-Like Fibres","fabio" +"9025","Iceland","ISL","Soft-Fibres, Other","fabio" +"9026","Iceland","ISL","Sisal","fabio" +"9027","Iceland","ISL","Abaca","fabio" +"9028","Iceland","ISL","Hard Fibres, Other","fabio" +"9029","Iceland","ISL","Tobacco","fabio" +"9030","Iceland","ISL","Rubber","fabio" +"9031","Iceland","ISL","Fodder crops","fabio" +"9032","Iceland","ISL","Grazing","fabio" +"9033","Iceland","ISL","Cottonseed","fabio" +"9034","Iceland","ISL","Palm kernels","fabio" +"9035","Iceland","ISL","Sugar non-centrifugal","fabio" +"9036","Iceland","ISL","Molasses","fabio" +"9037","Iceland","ISL","Sugar, Refined Equiv","fabio" +"9038","Iceland","ISL","Sweeteners, Other","fabio" +"9039","Iceland","ISL","Soyabean Oil","fabio" +"9040","Iceland","ISL","Groundnut Oil","fabio" +"9041","Iceland","ISL","Sunflowerseed Oil","fabio" +"9042","Iceland","ISL","Rape and Mustard Oil","fabio" +"9043","Iceland","ISL","Cottonseed Oil","fabio" +"9044","Iceland","ISL","Palmkernel Oil","fabio" +"9045","Iceland","ISL","Palm Oil","fabio" +"9046","Iceland","ISL","Coconut Oil","fabio" +"9047","Iceland","ISL","Sesameseed Oil","fabio" +"9048","Iceland","ISL","Olive Oil","fabio" +"9049","Iceland","ISL","Ricebran Oil","fabio" +"9050","Iceland","ISL","Maize Germ Oil","fabio" +"9051","Iceland","ISL","Oilcrops Oil, Other","fabio" +"9052","Iceland","ISL","Soyabean Cake","fabio" +"9053","Iceland","ISL","Groundnut Cake","fabio" +"9054","Iceland","ISL","Sunflowerseed Cake","fabio" +"9055","Iceland","ISL","Rape and Mustard Cake","fabio" +"9056","Iceland","ISL","Cottonseed Cake","fabio" +"9057","Iceland","ISL","Palmkernel Cake","fabio" +"9058","Iceland","ISL","Copra Cake","fabio" +"9059","Iceland","ISL","Sesameseed Cake","fabio" +"9060","Iceland","ISL","Oilseed Cakes, Other","fabio" +"9061","Iceland","ISL","Wine","fabio" +"9062","Iceland","ISL","Beer","fabio" +"9063","Iceland","ISL","Beverages, Fermented","fabio" +"9064","Iceland","ISL","Beverages, Alcoholic","fabio" +"9065","Iceland","ISL","Alcohol, Non-Food","fabio" +"9066","Iceland","ISL","Cotton lint","fabio" +"9067","Iceland","ISL","Cattle","fabio" +"9068","Iceland","ISL","Buffaloes","fabio" +"9069","Iceland","ISL","Sheep","fabio" +"9070","Iceland","ISL","Goats","fabio" +"9071","Iceland","ISL","Pigs","fabio" +"9072","Iceland","ISL","Poultry Birds","fabio" +"9073","Iceland","ISL","Horses","fabio" +"9074","Iceland","ISL","Asses","fabio" +"9075","Iceland","ISL","Mules","fabio" +"9076","Iceland","ISL","Camels","fabio" +"9077","Iceland","ISL","Camelids, other","fabio" +"9078","Iceland","ISL","Rabbits and hares","fabio" +"9079","Iceland","ISL","Rodents, other","fabio" +"9080","Iceland","ISL","Live animals, other","fabio" +"9081","Iceland","ISL","Milk - Excluding Butter","fabio" +"9082","Iceland","ISL","Butter, Ghee","fabio" +"9083","Iceland","ISL","Eggs","fabio" +"9084","Iceland","ISL","Wool (Clean Eq.)","fabio" +"9085","Iceland","ISL","Bovine Meat","fabio" +"9086","Iceland","ISL","Mutton & Goat Meat","fabio" +"9087","Iceland","ISL","Pigmeat","fabio" +"9088","Iceland","ISL","Poultry Meat","fabio" +"9089","Iceland","ISL","Meat, Other","fabio" +"9090","Iceland","ISL","Offals, Edible","fabio" +"9091","Iceland","ISL","Fats, Animals, Raw","fabio" +"9092","Iceland","ISL","Hides and skins","fabio" +"9093","Iceland","ISL","Meat Meal","fabio" +"9094","Iceland","ISL","Pet food","fabio" +"9095","Iceland","ISL","Honey","fabio" +"9096","Iceland","ISL","Silk","fabio" +"9097","Iceland","ISL","Fish, Seafood","fabio" +"9098","Iceland","ISL","Wood fuel","fabio" +"9099","Iceland","ISL","Industrial roundwood, coniferous","fabio" +"9100","Iceland","ISL","Industrial roundwood, non-coniferous","fabio" +"9101","India","IND","Rice (Milled Equivalent)","fabio" +"9102","India","IND","Wheat and products","fabio" +"9103","India","IND","Barley and products","fabio" +"9104","India","IND","Maize and products","fabio" +"9105","India","IND","Rye and products","fabio" +"9106","India","IND","Oats","fabio" +"9107","India","IND","Millet and products","fabio" +"9108","India","IND","Sorghum and products","fabio" +"9109","India","IND","Cereals, Other","fabio" +"9110","India","IND","Potatoes and products","fabio" +"9111","India","IND","Cassava and products","fabio" +"9112","India","IND","Sweet potatoes","fabio" +"9113","India","IND","Roots, Other","fabio" +"9114","India","IND","Yams","fabio" +"9115","India","IND","Sugar cane","fabio" +"9116","India","IND","Sugar beet","fabio" +"9117","India","IND","Beans","fabio" +"9118","India","IND","Peas","fabio" +"9119","India","IND","Pulses, Other and products","fabio" +"9120","India","IND","Nuts and products","fabio" +"9121","India","IND","Soyabeans","fabio" +"9122","India","IND","Groundnuts (Shelled Eq)","fabio" +"9123","India","IND","Sunflower seed","fabio" +"9124","India","IND","Rape and Mustardseed","fabio" +"9125","India","IND","Seed cotton","fabio" +"9126","India","IND","Coconuts - Incl Copra","fabio" +"9127","India","IND","Sesame seed","fabio" +"9128","India","IND","Oil, palm fruit","fabio" +"9129","India","IND","Olives (including preserved)","fabio" +"9130","India","IND","Oilcrops, Other","fabio" +"9131","India","IND","Tomatoes and products","fabio" +"9132","India","IND","Onions","fabio" +"9133","India","IND","Vegetables, Other","fabio" +"9134","India","IND","Oranges, Mandarines","fabio" +"9135","India","IND","Lemons, Limes and products","fabio" +"9136","India","IND","Grapefruit and products","fabio" +"9137","India","IND","Citrus, Other","fabio" +"9138","India","IND","Bananas","fabio" +"9139","India","IND","Plantains","fabio" +"9140","India","IND","Apples and products","fabio" +"9141","India","IND","Pineapples and products","fabio" +"9142","India","IND","Dates","fabio" +"9143","India","IND","Grapes and products (excl wine)","fabio" +"9144","India","IND","Fruits, Other","fabio" +"9145","India","IND","Coffee and products","fabio" +"9146","India","IND","Cocoa Beans and products","fabio" +"9147","India","IND","Tea (including mate)","fabio" +"9148","India","IND","Hops","fabio" +"9149","India","IND","Pepper","fabio" +"9150","India","IND","Pimento","fabio" +"9151","India","IND","Cloves","fabio" +"9152","India","IND","Spices, Other","fabio" +"9153","India","IND","Jute","fabio" +"9154","India","IND","Jute-Like Fibres","fabio" +"9155","India","IND","Soft-Fibres, Other","fabio" +"9156","India","IND","Sisal","fabio" +"9157","India","IND","Abaca","fabio" +"9158","India","IND","Hard Fibres, Other","fabio" +"9159","India","IND","Tobacco","fabio" +"9160","India","IND","Rubber","fabio" +"9161","India","IND","Fodder crops","fabio" +"9162","India","IND","Grazing","fabio" +"9163","India","IND","Cottonseed","fabio" +"9164","India","IND","Palm kernels","fabio" +"9165","India","IND","Sugar non-centrifugal","fabio" +"9166","India","IND","Molasses","fabio" +"9167","India","IND","Sugar, Refined Equiv","fabio" +"9168","India","IND","Sweeteners, Other","fabio" +"9169","India","IND","Soyabean Oil","fabio" +"9170","India","IND","Groundnut Oil","fabio" +"9171","India","IND","Sunflowerseed Oil","fabio" +"9172","India","IND","Rape and Mustard Oil","fabio" +"9173","India","IND","Cottonseed Oil","fabio" +"9174","India","IND","Palmkernel Oil","fabio" +"9175","India","IND","Palm Oil","fabio" +"9176","India","IND","Coconut Oil","fabio" +"9177","India","IND","Sesameseed Oil","fabio" +"9178","India","IND","Olive Oil","fabio" +"9179","India","IND","Ricebran Oil","fabio" +"9180","India","IND","Maize Germ Oil","fabio" +"9181","India","IND","Oilcrops Oil, Other","fabio" +"9182","India","IND","Soyabean Cake","fabio" +"9183","India","IND","Groundnut Cake","fabio" +"9184","India","IND","Sunflowerseed Cake","fabio" +"9185","India","IND","Rape and Mustard Cake","fabio" +"9186","India","IND","Cottonseed Cake","fabio" +"9187","India","IND","Palmkernel Cake","fabio" +"9188","India","IND","Copra Cake","fabio" +"9189","India","IND","Sesameseed Cake","fabio" +"9190","India","IND","Oilseed Cakes, Other","fabio" +"9191","India","IND","Wine","fabio" +"9192","India","IND","Beer","fabio" +"9193","India","IND","Beverages, Fermented","fabio" +"9194","India","IND","Beverages, Alcoholic","fabio" +"9195","India","IND","Alcohol, Non-Food","fabio" +"9196","India","IND","Cotton lint","fabio" +"9197","India","IND","Cattle","fabio" +"9198","India","IND","Buffaloes","fabio" +"9199","India","IND","Sheep","fabio" +"9200","India","IND","Goats","fabio" +"9201","India","IND","Pigs","fabio" +"9202","India","IND","Poultry Birds","fabio" +"9203","India","IND","Horses","fabio" +"9204","India","IND","Asses","fabio" +"9205","India","IND","Mules","fabio" +"9206","India","IND","Camels","fabio" +"9207","India","IND","Camelids, other","fabio" +"9208","India","IND","Rabbits and hares","fabio" +"9209","India","IND","Rodents, other","fabio" +"9210","India","IND","Live animals, other","fabio" +"9211","India","IND","Milk - Excluding Butter","fabio" +"9212","India","IND","Butter, Ghee","fabio" +"9213","India","IND","Eggs","fabio" +"9214","India","IND","Wool (Clean Eq.)","fabio" +"9215","India","IND","Bovine Meat","fabio" +"9216","India","IND","Mutton & Goat Meat","fabio" +"9217","India","IND","Pigmeat","fabio" +"9218","India","IND","Poultry Meat","fabio" +"9219","India","IND","Meat, Other","fabio" +"9220","India","IND","Offals, Edible","fabio" +"9221","India","IND","Fats, Animals, Raw","fabio" +"9222","India","IND","Hides and skins","fabio" +"9223","India","IND","Meat Meal","fabio" +"9224","India","IND","Pet food","fabio" +"9225","India","IND","Honey","fabio" +"9226","India","IND","Silk","fabio" +"9227","India","IND","Fish, Seafood","fabio" +"9228","India","IND","Wood fuel","fabio" +"9229","India","IND","Industrial roundwood, coniferous","fabio" +"9230","India","IND","Industrial roundwood, non-coniferous","fabio" +"9231","Indonesia","IDN","Rice (Milled Equivalent)","fabio" +"9232","Indonesia","IDN","Wheat and products","fabio" +"9233","Indonesia","IDN","Barley and products","fabio" +"9234","Indonesia","IDN","Maize and products","fabio" +"9235","Indonesia","IDN","Rye and products","fabio" +"9236","Indonesia","IDN","Oats","fabio" +"9237","Indonesia","IDN","Millet and products","fabio" +"9238","Indonesia","IDN","Sorghum and products","fabio" +"9239","Indonesia","IDN","Cereals, Other","fabio" +"9240","Indonesia","IDN","Potatoes and products","fabio" +"9241","Indonesia","IDN","Cassava and products","fabio" +"9242","Indonesia","IDN","Sweet potatoes","fabio" +"9243","Indonesia","IDN","Roots, Other","fabio" +"9244","Indonesia","IDN","Yams","fabio" +"9245","Indonesia","IDN","Sugar cane","fabio" +"9246","Indonesia","IDN","Sugar beet","fabio" +"9247","Indonesia","IDN","Beans","fabio" +"9248","Indonesia","IDN","Peas","fabio" +"9249","Indonesia","IDN","Pulses, Other and products","fabio" +"9250","Indonesia","IDN","Nuts and products","fabio" +"9251","Indonesia","IDN","Soyabeans","fabio" +"9252","Indonesia","IDN","Groundnuts (Shelled Eq)","fabio" +"9253","Indonesia","IDN","Sunflower seed","fabio" +"9254","Indonesia","IDN","Rape and Mustardseed","fabio" +"9255","Indonesia","IDN","Seed cotton","fabio" +"9256","Indonesia","IDN","Coconuts - Incl Copra","fabio" +"9257","Indonesia","IDN","Sesame seed","fabio" +"9258","Indonesia","IDN","Oil, palm fruit","fabio" +"9259","Indonesia","IDN","Olives (including preserved)","fabio" +"9260","Indonesia","IDN","Oilcrops, Other","fabio" +"9261","Indonesia","IDN","Tomatoes and products","fabio" +"9262","Indonesia","IDN","Onions","fabio" +"9263","Indonesia","IDN","Vegetables, Other","fabio" +"9264","Indonesia","IDN","Oranges, Mandarines","fabio" +"9265","Indonesia","IDN","Lemons, Limes and products","fabio" +"9266","Indonesia","IDN","Grapefruit and products","fabio" +"9267","Indonesia","IDN","Citrus, Other","fabio" +"9268","Indonesia","IDN","Bananas","fabio" +"9269","Indonesia","IDN","Plantains","fabio" +"9270","Indonesia","IDN","Apples and products","fabio" +"9271","Indonesia","IDN","Pineapples and products","fabio" +"9272","Indonesia","IDN","Dates","fabio" +"9273","Indonesia","IDN","Grapes and products (excl wine)","fabio" +"9274","Indonesia","IDN","Fruits, Other","fabio" +"9275","Indonesia","IDN","Coffee and products","fabio" +"9276","Indonesia","IDN","Cocoa Beans and products","fabio" +"9277","Indonesia","IDN","Tea (including mate)","fabio" +"9278","Indonesia","IDN","Hops","fabio" +"9279","Indonesia","IDN","Pepper","fabio" +"9280","Indonesia","IDN","Pimento","fabio" +"9281","Indonesia","IDN","Cloves","fabio" +"9282","Indonesia","IDN","Spices, Other","fabio" +"9283","Indonesia","IDN","Jute","fabio" +"9284","Indonesia","IDN","Jute-Like Fibres","fabio" +"9285","Indonesia","IDN","Soft-Fibres, Other","fabio" +"9286","Indonesia","IDN","Sisal","fabio" +"9287","Indonesia","IDN","Abaca","fabio" +"9288","Indonesia","IDN","Hard Fibres, Other","fabio" +"9289","Indonesia","IDN","Tobacco","fabio" +"9290","Indonesia","IDN","Rubber","fabio" +"9291","Indonesia","IDN","Fodder crops","fabio" +"9292","Indonesia","IDN","Grazing","fabio" +"9293","Indonesia","IDN","Cottonseed","fabio" +"9294","Indonesia","IDN","Palm kernels","fabio" +"9295","Indonesia","IDN","Sugar non-centrifugal","fabio" +"9296","Indonesia","IDN","Molasses","fabio" +"9297","Indonesia","IDN","Sugar, Refined Equiv","fabio" +"9298","Indonesia","IDN","Sweeteners, Other","fabio" +"9299","Indonesia","IDN","Soyabean Oil","fabio" +"9300","Indonesia","IDN","Groundnut Oil","fabio" +"9301","Indonesia","IDN","Sunflowerseed Oil","fabio" +"9302","Indonesia","IDN","Rape and Mustard Oil","fabio" +"9303","Indonesia","IDN","Cottonseed Oil","fabio" +"9304","Indonesia","IDN","Palmkernel Oil","fabio" +"9305","Indonesia","IDN","Palm Oil","fabio" +"9306","Indonesia","IDN","Coconut Oil","fabio" +"9307","Indonesia","IDN","Sesameseed Oil","fabio" +"9308","Indonesia","IDN","Olive Oil","fabio" +"9309","Indonesia","IDN","Ricebran Oil","fabio" +"9310","Indonesia","IDN","Maize Germ Oil","fabio" +"9311","Indonesia","IDN","Oilcrops Oil, Other","fabio" +"9312","Indonesia","IDN","Soyabean Cake","fabio" +"9313","Indonesia","IDN","Groundnut Cake","fabio" +"9314","Indonesia","IDN","Sunflowerseed Cake","fabio" +"9315","Indonesia","IDN","Rape and Mustard Cake","fabio" +"9316","Indonesia","IDN","Cottonseed Cake","fabio" +"9317","Indonesia","IDN","Palmkernel Cake","fabio" +"9318","Indonesia","IDN","Copra Cake","fabio" +"9319","Indonesia","IDN","Sesameseed Cake","fabio" +"9320","Indonesia","IDN","Oilseed Cakes, Other","fabio" +"9321","Indonesia","IDN","Wine","fabio" +"9322","Indonesia","IDN","Beer","fabio" +"9323","Indonesia","IDN","Beverages, Fermented","fabio" +"9324","Indonesia","IDN","Beverages, Alcoholic","fabio" +"9325","Indonesia","IDN","Alcohol, Non-Food","fabio" +"9326","Indonesia","IDN","Cotton lint","fabio" +"9327","Indonesia","IDN","Cattle","fabio" +"9328","Indonesia","IDN","Buffaloes","fabio" +"9329","Indonesia","IDN","Sheep","fabio" +"9330","Indonesia","IDN","Goats","fabio" +"9331","Indonesia","IDN","Pigs","fabio" +"9332","Indonesia","IDN","Poultry Birds","fabio" +"9333","Indonesia","IDN","Horses","fabio" +"9334","Indonesia","IDN","Asses","fabio" +"9335","Indonesia","IDN","Mules","fabio" +"9336","Indonesia","IDN","Camels","fabio" +"9337","Indonesia","IDN","Camelids, other","fabio" +"9338","Indonesia","IDN","Rabbits and hares","fabio" +"9339","Indonesia","IDN","Rodents, other","fabio" +"9340","Indonesia","IDN","Live animals, other","fabio" +"9341","Indonesia","IDN","Milk - Excluding Butter","fabio" +"9342","Indonesia","IDN","Butter, Ghee","fabio" +"9343","Indonesia","IDN","Eggs","fabio" +"9344","Indonesia","IDN","Wool (Clean Eq.)","fabio" +"9345","Indonesia","IDN","Bovine Meat","fabio" +"9346","Indonesia","IDN","Mutton & Goat Meat","fabio" +"9347","Indonesia","IDN","Pigmeat","fabio" +"9348","Indonesia","IDN","Poultry Meat","fabio" +"9349","Indonesia","IDN","Meat, Other","fabio" +"9350","Indonesia","IDN","Offals, Edible","fabio" +"9351","Indonesia","IDN","Fats, Animals, Raw","fabio" +"9352","Indonesia","IDN","Hides and skins","fabio" +"9353","Indonesia","IDN","Meat Meal","fabio" +"9354","Indonesia","IDN","Pet food","fabio" +"9355","Indonesia","IDN","Honey","fabio" +"9356","Indonesia","IDN","Silk","fabio" +"9357","Indonesia","IDN","Fish, Seafood","fabio" +"9358","Indonesia","IDN","Wood fuel","fabio" +"9359","Indonesia","IDN","Industrial roundwood, coniferous","fabio" +"9360","Indonesia","IDN","Industrial roundwood, non-coniferous","fabio" +"9361","Iran (Islamic Republic of)","IRN","Rice (Milled Equivalent)","fabio" +"9362","Iran (Islamic Republic of)","IRN","Wheat and products","fabio" +"9363","Iran (Islamic Republic of)","IRN","Barley and products","fabio" +"9364","Iran (Islamic Republic of)","IRN","Maize and products","fabio" +"9365","Iran (Islamic Republic of)","IRN","Rye and products","fabio" +"9366","Iran (Islamic Republic of)","IRN","Oats","fabio" +"9367","Iran (Islamic Republic of)","IRN","Millet and products","fabio" +"9368","Iran (Islamic Republic of)","IRN","Sorghum and products","fabio" +"9369","Iran (Islamic Republic of)","IRN","Cereals, Other","fabio" +"9370","Iran (Islamic Republic of)","IRN","Potatoes and products","fabio" +"9371","Iran (Islamic Republic of)","IRN","Cassava and products","fabio" +"9372","Iran (Islamic Republic of)","IRN","Sweet potatoes","fabio" +"9373","Iran (Islamic Republic of)","IRN","Roots, Other","fabio" +"9374","Iran (Islamic Republic of)","IRN","Yams","fabio" +"9375","Iran (Islamic Republic of)","IRN","Sugar cane","fabio" +"9376","Iran (Islamic Republic of)","IRN","Sugar beet","fabio" +"9377","Iran (Islamic Republic of)","IRN","Beans","fabio" +"9378","Iran (Islamic Republic of)","IRN","Peas","fabio" +"9379","Iran (Islamic Republic of)","IRN","Pulses, Other and products","fabio" +"9380","Iran (Islamic Republic of)","IRN","Nuts and products","fabio" +"9381","Iran (Islamic Republic of)","IRN","Soyabeans","fabio" +"9382","Iran (Islamic Republic of)","IRN","Groundnuts (Shelled Eq)","fabio" +"9383","Iran (Islamic Republic of)","IRN","Sunflower seed","fabio" +"9384","Iran (Islamic Republic of)","IRN","Rape and Mustardseed","fabio" +"9385","Iran (Islamic Republic of)","IRN","Seed cotton","fabio" +"9386","Iran (Islamic Republic of)","IRN","Coconuts - Incl Copra","fabio" +"9387","Iran (Islamic Republic of)","IRN","Sesame seed","fabio" +"9388","Iran (Islamic Republic of)","IRN","Oil, palm fruit","fabio" +"9389","Iran (Islamic Republic of)","IRN","Olives (including preserved)","fabio" +"9390","Iran (Islamic Republic of)","IRN","Oilcrops, Other","fabio" +"9391","Iran (Islamic Republic of)","IRN","Tomatoes and products","fabio" +"9392","Iran (Islamic Republic of)","IRN","Onions","fabio" +"9393","Iran (Islamic Republic of)","IRN","Vegetables, Other","fabio" +"9394","Iran (Islamic Republic of)","IRN","Oranges, Mandarines","fabio" +"9395","Iran (Islamic Republic of)","IRN","Lemons, Limes and products","fabio" +"9396","Iran (Islamic Republic of)","IRN","Grapefruit and products","fabio" +"9397","Iran (Islamic Republic of)","IRN","Citrus, Other","fabio" +"9398","Iran (Islamic Republic of)","IRN","Bananas","fabio" +"9399","Iran (Islamic Republic of)","IRN","Plantains","fabio" +"9400","Iran (Islamic Republic of)","IRN","Apples and products","fabio" +"9401","Iran (Islamic Republic of)","IRN","Pineapples and products","fabio" +"9402","Iran (Islamic Republic of)","IRN","Dates","fabio" +"9403","Iran (Islamic Republic of)","IRN","Grapes and products (excl wine)","fabio" +"9404","Iran (Islamic Republic of)","IRN","Fruits, Other","fabio" +"9405","Iran (Islamic Republic of)","IRN","Coffee and products","fabio" +"9406","Iran (Islamic Republic of)","IRN","Cocoa Beans and products","fabio" +"9407","Iran (Islamic Republic of)","IRN","Tea (including mate)","fabio" +"9408","Iran (Islamic Republic of)","IRN","Hops","fabio" +"9409","Iran (Islamic Republic of)","IRN","Pepper","fabio" +"9410","Iran (Islamic Republic of)","IRN","Pimento","fabio" +"9411","Iran (Islamic Republic of)","IRN","Cloves","fabio" +"9412","Iran (Islamic Republic of)","IRN","Spices, Other","fabio" +"9413","Iran (Islamic Republic of)","IRN","Jute","fabio" +"9414","Iran (Islamic Republic of)","IRN","Jute-Like Fibres","fabio" +"9415","Iran (Islamic Republic of)","IRN","Soft-Fibres, Other","fabio" +"9416","Iran (Islamic Republic of)","IRN","Sisal","fabio" +"9417","Iran (Islamic Republic of)","IRN","Abaca","fabio" +"9418","Iran (Islamic Republic of)","IRN","Hard Fibres, Other","fabio" +"9419","Iran (Islamic Republic of)","IRN","Tobacco","fabio" +"9420","Iran (Islamic Republic of)","IRN","Rubber","fabio" +"9421","Iran (Islamic Republic of)","IRN","Fodder crops","fabio" +"9422","Iran (Islamic Republic of)","IRN","Grazing","fabio" +"9423","Iran (Islamic Republic of)","IRN","Cottonseed","fabio" +"9424","Iran (Islamic Republic of)","IRN","Palm kernels","fabio" +"9425","Iran (Islamic Republic of)","IRN","Sugar non-centrifugal","fabio" +"9426","Iran (Islamic Republic of)","IRN","Molasses","fabio" +"9427","Iran (Islamic Republic of)","IRN","Sugar, Refined Equiv","fabio" +"9428","Iran (Islamic Republic of)","IRN","Sweeteners, Other","fabio" +"9429","Iran (Islamic Republic of)","IRN","Soyabean Oil","fabio" +"9430","Iran (Islamic Republic of)","IRN","Groundnut Oil","fabio" +"9431","Iran (Islamic Republic of)","IRN","Sunflowerseed Oil","fabio" +"9432","Iran (Islamic Republic of)","IRN","Rape and Mustard Oil","fabio" +"9433","Iran (Islamic Republic of)","IRN","Cottonseed Oil","fabio" +"9434","Iran (Islamic Republic of)","IRN","Palmkernel Oil","fabio" +"9435","Iran (Islamic Republic of)","IRN","Palm Oil","fabio" +"9436","Iran (Islamic Republic of)","IRN","Coconut Oil","fabio" +"9437","Iran (Islamic Republic of)","IRN","Sesameseed Oil","fabio" +"9438","Iran (Islamic Republic of)","IRN","Olive Oil","fabio" +"9439","Iran (Islamic Republic of)","IRN","Ricebran Oil","fabio" +"9440","Iran (Islamic Republic of)","IRN","Maize Germ Oil","fabio" +"9441","Iran (Islamic Republic of)","IRN","Oilcrops Oil, Other","fabio" +"9442","Iran (Islamic Republic of)","IRN","Soyabean Cake","fabio" +"9443","Iran (Islamic Republic of)","IRN","Groundnut Cake","fabio" +"9444","Iran (Islamic Republic of)","IRN","Sunflowerseed Cake","fabio" +"9445","Iran (Islamic Republic of)","IRN","Rape and Mustard Cake","fabio" +"9446","Iran (Islamic Republic of)","IRN","Cottonseed Cake","fabio" +"9447","Iran (Islamic Republic of)","IRN","Palmkernel Cake","fabio" +"9448","Iran (Islamic Republic of)","IRN","Copra Cake","fabio" +"9449","Iran (Islamic Republic of)","IRN","Sesameseed Cake","fabio" +"9450","Iran (Islamic Republic of)","IRN","Oilseed Cakes, Other","fabio" +"9451","Iran (Islamic Republic of)","IRN","Wine","fabio" +"9452","Iran (Islamic Republic of)","IRN","Beer","fabio" +"9453","Iran (Islamic Republic of)","IRN","Beverages, Fermented","fabio" +"9454","Iran (Islamic Republic of)","IRN","Beverages, Alcoholic","fabio" +"9455","Iran (Islamic Republic of)","IRN","Alcohol, Non-Food","fabio" +"9456","Iran (Islamic Republic of)","IRN","Cotton lint","fabio" +"9457","Iran (Islamic Republic of)","IRN","Cattle","fabio" +"9458","Iran (Islamic Republic of)","IRN","Buffaloes","fabio" +"9459","Iran (Islamic Republic of)","IRN","Sheep","fabio" +"9460","Iran (Islamic Republic of)","IRN","Goats","fabio" +"9461","Iran (Islamic Republic of)","IRN","Pigs","fabio" +"9462","Iran (Islamic Republic of)","IRN","Poultry Birds","fabio" +"9463","Iran (Islamic Republic of)","IRN","Horses","fabio" +"9464","Iran (Islamic Republic of)","IRN","Asses","fabio" +"9465","Iran (Islamic Republic of)","IRN","Mules","fabio" +"9466","Iran (Islamic Republic of)","IRN","Camels","fabio" +"9467","Iran (Islamic Republic of)","IRN","Camelids, other","fabio" +"9468","Iran (Islamic Republic of)","IRN","Rabbits and hares","fabio" +"9469","Iran (Islamic Republic of)","IRN","Rodents, other","fabio" +"9470","Iran (Islamic Republic of)","IRN","Live animals, other","fabio" +"9471","Iran (Islamic Republic of)","IRN","Milk - Excluding Butter","fabio" +"9472","Iran (Islamic Republic of)","IRN","Butter, Ghee","fabio" +"9473","Iran (Islamic Republic of)","IRN","Eggs","fabio" +"9474","Iran (Islamic Republic of)","IRN","Wool (Clean Eq.)","fabio" +"9475","Iran (Islamic Republic of)","IRN","Bovine Meat","fabio" +"9476","Iran (Islamic Republic of)","IRN","Mutton & Goat Meat","fabio" +"9477","Iran (Islamic Republic of)","IRN","Pigmeat","fabio" +"9478","Iran (Islamic Republic of)","IRN","Poultry Meat","fabio" +"9479","Iran (Islamic Republic of)","IRN","Meat, Other","fabio" +"9480","Iran (Islamic Republic of)","IRN","Offals, Edible","fabio" +"9481","Iran (Islamic Republic of)","IRN","Fats, Animals, Raw","fabio" +"9482","Iran (Islamic Republic of)","IRN","Hides and skins","fabio" +"9483","Iran (Islamic Republic of)","IRN","Meat Meal","fabio" +"9484","Iran (Islamic Republic of)","IRN","Pet food","fabio" +"9485","Iran (Islamic Republic of)","IRN","Honey","fabio" +"9486","Iran (Islamic Republic of)","IRN","Silk","fabio" +"9487","Iran (Islamic Republic of)","IRN","Fish, Seafood","fabio" +"9488","Iran (Islamic Republic of)","IRN","Wood fuel","fabio" +"9489","Iran (Islamic Republic of)","IRN","Industrial roundwood, coniferous","fabio" +"9490","Iran (Islamic Republic of)","IRN","Industrial roundwood, non-coniferous","fabio" +"9491","Iraq","IRQ","Rice (Milled Equivalent)","fabio" +"9492","Iraq","IRQ","Wheat and products","fabio" +"9493","Iraq","IRQ","Barley and products","fabio" +"9494","Iraq","IRQ","Maize and products","fabio" +"9495","Iraq","IRQ","Rye and products","fabio" +"9496","Iraq","IRQ","Oats","fabio" +"9497","Iraq","IRQ","Millet and products","fabio" +"9498","Iraq","IRQ","Sorghum and products","fabio" +"9499","Iraq","IRQ","Cereals, Other","fabio" +"9500","Iraq","IRQ","Potatoes and products","fabio" +"9501","Iraq","IRQ","Cassava and products","fabio" +"9502","Iraq","IRQ","Sweet potatoes","fabio" +"9503","Iraq","IRQ","Roots, Other","fabio" +"9504","Iraq","IRQ","Yams","fabio" +"9505","Iraq","IRQ","Sugar cane","fabio" +"9506","Iraq","IRQ","Sugar beet","fabio" +"9507","Iraq","IRQ","Beans","fabio" +"9508","Iraq","IRQ","Peas","fabio" +"9509","Iraq","IRQ","Pulses, Other and products","fabio" +"9510","Iraq","IRQ","Nuts and products","fabio" +"9511","Iraq","IRQ","Soyabeans","fabio" +"9512","Iraq","IRQ","Groundnuts (Shelled Eq)","fabio" +"9513","Iraq","IRQ","Sunflower seed","fabio" +"9514","Iraq","IRQ","Rape and Mustardseed","fabio" +"9515","Iraq","IRQ","Seed cotton","fabio" +"9516","Iraq","IRQ","Coconuts - Incl Copra","fabio" +"9517","Iraq","IRQ","Sesame seed","fabio" +"9518","Iraq","IRQ","Oil, palm fruit","fabio" +"9519","Iraq","IRQ","Olives (including preserved)","fabio" +"9520","Iraq","IRQ","Oilcrops, Other","fabio" +"9521","Iraq","IRQ","Tomatoes and products","fabio" +"9522","Iraq","IRQ","Onions","fabio" +"9523","Iraq","IRQ","Vegetables, Other","fabio" +"9524","Iraq","IRQ","Oranges, Mandarines","fabio" +"9525","Iraq","IRQ","Lemons, Limes and products","fabio" +"9526","Iraq","IRQ","Grapefruit and products","fabio" +"9527","Iraq","IRQ","Citrus, Other","fabio" +"9528","Iraq","IRQ","Bananas","fabio" +"9529","Iraq","IRQ","Plantains","fabio" +"9530","Iraq","IRQ","Apples and products","fabio" +"9531","Iraq","IRQ","Pineapples and products","fabio" +"9532","Iraq","IRQ","Dates","fabio" +"9533","Iraq","IRQ","Grapes and products (excl wine)","fabio" +"9534","Iraq","IRQ","Fruits, Other","fabio" +"9535","Iraq","IRQ","Coffee and products","fabio" +"9536","Iraq","IRQ","Cocoa Beans and products","fabio" +"9537","Iraq","IRQ","Tea (including mate)","fabio" +"9538","Iraq","IRQ","Hops","fabio" +"9539","Iraq","IRQ","Pepper","fabio" +"9540","Iraq","IRQ","Pimento","fabio" +"9541","Iraq","IRQ","Cloves","fabio" +"9542","Iraq","IRQ","Spices, Other","fabio" +"9543","Iraq","IRQ","Jute","fabio" +"9544","Iraq","IRQ","Jute-Like Fibres","fabio" +"9545","Iraq","IRQ","Soft-Fibres, Other","fabio" +"9546","Iraq","IRQ","Sisal","fabio" +"9547","Iraq","IRQ","Abaca","fabio" +"9548","Iraq","IRQ","Hard Fibres, Other","fabio" +"9549","Iraq","IRQ","Tobacco","fabio" +"9550","Iraq","IRQ","Rubber","fabio" +"9551","Iraq","IRQ","Fodder crops","fabio" +"9552","Iraq","IRQ","Grazing","fabio" +"9553","Iraq","IRQ","Cottonseed","fabio" +"9554","Iraq","IRQ","Palm kernels","fabio" +"9555","Iraq","IRQ","Sugar non-centrifugal","fabio" +"9556","Iraq","IRQ","Molasses","fabio" +"9557","Iraq","IRQ","Sugar, Refined Equiv","fabio" +"9558","Iraq","IRQ","Sweeteners, Other","fabio" +"9559","Iraq","IRQ","Soyabean Oil","fabio" +"9560","Iraq","IRQ","Groundnut Oil","fabio" +"9561","Iraq","IRQ","Sunflowerseed Oil","fabio" +"9562","Iraq","IRQ","Rape and Mustard Oil","fabio" +"9563","Iraq","IRQ","Cottonseed Oil","fabio" +"9564","Iraq","IRQ","Palmkernel Oil","fabio" +"9565","Iraq","IRQ","Palm Oil","fabio" +"9566","Iraq","IRQ","Coconut Oil","fabio" +"9567","Iraq","IRQ","Sesameseed Oil","fabio" +"9568","Iraq","IRQ","Olive Oil","fabio" +"9569","Iraq","IRQ","Ricebran Oil","fabio" +"9570","Iraq","IRQ","Maize Germ Oil","fabio" +"9571","Iraq","IRQ","Oilcrops Oil, Other","fabio" +"9572","Iraq","IRQ","Soyabean Cake","fabio" +"9573","Iraq","IRQ","Groundnut Cake","fabio" +"9574","Iraq","IRQ","Sunflowerseed Cake","fabio" +"9575","Iraq","IRQ","Rape and Mustard Cake","fabio" +"9576","Iraq","IRQ","Cottonseed Cake","fabio" +"9577","Iraq","IRQ","Palmkernel Cake","fabio" +"9578","Iraq","IRQ","Copra Cake","fabio" +"9579","Iraq","IRQ","Sesameseed Cake","fabio" +"9580","Iraq","IRQ","Oilseed Cakes, Other","fabio" +"9581","Iraq","IRQ","Wine","fabio" +"9582","Iraq","IRQ","Beer","fabio" +"9583","Iraq","IRQ","Beverages, Fermented","fabio" +"9584","Iraq","IRQ","Beverages, Alcoholic","fabio" +"9585","Iraq","IRQ","Alcohol, Non-Food","fabio" +"9586","Iraq","IRQ","Cotton lint","fabio" +"9587","Iraq","IRQ","Cattle","fabio" +"9588","Iraq","IRQ","Buffaloes","fabio" +"9589","Iraq","IRQ","Sheep","fabio" +"9590","Iraq","IRQ","Goats","fabio" +"9591","Iraq","IRQ","Pigs","fabio" +"9592","Iraq","IRQ","Poultry Birds","fabio" +"9593","Iraq","IRQ","Horses","fabio" +"9594","Iraq","IRQ","Asses","fabio" +"9595","Iraq","IRQ","Mules","fabio" +"9596","Iraq","IRQ","Camels","fabio" +"9597","Iraq","IRQ","Camelids, other","fabio" +"9598","Iraq","IRQ","Rabbits and hares","fabio" +"9599","Iraq","IRQ","Rodents, other","fabio" +"9600","Iraq","IRQ","Live animals, other","fabio" +"9601","Iraq","IRQ","Milk - Excluding Butter","fabio" +"9602","Iraq","IRQ","Butter, Ghee","fabio" +"9603","Iraq","IRQ","Eggs","fabio" +"9604","Iraq","IRQ","Wool (Clean Eq.)","fabio" +"9605","Iraq","IRQ","Bovine Meat","fabio" +"9606","Iraq","IRQ","Mutton & Goat Meat","fabio" +"9607","Iraq","IRQ","Pigmeat","fabio" +"9608","Iraq","IRQ","Poultry Meat","fabio" +"9609","Iraq","IRQ","Meat, Other","fabio" +"9610","Iraq","IRQ","Offals, Edible","fabio" +"9611","Iraq","IRQ","Fats, Animals, Raw","fabio" +"9612","Iraq","IRQ","Hides and skins","fabio" +"9613","Iraq","IRQ","Meat Meal","fabio" +"9614","Iraq","IRQ","Pet food","fabio" +"9615","Iraq","IRQ","Honey","fabio" +"9616","Iraq","IRQ","Silk","fabio" +"9617","Iraq","IRQ","Fish, Seafood","fabio" +"9618","Iraq","IRQ","Wood fuel","fabio" +"9619","Iraq","IRQ","Industrial roundwood, coniferous","fabio" +"9620","Iraq","IRQ","Industrial roundwood, non-coniferous","fabio" +"9621","Ireland","IRL","Rice (Milled Equivalent)","fabio" +"9622","Ireland","IRL","Wheat and products","fabio" +"9623","Ireland","IRL","Barley and products","fabio" +"9624","Ireland","IRL","Maize and products","fabio" +"9625","Ireland","IRL","Rye and products","fabio" +"9626","Ireland","IRL","Oats","fabio" +"9627","Ireland","IRL","Millet and products","fabio" +"9628","Ireland","IRL","Sorghum and products","fabio" +"9629","Ireland","IRL","Cereals, Other","fabio" +"9630","Ireland","IRL","Potatoes and products","fabio" +"9631","Ireland","IRL","Cassava and products","fabio" +"9632","Ireland","IRL","Sweet potatoes","fabio" +"9633","Ireland","IRL","Roots, Other","fabio" +"9634","Ireland","IRL","Yams","fabio" +"9635","Ireland","IRL","Sugar cane","fabio" +"9636","Ireland","IRL","Sugar beet","fabio" +"9637","Ireland","IRL","Beans","fabio" +"9638","Ireland","IRL","Peas","fabio" +"9639","Ireland","IRL","Pulses, Other and products","fabio" +"9640","Ireland","IRL","Nuts and products","fabio" +"9641","Ireland","IRL","Soyabeans","fabio" +"9642","Ireland","IRL","Groundnuts (Shelled Eq)","fabio" +"9643","Ireland","IRL","Sunflower seed","fabio" +"9644","Ireland","IRL","Rape and Mustardseed","fabio" +"9645","Ireland","IRL","Seed cotton","fabio" +"9646","Ireland","IRL","Coconuts - Incl Copra","fabio" +"9647","Ireland","IRL","Sesame seed","fabio" +"9648","Ireland","IRL","Oil, palm fruit","fabio" +"9649","Ireland","IRL","Olives (including preserved)","fabio" +"9650","Ireland","IRL","Oilcrops, Other","fabio" +"9651","Ireland","IRL","Tomatoes and products","fabio" +"9652","Ireland","IRL","Onions","fabio" +"9653","Ireland","IRL","Vegetables, Other","fabio" +"9654","Ireland","IRL","Oranges, Mandarines","fabio" +"9655","Ireland","IRL","Lemons, Limes and products","fabio" +"9656","Ireland","IRL","Grapefruit and products","fabio" +"9657","Ireland","IRL","Citrus, Other","fabio" +"9658","Ireland","IRL","Bananas","fabio" +"9659","Ireland","IRL","Plantains","fabio" +"9660","Ireland","IRL","Apples and products","fabio" +"9661","Ireland","IRL","Pineapples and products","fabio" +"9662","Ireland","IRL","Dates","fabio" +"9663","Ireland","IRL","Grapes and products (excl wine)","fabio" +"9664","Ireland","IRL","Fruits, Other","fabio" +"9665","Ireland","IRL","Coffee and products","fabio" +"9666","Ireland","IRL","Cocoa Beans and products","fabio" +"9667","Ireland","IRL","Tea (including mate)","fabio" +"9668","Ireland","IRL","Hops","fabio" +"9669","Ireland","IRL","Pepper","fabio" +"9670","Ireland","IRL","Pimento","fabio" +"9671","Ireland","IRL","Cloves","fabio" +"9672","Ireland","IRL","Spices, Other","fabio" +"9673","Ireland","IRL","Jute","fabio" +"9674","Ireland","IRL","Jute-Like Fibres","fabio" +"9675","Ireland","IRL","Soft-Fibres, Other","fabio" +"9676","Ireland","IRL","Sisal","fabio" +"9677","Ireland","IRL","Abaca","fabio" +"9678","Ireland","IRL","Hard Fibres, Other","fabio" +"9679","Ireland","IRL","Tobacco","fabio" +"9680","Ireland","IRL","Rubber","fabio" +"9681","Ireland","IRL","Fodder crops","fabio" +"9682","Ireland","IRL","Grazing","fabio" +"9683","Ireland","IRL","Cottonseed","fabio" +"9684","Ireland","IRL","Palm kernels","fabio" +"9685","Ireland","IRL","Sugar non-centrifugal","fabio" +"9686","Ireland","IRL","Molasses","fabio" +"9687","Ireland","IRL","Sugar, Refined Equiv","fabio" +"9688","Ireland","IRL","Sweeteners, Other","fabio" +"9689","Ireland","IRL","Soyabean Oil","fabio" +"9690","Ireland","IRL","Groundnut Oil","fabio" +"9691","Ireland","IRL","Sunflowerseed Oil","fabio" +"9692","Ireland","IRL","Rape and Mustard Oil","fabio" +"9693","Ireland","IRL","Cottonseed Oil","fabio" +"9694","Ireland","IRL","Palmkernel Oil","fabio" +"9695","Ireland","IRL","Palm Oil","fabio" +"9696","Ireland","IRL","Coconut Oil","fabio" +"9697","Ireland","IRL","Sesameseed Oil","fabio" +"9698","Ireland","IRL","Olive Oil","fabio" +"9699","Ireland","IRL","Ricebran Oil","fabio" +"9700","Ireland","IRL","Maize Germ Oil","fabio" +"9701","Ireland","IRL","Oilcrops Oil, Other","fabio" +"9702","Ireland","IRL","Soyabean Cake","fabio" +"9703","Ireland","IRL","Groundnut Cake","fabio" +"9704","Ireland","IRL","Sunflowerseed Cake","fabio" +"9705","Ireland","IRL","Rape and Mustard Cake","fabio" +"9706","Ireland","IRL","Cottonseed Cake","fabio" +"9707","Ireland","IRL","Palmkernel Cake","fabio" +"9708","Ireland","IRL","Copra Cake","fabio" +"9709","Ireland","IRL","Sesameseed Cake","fabio" +"9710","Ireland","IRL","Oilseed Cakes, Other","fabio" +"9711","Ireland","IRL","Wine","fabio" +"9712","Ireland","IRL","Beer","fabio" +"9713","Ireland","IRL","Beverages, Fermented","fabio" +"9714","Ireland","IRL","Beverages, Alcoholic","fabio" +"9715","Ireland","IRL","Alcohol, Non-Food","fabio" +"9716","Ireland","IRL","Cotton lint","fabio" +"9717","Ireland","IRL","Cattle","fabio" +"9718","Ireland","IRL","Buffaloes","fabio" +"9719","Ireland","IRL","Sheep","fabio" +"9720","Ireland","IRL","Goats","fabio" +"9721","Ireland","IRL","Pigs","fabio" +"9722","Ireland","IRL","Poultry Birds","fabio" +"9723","Ireland","IRL","Horses","fabio" +"9724","Ireland","IRL","Asses","fabio" +"9725","Ireland","IRL","Mules","fabio" +"9726","Ireland","IRL","Camels","fabio" +"9727","Ireland","IRL","Camelids, other","fabio" +"9728","Ireland","IRL","Rabbits and hares","fabio" +"9729","Ireland","IRL","Rodents, other","fabio" +"9730","Ireland","IRL","Live animals, other","fabio" +"9731","Ireland","IRL","Milk - Excluding Butter","fabio" +"9732","Ireland","IRL","Butter, Ghee","fabio" +"9733","Ireland","IRL","Eggs","fabio" +"9734","Ireland","IRL","Wool (Clean Eq.)","fabio" +"9735","Ireland","IRL","Bovine Meat","fabio" +"9736","Ireland","IRL","Mutton & Goat Meat","fabio" +"9737","Ireland","IRL","Pigmeat","fabio" +"9738","Ireland","IRL","Poultry Meat","fabio" +"9739","Ireland","IRL","Meat, Other","fabio" +"9740","Ireland","IRL","Offals, Edible","fabio" +"9741","Ireland","IRL","Fats, Animals, Raw","fabio" +"9742","Ireland","IRL","Hides and skins","fabio" +"9743","Ireland","IRL","Meat Meal","fabio" +"9744","Ireland","IRL","Pet food","fabio" +"9745","Ireland","IRL","Honey","fabio" +"9746","Ireland","IRL","Silk","fabio" +"9747","Ireland","IRL","Fish, Seafood","fabio" +"9748","Ireland","IRL","Wood fuel","fabio" +"9749","Ireland","IRL","Industrial roundwood, coniferous","fabio" +"9750","Ireland","IRL","Industrial roundwood, non-coniferous","fabio" +"9751","Israel","ISR","Rice (Milled Equivalent)","fabio" +"9752","Israel","ISR","Wheat and products","fabio" +"9753","Israel","ISR","Barley and products","fabio" +"9754","Israel","ISR","Maize and products","fabio" +"9755","Israel","ISR","Rye and products","fabio" +"9756","Israel","ISR","Oats","fabio" +"9757","Israel","ISR","Millet and products","fabio" +"9758","Israel","ISR","Sorghum and products","fabio" +"9759","Israel","ISR","Cereals, Other","fabio" +"9760","Israel","ISR","Potatoes and products","fabio" +"9761","Israel","ISR","Cassava and products","fabio" +"9762","Israel","ISR","Sweet potatoes","fabio" +"9763","Israel","ISR","Roots, Other","fabio" +"9764","Israel","ISR","Yams","fabio" +"9765","Israel","ISR","Sugar cane","fabio" +"9766","Israel","ISR","Sugar beet","fabio" +"9767","Israel","ISR","Beans","fabio" +"9768","Israel","ISR","Peas","fabio" +"9769","Israel","ISR","Pulses, Other and products","fabio" +"9770","Israel","ISR","Nuts and products","fabio" +"9771","Israel","ISR","Soyabeans","fabio" +"9772","Israel","ISR","Groundnuts (Shelled Eq)","fabio" +"9773","Israel","ISR","Sunflower seed","fabio" +"9774","Israel","ISR","Rape and Mustardseed","fabio" +"9775","Israel","ISR","Seed cotton","fabio" +"9776","Israel","ISR","Coconuts - Incl Copra","fabio" +"9777","Israel","ISR","Sesame seed","fabio" +"9778","Israel","ISR","Oil, palm fruit","fabio" +"9779","Israel","ISR","Olives (including preserved)","fabio" +"9780","Israel","ISR","Oilcrops, Other","fabio" +"9781","Israel","ISR","Tomatoes and products","fabio" +"9782","Israel","ISR","Onions","fabio" +"9783","Israel","ISR","Vegetables, Other","fabio" +"9784","Israel","ISR","Oranges, Mandarines","fabio" +"9785","Israel","ISR","Lemons, Limes and products","fabio" +"9786","Israel","ISR","Grapefruit and products","fabio" +"9787","Israel","ISR","Citrus, Other","fabio" +"9788","Israel","ISR","Bananas","fabio" +"9789","Israel","ISR","Plantains","fabio" +"9790","Israel","ISR","Apples and products","fabio" +"9791","Israel","ISR","Pineapples and products","fabio" +"9792","Israel","ISR","Dates","fabio" +"9793","Israel","ISR","Grapes and products (excl wine)","fabio" +"9794","Israel","ISR","Fruits, Other","fabio" +"9795","Israel","ISR","Coffee and products","fabio" +"9796","Israel","ISR","Cocoa Beans and products","fabio" +"9797","Israel","ISR","Tea (including mate)","fabio" +"9798","Israel","ISR","Hops","fabio" +"9799","Israel","ISR","Pepper","fabio" +"9800","Israel","ISR","Pimento","fabio" +"9801","Israel","ISR","Cloves","fabio" +"9802","Israel","ISR","Spices, Other","fabio" +"9803","Israel","ISR","Jute","fabio" +"9804","Israel","ISR","Jute-Like Fibres","fabio" +"9805","Israel","ISR","Soft-Fibres, Other","fabio" +"9806","Israel","ISR","Sisal","fabio" +"9807","Israel","ISR","Abaca","fabio" +"9808","Israel","ISR","Hard Fibres, Other","fabio" +"9809","Israel","ISR","Tobacco","fabio" +"9810","Israel","ISR","Rubber","fabio" +"9811","Israel","ISR","Fodder crops","fabio" +"9812","Israel","ISR","Grazing","fabio" +"9813","Israel","ISR","Cottonseed","fabio" +"9814","Israel","ISR","Palm kernels","fabio" +"9815","Israel","ISR","Sugar non-centrifugal","fabio" +"9816","Israel","ISR","Molasses","fabio" +"9817","Israel","ISR","Sugar, Refined Equiv","fabio" +"9818","Israel","ISR","Sweeteners, Other","fabio" +"9819","Israel","ISR","Soyabean Oil","fabio" +"9820","Israel","ISR","Groundnut Oil","fabio" +"9821","Israel","ISR","Sunflowerseed Oil","fabio" +"9822","Israel","ISR","Rape and Mustard Oil","fabio" +"9823","Israel","ISR","Cottonseed Oil","fabio" +"9824","Israel","ISR","Palmkernel Oil","fabio" +"9825","Israel","ISR","Palm Oil","fabio" +"9826","Israel","ISR","Coconut Oil","fabio" +"9827","Israel","ISR","Sesameseed Oil","fabio" +"9828","Israel","ISR","Olive Oil","fabio" +"9829","Israel","ISR","Ricebran Oil","fabio" +"9830","Israel","ISR","Maize Germ Oil","fabio" +"9831","Israel","ISR","Oilcrops Oil, Other","fabio" +"9832","Israel","ISR","Soyabean Cake","fabio" +"9833","Israel","ISR","Groundnut Cake","fabio" +"9834","Israel","ISR","Sunflowerseed Cake","fabio" +"9835","Israel","ISR","Rape and Mustard Cake","fabio" +"9836","Israel","ISR","Cottonseed Cake","fabio" +"9837","Israel","ISR","Palmkernel Cake","fabio" +"9838","Israel","ISR","Copra Cake","fabio" +"9839","Israel","ISR","Sesameseed Cake","fabio" +"9840","Israel","ISR","Oilseed Cakes, Other","fabio" +"9841","Israel","ISR","Wine","fabio" +"9842","Israel","ISR","Beer","fabio" +"9843","Israel","ISR","Beverages, Fermented","fabio" +"9844","Israel","ISR","Beverages, Alcoholic","fabio" +"9845","Israel","ISR","Alcohol, Non-Food","fabio" +"9846","Israel","ISR","Cotton lint","fabio" +"9847","Israel","ISR","Cattle","fabio" +"9848","Israel","ISR","Buffaloes","fabio" +"9849","Israel","ISR","Sheep","fabio" +"9850","Israel","ISR","Goats","fabio" +"9851","Israel","ISR","Pigs","fabio" +"9852","Israel","ISR","Poultry Birds","fabio" +"9853","Israel","ISR","Horses","fabio" +"9854","Israel","ISR","Asses","fabio" +"9855","Israel","ISR","Mules","fabio" +"9856","Israel","ISR","Camels","fabio" +"9857","Israel","ISR","Camelids, other","fabio" +"9858","Israel","ISR","Rabbits and hares","fabio" +"9859","Israel","ISR","Rodents, other","fabio" +"9860","Israel","ISR","Live animals, other","fabio" +"9861","Israel","ISR","Milk - Excluding Butter","fabio" +"9862","Israel","ISR","Butter, Ghee","fabio" +"9863","Israel","ISR","Eggs","fabio" +"9864","Israel","ISR","Wool (Clean Eq.)","fabio" +"9865","Israel","ISR","Bovine Meat","fabio" +"9866","Israel","ISR","Mutton & Goat Meat","fabio" +"9867","Israel","ISR","Pigmeat","fabio" +"9868","Israel","ISR","Poultry Meat","fabio" +"9869","Israel","ISR","Meat, Other","fabio" +"9870","Israel","ISR","Offals, Edible","fabio" +"9871","Israel","ISR","Fats, Animals, Raw","fabio" +"9872","Israel","ISR","Hides and skins","fabio" +"9873","Israel","ISR","Meat Meal","fabio" +"9874","Israel","ISR","Pet food","fabio" +"9875","Israel","ISR","Honey","fabio" +"9876","Israel","ISR","Silk","fabio" +"9877","Israel","ISR","Fish, Seafood","fabio" +"9878","Israel","ISR","Wood fuel","fabio" +"9879","Israel","ISR","Industrial roundwood, coniferous","fabio" +"9880","Israel","ISR","Industrial roundwood, non-coniferous","fabio" +"9881","Italy","ITA","Rice (Milled Equivalent)","fabio" +"9882","Italy","ITA","Wheat and products","fabio" +"9883","Italy","ITA","Barley and products","fabio" +"9884","Italy","ITA","Maize and products","fabio" +"9885","Italy","ITA","Rye and products","fabio" +"9886","Italy","ITA","Oats","fabio" +"9887","Italy","ITA","Millet and products","fabio" +"9888","Italy","ITA","Sorghum and products","fabio" +"9889","Italy","ITA","Cereals, Other","fabio" +"9890","Italy","ITA","Potatoes and products","fabio" +"9891","Italy","ITA","Cassava and products","fabio" +"9892","Italy","ITA","Sweet potatoes","fabio" +"9893","Italy","ITA","Roots, Other","fabio" +"9894","Italy","ITA","Yams","fabio" +"9895","Italy","ITA","Sugar cane","fabio" +"9896","Italy","ITA","Sugar beet","fabio" +"9897","Italy","ITA","Beans","fabio" +"9898","Italy","ITA","Peas","fabio" +"9899","Italy","ITA","Pulses, Other and products","fabio" +"9900","Italy","ITA","Nuts and products","fabio" +"9901","Italy","ITA","Soyabeans","fabio" +"9902","Italy","ITA","Groundnuts (Shelled Eq)","fabio" +"9903","Italy","ITA","Sunflower seed","fabio" +"9904","Italy","ITA","Rape and Mustardseed","fabio" +"9905","Italy","ITA","Seed cotton","fabio" +"9906","Italy","ITA","Coconuts - Incl Copra","fabio" +"9907","Italy","ITA","Sesame seed","fabio" +"9908","Italy","ITA","Oil, palm fruit","fabio" +"9909","Italy","ITA","Olives (including preserved)","fabio" +"9910","Italy","ITA","Oilcrops, Other","fabio" +"9911","Italy","ITA","Tomatoes and products","fabio" +"9912","Italy","ITA","Onions","fabio" +"9913","Italy","ITA","Vegetables, Other","fabio" +"9914","Italy","ITA","Oranges, Mandarines","fabio" +"9915","Italy","ITA","Lemons, Limes and products","fabio" +"9916","Italy","ITA","Grapefruit and products","fabio" +"9917","Italy","ITA","Citrus, Other","fabio" +"9918","Italy","ITA","Bananas","fabio" +"9919","Italy","ITA","Plantains","fabio" +"9920","Italy","ITA","Apples and products","fabio" +"9921","Italy","ITA","Pineapples and products","fabio" +"9922","Italy","ITA","Dates","fabio" +"9923","Italy","ITA","Grapes and products (excl wine)","fabio" +"9924","Italy","ITA","Fruits, Other","fabio" +"9925","Italy","ITA","Coffee and products","fabio" +"9926","Italy","ITA","Cocoa Beans and products","fabio" +"9927","Italy","ITA","Tea (including mate)","fabio" +"9928","Italy","ITA","Hops","fabio" +"9929","Italy","ITA","Pepper","fabio" +"9930","Italy","ITA","Pimento","fabio" +"9931","Italy","ITA","Cloves","fabio" +"9932","Italy","ITA","Spices, Other","fabio" +"9933","Italy","ITA","Jute","fabio" +"9934","Italy","ITA","Jute-Like Fibres","fabio" +"9935","Italy","ITA","Soft-Fibres, Other","fabio" +"9936","Italy","ITA","Sisal","fabio" +"9937","Italy","ITA","Abaca","fabio" +"9938","Italy","ITA","Hard Fibres, Other","fabio" +"9939","Italy","ITA","Tobacco","fabio" +"9940","Italy","ITA","Rubber","fabio" +"9941","Italy","ITA","Fodder crops","fabio" +"9942","Italy","ITA","Grazing","fabio" +"9943","Italy","ITA","Cottonseed","fabio" +"9944","Italy","ITA","Palm kernels","fabio" +"9945","Italy","ITA","Sugar non-centrifugal","fabio" +"9946","Italy","ITA","Molasses","fabio" +"9947","Italy","ITA","Sugar, Refined Equiv","fabio" +"9948","Italy","ITA","Sweeteners, Other","fabio" +"9949","Italy","ITA","Soyabean Oil","fabio" +"9950","Italy","ITA","Groundnut Oil","fabio" +"9951","Italy","ITA","Sunflowerseed Oil","fabio" +"9952","Italy","ITA","Rape and Mustard Oil","fabio" +"9953","Italy","ITA","Cottonseed Oil","fabio" +"9954","Italy","ITA","Palmkernel Oil","fabio" +"9955","Italy","ITA","Palm Oil","fabio" +"9956","Italy","ITA","Coconut Oil","fabio" +"9957","Italy","ITA","Sesameseed Oil","fabio" +"9958","Italy","ITA","Olive Oil","fabio" +"9959","Italy","ITA","Ricebran Oil","fabio" +"9960","Italy","ITA","Maize Germ Oil","fabio" +"9961","Italy","ITA","Oilcrops Oil, Other","fabio" +"9962","Italy","ITA","Soyabean Cake","fabio" +"9963","Italy","ITA","Groundnut Cake","fabio" +"9964","Italy","ITA","Sunflowerseed Cake","fabio" +"9965","Italy","ITA","Rape and Mustard Cake","fabio" +"9966","Italy","ITA","Cottonseed Cake","fabio" +"9967","Italy","ITA","Palmkernel Cake","fabio" +"9968","Italy","ITA","Copra Cake","fabio" +"9969","Italy","ITA","Sesameseed Cake","fabio" +"9970","Italy","ITA","Oilseed Cakes, Other","fabio" +"9971","Italy","ITA","Wine","fabio" +"9972","Italy","ITA","Beer","fabio" +"9973","Italy","ITA","Beverages, Fermented","fabio" +"9974","Italy","ITA","Beverages, Alcoholic","fabio" +"9975","Italy","ITA","Alcohol, Non-Food","fabio" +"9976","Italy","ITA","Cotton lint","fabio" +"9977","Italy","ITA","Cattle","fabio" +"9978","Italy","ITA","Buffaloes","fabio" +"9979","Italy","ITA","Sheep","fabio" +"9980","Italy","ITA","Goats","fabio" +"9981","Italy","ITA","Pigs","fabio" +"9982","Italy","ITA","Poultry Birds","fabio" +"9983","Italy","ITA","Horses","fabio" +"9984","Italy","ITA","Asses","fabio" +"9985","Italy","ITA","Mules","fabio" +"9986","Italy","ITA","Camels","fabio" +"9987","Italy","ITA","Camelids, other","fabio" +"9988","Italy","ITA","Rabbits and hares","fabio" +"9989","Italy","ITA","Rodents, other","fabio" +"9990","Italy","ITA","Live animals, other","fabio" +"9991","Italy","ITA","Milk - Excluding Butter","fabio" +"9992","Italy","ITA","Butter, Ghee","fabio" +"9993","Italy","ITA","Eggs","fabio" +"9994","Italy","ITA","Wool (Clean Eq.)","fabio" +"9995","Italy","ITA","Bovine Meat","fabio" +"9996","Italy","ITA","Mutton & Goat Meat","fabio" +"9997","Italy","ITA","Pigmeat","fabio" +"9998","Italy","ITA","Poultry Meat","fabio" +"9999","Italy","ITA","Meat, Other","fabio" +"10000","Italy","ITA","Offals, Edible","fabio" +"10001","Italy","ITA","Fats, Animals, Raw","fabio" +"10002","Italy","ITA","Hides and skins","fabio" +"10003","Italy","ITA","Meat Meal","fabio" +"10004","Italy","ITA","Pet food","fabio" +"10005","Italy","ITA","Honey","fabio" +"10006","Italy","ITA","Silk","fabio" +"10007","Italy","ITA","Fish, Seafood","fabio" +"10008","Italy","ITA","Wood fuel","fabio" +"10009","Italy","ITA","Industrial roundwood, coniferous","fabio" +"10010","Italy","ITA","Industrial roundwood, non-coniferous","fabio" +"10011","Côte d'Ivoire","CIV","Rice (Milled Equivalent)","fabio" +"10012","Côte d'Ivoire","CIV","Wheat and products","fabio" +"10013","Côte d'Ivoire","CIV","Barley and products","fabio" +"10014","Côte d'Ivoire","CIV","Maize and products","fabio" +"10015","Côte d'Ivoire","CIV","Rye and products","fabio" +"10016","Côte d'Ivoire","CIV","Oats","fabio" +"10017","Côte d'Ivoire","CIV","Millet and products","fabio" +"10018","Côte d'Ivoire","CIV","Sorghum and products","fabio" +"10019","Côte d'Ivoire","CIV","Cereals, Other","fabio" +"10020","Côte d'Ivoire","CIV","Potatoes and products","fabio" +"10021","Côte d'Ivoire","CIV","Cassava and products","fabio" +"10022","Côte d'Ivoire","CIV","Sweet potatoes","fabio" +"10023","Côte d'Ivoire","CIV","Roots, Other","fabio" +"10024","Côte d'Ivoire","CIV","Yams","fabio" +"10025","Côte d'Ivoire","CIV","Sugar cane","fabio" +"10026","Côte d'Ivoire","CIV","Sugar beet","fabio" +"10027","Côte d'Ivoire","CIV","Beans","fabio" +"10028","Côte d'Ivoire","CIV","Peas","fabio" +"10029","Côte d'Ivoire","CIV","Pulses, Other and products","fabio" +"10030","Côte d'Ivoire","CIV","Nuts and products","fabio" +"10031","Côte d'Ivoire","CIV","Soyabeans","fabio" +"10032","Côte d'Ivoire","CIV","Groundnuts (Shelled Eq)","fabio" +"10033","Côte d'Ivoire","CIV","Sunflower seed","fabio" +"10034","Côte d'Ivoire","CIV","Rape and Mustardseed","fabio" +"10035","Côte d'Ivoire","CIV","Seed cotton","fabio" +"10036","Côte d'Ivoire","CIV","Coconuts - Incl Copra","fabio" +"10037","Côte d'Ivoire","CIV","Sesame seed","fabio" +"10038","Côte d'Ivoire","CIV","Oil, palm fruit","fabio" +"10039","Côte d'Ivoire","CIV","Olives (including preserved)","fabio" +"10040","Côte d'Ivoire","CIV","Oilcrops, Other","fabio" +"10041","Côte d'Ivoire","CIV","Tomatoes and products","fabio" +"10042","Côte d'Ivoire","CIV","Onions","fabio" +"10043","Côte d'Ivoire","CIV","Vegetables, Other","fabio" +"10044","Côte d'Ivoire","CIV","Oranges, Mandarines","fabio" +"10045","Côte d'Ivoire","CIV","Lemons, Limes and products","fabio" +"10046","Côte d'Ivoire","CIV","Grapefruit and products","fabio" +"10047","Côte d'Ivoire","CIV","Citrus, Other","fabio" +"10048","Côte d'Ivoire","CIV","Bananas","fabio" +"10049","Côte d'Ivoire","CIV","Plantains","fabio" +"10050","Côte d'Ivoire","CIV","Apples and products","fabio" +"10051","Côte d'Ivoire","CIV","Pineapples and products","fabio" +"10052","Côte d'Ivoire","CIV","Dates","fabio" +"10053","Côte d'Ivoire","CIV","Grapes and products (excl wine)","fabio" +"10054","Côte d'Ivoire","CIV","Fruits, Other","fabio" +"10055","Côte d'Ivoire","CIV","Coffee and products","fabio" +"10056","Côte d'Ivoire","CIV","Cocoa Beans and products","fabio" +"10057","Côte d'Ivoire","CIV","Tea (including mate)","fabio" +"10058","Côte d'Ivoire","CIV","Hops","fabio" +"10059","Côte d'Ivoire","CIV","Pepper","fabio" +"10060","Côte d'Ivoire","CIV","Pimento","fabio" +"10061","Côte d'Ivoire","CIV","Cloves","fabio" +"10062","Côte d'Ivoire","CIV","Spices, Other","fabio" +"10063","Côte d'Ivoire","CIV","Jute","fabio" +"10064","Côte d'Ivoire","CIV","Jute-Like Fibres","fabio" +"10065","Côte d'Ivoire","CIV","Soft-Fibres, Other","fabio" +"10066","Côte d'Ivoire","CIV","Sisal","fabio" +"10067","Côte d'Ivoire","CIV","Abaca","fabio" +"10068","Côte d'Ivoire","CIV","Hard Fibres, Other","fabio" +"10069","Côte d'Ivoire","CIV","Tobacco","fabio" +"10070","Côte d'Ivoire","CIV","Rubber","fabio" +"10071","Côte d'Ivoire","CIV","Fodder crops","fabio" +"10072","Côte d'Ivoire","CIV","Grazing","fabio" +"10073","Côte d'Ivoire","CIV","Cottonseed","fabio" +"10074","Côte d'Ivoire","CIV","Palm kernels","fabio" +"10075","Côte d'Ivoire","CIV","Sugar non-centrifugal","fabio" +"10076","Côte d'Ivoire","CIV","Molasses","fabio" +"10077","Côte d'Ivoire","CIV","Sugar, Refined Equiv","fabio" +"10078","Côte d'Ivoire","CIV","Sweeteners, Other","fabio" +"10079","Côte d'Ivoire","CIV","Soyabean Oil","fabio" +"10080","Côte d'Ivoire","CIV","Groundnut Oil","fabio" +"10081","Côte d'Ivoire","CIV","Sunflowerseed Oil","fabio" +"10082","Côte d'Ivoire","CIV","Rape and Mustard Oil","fabio" +"10083","Côte d'Ivoire","CIV","Cottonseed Oil","fabio" +"10084","Côte d'Ivoire","CIV","Palmkernel Oil","fabio" +"10085","Côte d'Ivoire","CIV","Palm Oil","fabio" +"10086","Côte d'Ivoire","CIV","Coconut Oil","fabio" +"10087","Côte d'Ivoire","CIV","Sesameseed Oil","fabio" +"10088","Côte d'Ivoire","CIV","Olive Oil","fabio" +"10089","Côte d'Ivoire","CIV","Ricebran Oil","fabio" +"10090","Côte d'Ivoire","CIV","Maize Germ Oil","fabio" +"10091","Côte d'Ivoire","CIV","Oilcrops Oil, Other","fabio" +"10092","Côte d'Ivoire","CIV","Soyabean Cake","fabio" +"10093","Côte d'Ivoire","CIV","Groundnut Cake","fabio" +"10094","Côte d'Ivoire","CIV","Sunflowerseed Cake","fabio" +"10095","Côte d'Ivoire","CIV","Rape and Mustard Cake","fabio" +"10096","Côte d'Ivoire","CIV","Cottonseed Cake","fabio" +"10097","Côte d'Ivoire","CIV","Palmkernel Cake","fabio" +"10098","Côte d'Ivoire","CIV","Copra Cake","fabio" +"10099","Côte d'Ivoire","CIV","Sesameseed Cake","fabio" +"10100","Côte d'Ivoire","CIV","Oilseed Cakes, Other","fabio" +"10101","Côte d'Ivoire","CIV","Wine","fabio" +"10102","Côte d'Ivoire","CIV","Beer","fabio" +"10103","Côte d'Ivoire","CIV","Beverages, Fermented","fabio" +"10104","Côte d'Ivoire","CIV","Beverages, Alcoholic","fabio" +"10105","Côte d'Ivoire","CIV","Alcohol, Non-Food","fabio" +"10106","Côte d'Ivoire","CIV","Cotton lint","fabio" +"10107","Côte d'Ivoire","CIV","Cattle","fabio" +"10108","Côte d'Ivoire","CIV","Buffaloes","fabio" +"10109","Côte d'Ivoire","CIV","Sheep","fabio" +"10110","Côte d'Ivoire","CIV","Goats","fabio" +"10111","Côte d'Ivoire","CIV","Pigs","fabio" +"10112","Côte d'Ivoire","CIV","Poultry Birds","fabio" +"10113","Côte d'Ivoire","CIV","Horses","fabio" +"10114","Côte d'Ivoire","CIV","Asses","fabio" +"10115","Côte d'Ivoire","CIV","Mules","fabio" +"10116","Côte d'Ivoire","CIV","Camels","fabio" +"10117","Côte d'Ivoire","CIV","Camelids, other","fabio" +"10118","Côte d'Ivoire","CIV","Rabbits and hares","fabio" +"10119","Côte d'Ivoire","CIV","Rodents, other","fabio" +"10120","Côte d'Ivoire","CIV","Live animals, other","fabio" +"10121","Côte d'Ivoire","CIV","Milk - Excluding Butter","fabio" +"10122","Côte d'Ivoire","CIV","Butter, Ghee","fabio" +"10123","Côte d'Ivoire","CIV","Eggs","fabio" +"10124","Côte d'Ivoire","CIV","Wool (Clean Eq.)","fabio" +"10125","Côte d'Ivoire","CIV","Bovine Meat","fabio" +"10126","Côte d'Ivoire","CIV","Mutton & Goat Meat","fabio" +"10127","Côte d'Ivoire","CIV","Pigmeat","fabio" +"10128","Côte d'Ivoire","CIV","Poultry Meat","fabio" +"10129","Côte d'Ivoire","CIV","Meat, Other","fabio" +"10130","Côte d'Ivoire","CIV","Offals, Edible","fabio" +"10131","Côte d'Ivoire","CIV","Fats, Animals, Raw","fabio" +"10132","Côte d'Ivoire","CIV","Hides and skins","fabio" +"10133","Côte d'Ivoire","CIV","Meat Meal","fabio" +"10134","Côte d'Ivoire","CIV","Pet food","fabio" +"10135","Côte d'Ivoire","CIV","Honey","fabio" +"10136","Côte d'Ivoire","CIV","Silk","fabio" +"10137","Côte d'Ivoire","CIV","Fish, Seafood","fabio" +"10138","Côte d'Ivoire","CIV","Wood fuel","fabio" +"10139","Côte d'Ivoire","CIV","Industrial roundwood, coniferous","fabio" +"10140","Côte d'Ivoire","CIV","Industrial roundwood, non-coniferous","fabio" +"10141","Kazakhstan","KAZ","Rice (Milled Equivalent)","fabio" +"10142","Kazakhstan","KAZ","Wheat and products","fabio" +"10143","Kazakhstan","KAZ","Barley and products","fabio" +"10144","Kazakhstan","KAZ","Maize and products","fabio" +"10145","Kazakhstan","KAZ","Rye and products","fabio" +"10146","Kazakhstan","KAZ","Oats","fabio" +"10147","Kazakhstan","KAZ","Millet and products","fabio" +"10148","Kazakhstan","KAZ","Sorghum and products","fabio" +"10149","Kazakhstan","KAZ","Cereals, Other","fabio" +"10150","Kazakhstan","KAZ","Potatoes and products","fabio" +"10151","Kazakhstan","KAZ","Cassava and products","fabio" +"10152","Kazakhstan","KAZ","Sweet potatoes","fabio" +"10153","Kazakhstan","KAZ","Roots, Other","fabio" +"10154","Kazakhstan","KAZ","Yams","fabio" +"10155","Kazakhstan","KAZ","Sugar cane","fabio" +"10156","Kazakhstan","KAZ","Sugar beet","fabio" +"10157","Kazakhstan","KAZ","Beans","fabio" +"10158","Kazakhstan","KAZ","Peas","fabio" +"10159","Kazakhstan","KAZ","Pulses, Other and products","fabio" +"10160","Kazakhstan","KAZ","Nuts and products","fabio" +"10161","Kazakhstan","KAZ","Soyabeans","fabio" +"10162","Kazakhstan","KAZ","Groundnuts (Shelled Eq)","fabio" +"10163","Kazakhstan","KAZ","Sunflower seed","fabio" +"10164","Kazakhstan","KAZ","Rape and Mustardseed","fabio" +"10165","Kazakhstan","KAZ","Seed cotton","fabio" +"10166","Kazakhstan","KAZ","Coconuts - Incl Copra","fabio" +"10167","Kazakhstan","KAZ","Sesame seed","fabio" +"10168","Kazakhstan","KAZ","Oil, palm fruit","fabio" +"10169","Kazakhstan","KAZ","Olives (including preserved)","fabio" +"10170","Kazakhstan","KAZ","Oilcrops, Other","fabio" +"10171","Kazakhstan","KAZ","Tomatoes and products","fabio" +"10172","Kazakhstan","KAZ","Onions","fabio" +"10173","Kazakhstan","KAZ","Vegetables, Other","fabio" +"10174","Kazakhstan","KAZ","Oranges, Mandarines","fabio" +"10175","Kazakhstan","KAZ","Lemons, Limes and products","fabio" +"10176","Kazakhstan","KAZ","Grapefruit and products","fabio" +"10177","Kazakhstan","KAZ","Citrus, Other","fabio" +"10178","Kazakhstan","KAZ","Bananas","fabio" +"10179","Kazakhstan","KAZ","Plantains","fabio" +"10180","Kazakhstan","KAZ","Apples and products","fabio" +"10181","Kazakhstan","KAZ","Pineapples and products","fabio" +"10182","Kazakhstan","KAZ","Dates","fabio" +"10183","Kazakhstan","KAZ","Grapes and products (excl wine)","fabio" +"10184","Kazakhstan","KAZ","Fruits, Other","fabio" +"10185","Kazakhstan","KAZ","Coffee and products","fabio" +"10186","Kazakhstan","KAZ","Cocoa Beans and products","fabio" +"10187","Kazakhstan","KAZ","Tea (including mate)","fabio" +"10188","Kazakhstan","KAZ","Hops","fabio" +"10189","Kazakhstan","KAZ","Pepper","fabio" +"10190","Kazakhstan","KAZ","Pimento","fabio" +"10191","Kazakhstan","KAZ","Cloves","fabio" +"10192","Kazakhstan","KAZ","Spices, Other","fabio" +"10193","Kazakhstan","KAZ","Jute","fabio" +"10194","Kazakhstan","KAZ","Jute-Like Fibres","fabio" +"10195","Kazakhstan","KAZ","Soft-Fibres, Other","fabio" +"10196","Kazakhstan","KAZ","Sisal","fabio" +"10197","Kazakhstan","KAZ","Abaca","fabio" +"10198","Kazakhstan","KAZ","Hard Fibres, Other","fabio" +"10199","Kazakhstan","KAZ","Tobacco","fabio" +"10200","Kazakhstan","KAZ","Rubber","fabio" +"10201","Kazakhstan","KAZ","Fodder crops","fabio" +"10202","Kazakhstan","KAZ","Grazing","fabio" +"10203","Kazakhstan","KAZ","Cottonseed","fabio" +"10204","Kazakhstan","KAZ","Palm kernels","fabio" +"10205","Kazakhstan","KAZ","Sugar non-centrifugal","fabio" +"10206","Kazakhstan","KAZ","Molasses","fabio" +"10207","Kazakhstan","KAZ","Sugar, Refined Equiv","fabio" +"10208","Kazakhstan","KAZ","Sweeteners, Other","fabio" +"10209","Kazakhstan","KAZ","Soyabean Oil","fabio" +"10210","Kazakhstan","KAZ","Groundnut Oil","fabio" +"10211","Kazakhstan","KAZ","Sunflowerseed Oil","fabio" +"10212","Kazakhstan","KAZ","Rape and Mustard Oil","fabio" +"10213","Kazakhstan","KAZ","Cottonseed Oil","fabio" +"10214","Kazakhstan","KAZ","Palmkernel Oil","fabio" +"10215","Kazakhstan","KAZ","Palm Oil","fabio" +"10216","Kazakhstan","KAZ","Coconut Oil","fabio" +"10217","Kazakhstan","KAZ","Sesameseed Oil","fabio" +"10218","Kazakhstan","KAZ","Olive Oil","fabio" +"10219","Kazakhstan","KAZ","Ricebran Oil","fabio" +"10220","Kazakhstan","KAZ","Maize Germ Oil","fabio" +"10221","Kazakhstan","KAZ","Oilcrops Oil, Other","fabio" +"10222","Kazakhstan","KAZ","Soyabean Cake","fabio" +"10223","Kazakhstan","KAZ","Groundnut Cake","fabio" +"10224","Kazakhstan","KAZ","Sunflowerseed Cake","fabio" +"10225","Kazakhstan","KAZ","Rape and Mustard Cake","fabio" +"10226","Kazakhstan","KAZ","Cottonseed Cake","fabio" +"10227","Kazakhstan","KAZ","Palmkernel Cake","fabio" +"10228","Kazakhstan","KAZ","Copra Cake","fabio" +"10229","Kazakhstan","KAZ","Sesameseed Cake","fabio" +"10230","Kazakhstan","KAZ","Oilseed Cakes, Other","fabio" +"10231","Kazakhstan","KAZ","Wine","fabio" +"10232","Kazakhstan","KAZ","Beer","fabio" +"10233","Kazakhstan","KAZ","Beverages, Fermented","fabio" +"10234","Kazakhstan","KAZ","Beverages, Alcoholic","fabio" +"10235","Kazakhstan","KAZ","Alcohol, Non-Food","fabio" +"10236","Kazakhstan","KAZ","Cotton lint","fabio" +"10237","Kazakhstan","KAZ","Cattle","fabio" +"10238","Kazakhstan","KAZ","Buffaloes","fabio" +"10239","Kazakhstan","KAZ","Sheep","fabio" +"10240","Kazakhstan","KAZ","Goats","fabio" +"10241","Kazakhstan","KAZ","Pigs","fabio" +"10242","Kazakhstan","KAZ","Poultry Birds","fabio" +"10243","Kazakhstan","KAZ","Horses","fabio" +"10244","Kazakhstan","KAZ","Asses","fabio" +"10245","Kazakhstan","KAZ","Mules","fabio" +"10246","Kazakhstan","KAZ","Camels","fabio" +"10247","Kazakhstan","KAZ","Camelids, other","fabio" +"10248","Kazakhstan","KAZ","Rabbits and hares","fabio" +"10249","Kazakhstan","KAZ","Rodents, other","fabio" +"10250","Kazakhstan","KAZ","Live animals, other","fabio" +"10251","Kazakhstan","KAZ","Milk - Excluding Butter","fabio" +"10252","Kazakhstan","KAZ","Butter, Ghee","fabio" +"10253","Kazakhstan","KAZ","Eggs","fabio" +"10254","Kazakhstan","KAZ","Wool (Clean Eq.)","fabio" +"10255","Kazakhstan","KAZ","Bovine Meat","fabio" +"10256","Kazakhstan","KAZ","Mutton & Goat Meat","fabio" +"10257","Kazakhstan","KAZ","Pigmeat","fabio" +"10258","Kazakhstan","KAZ","Poultry Meat","fabio" +"10259","Kazakhstan","KAZ","Meat, Other","fabio" +"10260","Kazakhstan","KAZ","Offals, Edible","fabio" +"10261","Kazakhstan","KAZ","Fats, Animals, Raw","fabio" +"10262","Kazakhstan","KAZ","Hides and skins","fabio" +"10263","Kazakhstan","KAZ","Meat Meal","fabio" +"10264","Kazakhstan","KAZ","Pet food","fabio" +"10265","Kazakhstan","KAZ","Honey","fabio" +"10266","Kazakhstan","KAZ","Silk","fabio" +"10267","Kazakhstan","KAZ","Fish, Seafood","fabio" +"10268","Kazakhstan","KAZ","Wood fuel","fabio" +"10269","Kazakhstan","KAZ","Industrial roundwood, coniferous","fabio" +"10270","Kazakhstan","KAZ","Industrial roundwood, non-coniferous","fabio" +"10271","Jamaica","JAM","Rice (Milled Equivalent)","fabio" +"10272","Jamaica","JAM","Wheat and products","fabio" +"10273","Jamaica","JAM","Barley and products","fabio" +"10274","Jamaica","JAM","Maize and products","fabio" +"10275","Jamaica","JAM","Rye and products","fabio" +"10276","Jamaica","JAM","Oats","fabio" +"10277","Jamaica","JAM","Millet and products","fabio" +"10278","Jamaica","JAM","Sorghum and products","fabio" +"10279","Jamaica","JAM","Cereals, Other","fabio" +"10280","Jamaica","JAM","Potatoes and products","fabio" +"10281","Jamaica","JAM","Cassava and products","fabio" +"10282","Jamaica","JAM","Sweet potatoes","fabio" +"10283","Jamaica","JAM","Roots, Other","fabio" +"10284","Jamaica","JAM","Yams","fabio" +"10285","Jamaica","JAM","Sugar cane","fabio" +"10286","Jamaica","JAM","Sugar beet","fabio" +"10287","Jamaica","JAM","Beans","fabio" +"10288","Jamaica","JAM","Peas","fabio" +"10289","Jamaica","JAM","Pulses, Other and products","fabio" +"10290","Jamaica","JAM","Nuts and products","fabio" +"10291","Jamaica","JAM","Soyabeans","fabio" +"10292","Jamaica","JAM","Groundnuts (Shelled Eq)","fabio" +"10293","Jamaica","JAM","Sunflower seed","fabio" +"10294","Jamaica","JAM","Rape and Mustardseed","fabio" +"10295","Jamaica","JAM","Seed cotton","fabio" +"10296","Jamaica","JAM","Coconuts - Incl Copra","fabio" +"10297","Jamaica","JAM","Sesame seed","fabio" +"10298","Jamaica","JAM","Oil, palm fruit","fabio" +"10299","Jamaica","JAM","Olives (including preserved)","fabio" +"10300","Jamaica","JAM","Oilcrops, Other","fabio" +"10301","Jamaica","JAM","Tomatoes and products","fabio" +"10302","Jamaica","JAM","Onions","fabio" +"10303","Jamaica","JAM","Vegetables, Other","fabio" +"10304","Jamaica","JAM","Oranges, Mandarines","fabio" +"10305","Jamaica","JAM","Lemons, Limes and products","fabio" +"10306","Jamaica","JAM","Grapefruit and products","fabio" +"10307","Jamaica","JAM","Citrus, Other","fabio" +"10308","Jamaica","JAM","Bananas","fabio" +"10309","Jamaica","JAM","Plantains","fabio" +"10310","Jamaica","JAM","Apples and products","fabio" +"10311","Jamaica","JAM","Pineapples and products","fabio" +"10312","Jamaica","JAM","Dates","fabio" +"10313","Jamaica","JAM","Grapes and products (excl wine)","fabio" +"10314","Jamaica","JAM","Fruits, Other","fabio" +"10315","Jamaica","JAM","Coffee and products","fabio" +"10316","Jamaica","JAM","Cocoa Beans and products","fabio" +"10317","Jamaica","JAM","Tea (including mate)","fabio" +"10318","Jamaica","JAM","Hops","fabio" +"10319","Jamaica","JAM","Pepper","fabio" +"10320","Jamaica","JAM","Pimento","fabio" +"10321","Jamaica","JAM","Cloves","fabio" +"10322","Jamaica","JAM","Spices, Other","fabio" +"10323","Jamaica","JAM","Jute","fabio" +"10324","Jamaica","JAM","Jute-Like Fibres","fabio" +"10325","Jamaica","JAM","Soft-Fibres, Other","fabio" +"10326","Jamaica","JAM","Sisal","fabio" +"10327","Jamaica","JAM","Abaca","fabio" +"10328","Jamaica","JAM","Hard Fibres, Other","fabio" +"10329","Jamaica","JAM","Tobacco","fabio" +"10330","Jamaica","JAM","Rubber","fabio" +"10331","Jamaica","JAM","Fodder crops","fabio" +"10332","Jamaica","JAM","Grazing","fabio" +"10333","Jamaica","JAM","Cottonseed","fabio" +"10334","Jamaica","JAM","Palm kernels","fabio" +"10335","Jamaica","JAM","Sugar non-centrifugal","fabio" +"10336","Jamaica","JAM","Molasses","fabio" +"10337","Jamaica","JAM","Sugar, Refined Equiv","fabio" +"10338","Jamaica","JAM","Sweeteners, Other","fabio" +"10339","Jamaica","JAM","Soyabean Oil","fabio" +"10340","Jamaica","JAM","Groundnut Oil","fabio" +"10341","Jamaica","JAM","Sunflowerseed Oil","fabio" +"10342","Jamaica","JAM","Rape and Mustard Oil","fabio" +"10343","Jamaica","JAM","Cottonseed Oil","fabio" +"10344","Jamaica","JAM","Palmkernel Oil","fabio" +"10345","Jamaica","JAM","Palm Oil","fabio" +"10346","Jamaica","JAM","Coconut Oil","fabio" +"10347","Jamaica","JAM","Sesameseed Oil","fabio" +"10348","Jamaica","JAM","Olive Oil","fabio" +"10349","Jamaica","JAM","Ricebran Oil","fabio" +"10350","Jamaica","JAM","Maize Germ Oil","fabio" +"10351","Jamaica","JAM","Oilcrops Oil, Other","fabio" +"10352","Jamaica","JAM","Soyabean Cake","fabio" +"10353","Jamaica","JAM","Groundnut Cake","fabio" +"10354","Jamaica","JAM","Sunflowerseed Cake","fabio" +"10355","Jamaica","JAM","Rape and Mustard Cake","fabio" +"10356","Jamaica","JAM","Cottonseed Cake","fabio" +"10357","Jamaica","JAM","Palmkernel Cake","fabio" +"10358","Jamaica","JAM","Copra Cake","fabio" +"10359","Jamaica","JAM","Sesameseed Cake","fabio" +"10360","Jamaica","JAM","Oilseed Cakes, Other","fabio" +"10361","Jamaica","JAM","Wine","fabio" +"10362","Jamaica","JAM","Beer","fabio" +"10363","Jamaica","JAM","Beverages, Fermented","fabio" +"10364","Jamaica","JAM","Beverages, Alcoholic","fabio" +"10365","Jamaica","JAM","Alcohol, Non-Food","fabio" +"10366","Jamaica","JAM","Cotton lint","fabio" +"10367","Jamaica","JAM","Cattle","fabio" +"10368","Jamaica","JAM","Buffaloes","fabio" +"10369","Jamaica","JAM","Sheep","fabio" +"10370","Jamaica","JAM","Goats","fabio" +"10371","Jamaica","JAM","Pigs","fabio" +"10372","Jamaica","JAM","Poultry Birds","fabio" +"10373","Jamaica","JAM","Horses","fabio" +"10374","Jamaica","JAM","Asses","fabio" +"10375","Jamaica","JAM","Mules","fabio" +"10376","Jamaica","JAM","Camels","fabio" +"10377","Jamaica","JAM","Camelids, other","fabio" +"10378","Jamaica","JAM","Rabbits and hares","fabio" +"10379","Jamaica","JAM","Rodents, other","fabio" +"10380","Jamaica","JAM","Live animals, other","fabio" +"10381","Jamaica","JAM","Milk - Excluding Butter","fabio" +"10382","Jamaica","JAM","Butter, Ghee","fabio" +"10383","Jamaica","JAM","Eggs","fabio" +"10384","Jamaica","JAM","Wool (Clean Eq.)","fabio" +"10385","Jamaica","JAM","Bovine Meat","fabio" +"10386","Jamaica","JAM","Mutton & Goat Meat","fabio" +"10387","Jamaica","JAM","Pigmeat","fabio" +"10388","Jamaica","JAM","Poultry Meat","fabio" +"10389","Jamaica","JAM","Meat, Other","fabio" +"10390","Jamaica","JAM","Offals, Edible","fabio" +"10391","Jamaica","JAM","Fats, Animals, Raw","fabio" +"10392","Jamaica","JAM","Hides and skins","fabio" +"10393","Jamaica","JAM","Meat Meal","fabio" +"10394","Jamaica","JAM","Pet food","fabio" +"10395","Jamaica","JAM","Honey","fabio" +"10396","Jamaica","JAM","Silk","fabio" +"10397","Jamaica","JAM","Fish, Seafood","fabio" +"10398","Jamaica","JAM","Wood fuel","fabio" +"10399","Jamaica","JAM","Industrial roundwood, coniferous","fabio" +"10400","Jamaica","JAM","Industrial roundwood, non-coniferous","fabio" +"10401","Japan","JPN","Rice (Milled Equivalent)","fabio" +"10402","Japan","JPN","Wheat and products","fabio" +"10403","Japan","JPN","Barley and products","fabio" +"10404","Japan","JPN","Maize and products","fabio" +"10405","Japan","JPN","Rye and products","fabio" +"10406","Japan","JPN","Oats","fabio" +"10407","Japan","JPN","Millet and products","fabio" +"10408","Japan","JPN","Sorghum and products","fabio" +"10409","Japan","JPN","Cereals, Other","fabio" +"10410","Japan","JPN","Potatoes and products","fabio" +"10411","Japan","JPN","Cassava and products","fabio" +"10412","Japan","JPN","Sweet potatoes","fabio" +"10413","Japan","JPN","Roots, Other","fabio" +"10414","Japan","JPN","Yams","fabio" +"10415","Japan","JPN","Sugar cane","fabio" +"10416","Japan","JPN","Sugar beet","fabio" +"10417","Japan","JPN","Beans","fabio" +"10418","Japan","JPN","Peas","fabio" +"10419","Japan","JPN","Pulses, Other and products","fabio" +"10420","Japan","JPN","Nuts and products","fabio" +"10421","Japan","JPN","Soyabeans","fabio" +"10422","Japan","JPN","Groundnuts (Shelled Eq)","fabio" +"10423","Japan","JPN","Sunflower seed","fabio" +"10424","Japan","JPN","Rape and Mustardseed","fabio" +"10425","Japan","JPN","Seed cotton","fabio" +"10426","Japan","JPN","Coconuts - Incl Copra","fabio" +"10427","Japan","JPN","Sesame seed","fabio" +"10428","Japan","JPN","Oil, palm fruit","fabio" +"10429","Japan","JPN","Olives (including preserved)","fabio" +"10430","Japan","JPN","Oilcrops, Other","fabio" +"10431","Japan","JPN","Tomatoes and products","fabio" +"10432","Japan","JPN","Onions","fabio" +"10433","Japan","JPN","Vegetables, Other","fabio" +"10434","Japan","JPN","Oranges, Mandarines","fabio" +"10435","Japan","JPN","Lemons, Limes and products","fabio" +"10436","Japan","JPN","Grapefruit and products","fabio" +"10437","Japan","JPN","Citrus, Other","fabio" +"10438","Japan","JPN","Bananas","fabio" +"10439","Japan","JPN","Plantains","fabio" +"10440","Japan","JPN","Apples and products","fabio" +"10441","Japan","JPN","Pineapples and products","fabio" +"10442","Japan","JPN","Dates","fabio" +"10443","Japan","JPN","Grapes and products (excl wine)","fabio" +"10444","Japan","JPN","Fruits, Other","fabio" +"10445","Japan","JPN","Coffee and products","fabio" +"10446","Japan","JPN","Cocoa Beans and products","fabio" +"10447","Japan","JPN","Tea (including mate)","fabio" +"10448","Japan","JPN","Hops","fabio" +"10449","Japan","JPN","Pepper","fabio" +"10450","Japan","JPN","Pimento","fabio" +"10451","Japan","JPN","Cloves","fabio" +"10452","Japan","JPN","Spices, Other","fabio" +"10453","Japan","JPN","Jute","fabio" +"10454","Japan","JPN","Jute-Like Fibres","fabio" +"10455","Japan","JPN","Soft-Fibres, Other","fabio" +"10456","Japan","JPN","Sisal","fabio" +"10457","Japan","JPN","Abaca","fabio" +"10458","Japan","JPN","Hard Fibres, Other","fabio" +"10459","Japan","JPN","Tobacco","fabio" +"10460","Japan","JPN","Rubber","fabio" +"10461","Japan","JPN","Fodder crops","fabio" +"10462","Japan","JPN","Grazing","fabio" +"10463","Japan","JPN","Cottonseed","fabio" +"10464","Japan","JPN","Palm kernels","fabio" +"10465","Japan","JPN","Sugar non-centrifugal","fabio" +"10466","Japan","JPN","Molasses","fabio" +"10467","Japan","JPN","Sugar, Refined Equiv","fabio" +"10468","Japan","JPN","Sweeteners, Other","fabio" +"10469","Japan","JPN","Soyabean Oil","fabio" +"10470","Japan","JPN","Groundnut Oil","fabio" +"10471","Japan","JPN","Sunflowerseed Oil","fabio" +"10472","Japan","JPN","Rape and Mustard Oil","fabio" +"10473","Japan","JPN","Cottonseed Oil","fabio" +"10474","Japan","JPN","Palmkernel Oil","fabio" +"10475","Japan","JPN","Palm Oil","fabio" +"10476","Japan","JPN","Coconut Oil","fabio" +"10477","Japan","JPN","Sesameseed Oil","fabio" +"10478","Japan","JPN","Olive Oil","fabio" +"10479","Japan","JPN","Ricebran Oil","fabio" +"10480","Japan","JPN","Maize Germ Oil","fabio" +"10481","Japan","JPN","Oilcrops Oil, Other","fabio" +"10482","Japan","JPN","Soyabean Cake","fabio" +"10483","Japan","JPN","Groundnut Cake","fabio" +"10484","Japan","JPN","Sunflowerseed Cake","fabio" +"10485","Japan","JPN","Rape and Mustard Cake","fabio" +"10486","Japan","JPN","Cottonseed Cake","fabio" +"10487","Japan","JPN","Palmkernel Cake","fabio" +"10488","Japan","JPN","Copra Cake","fabio" +"10489","Japan","JPN","Sesameseed Cake","fabio" +"10490","Japan","JPN","Oilseed Cakes, Other","fabio" +"10491","Japan","JPN","Wine","fabio" +"10492","Japan","JPN","Beer","fabio" +"10493","Japan","JPN","Beverages, Fermented","fabio" +"10494","Japan","JPN","Beverages, Alcoholic","fabio" +"10495","Japan","JPN","Alcohol, Non-Food","fabio" +"10496","Japan","JPN","Cotton lint","fabio" +"10497","Japan","JPN","Cattle","fabio" +"10498","Japan","JPN","Buffaloes","fabio" +"10499","Japan","JPN","Sheep","fabio" +"10500","Japan","JPN","Goats","fabio" +"10501","Japan","JPN","Pigs","fabio" +"10502","Japan","JPN","Poultry Birds","fabio" +"10503","Japan","JPN","Horses","fabio" +"10504","Japan","JPN","Asses","fabio" +"10505","Japan","JPN","Mules","fabio" +"10506","Japan","JPN","Camels","fabio" +"10507","Japan","JPN","Camelids, other","fabio" +"10508","Japan","JPN","Rabbits and hares","fabio" +"10509","Japan","JPN","Rodents, other","fabio" +"10510","Japan","JPN","Live animals, other","fabio" +"10511","Japan","JPN","Milk - Excluding Butter","fabio" +"10512","Japan","JPN","Butter, Ghee","fabio" +"10513","Japan","JPN","Eggs","fabio" +"10514","Japan","JPN","Wool (Clean Eq.)","fabio" +"10515","Japan","JPN","Bovine Meat","fabio" +"10516","Japan","JPN","Mutton & Goat Meat","fabio" +"10517","Japan","JPN","Pigmeat","fabio" +"10518","Japan","JPN","Poultry Meat","fabio" +"10519","Japan","JPN","Meat, Other","fabio" +"10520","Japan","JPN","Offals, Edible","fabio" +"10521","Japan","JPN","Fats, Animals, Raw","fabio" +"10522","Japan","JPN","Hides and skins","fabio" +"10523","Japan","JPN","Meat Meal","fabio" +"10524","Japan","JPN","Pet food","fabio" +"10525","Japan","JPN","Honey","fabio" +"10526","Japan","JPN","Silk","fabio" +"10527","Japan","JPN","Fish, Seafood","fabio" +"10528","Japan","JPN","Wood fuel","fabio" +"10529","Japan","JPN","Industrial roundwood, coniferous","fabio" +"10530","Japan","JPN","Industrial roundwood, non-coniferous","fabio" +"10531","Jordan","JOR","Rice (Milled Equivalent)","fabio" +"10532","Jordan","JOR","Wheat and products","fabio" +"10533","Jordan","JOR","Barley and products","fabio" +"10534","Jordan","JOR","Maize and products","fabio" +"10535","Jordan","JOR","Rye and products","fabio" +"10536","Jordan","JOR","Oats","fabio" +"10537","Jordan","JOR","Millet and products","fabio" +"10538","Jordan","JOR","Sorghum and products","fabio" +"10539","Jordan","JOR","Cereals, Other","fabio" +"10540","Jordan","JOR","Potatoes and products","fabio" +"10541","Jordan","JOR","Cassava and products","fabio" +"10542","Jordan","JOR","Sweet potatoes","fabio" +"10543","Jordan","JOR","Roots, Other","fabio" +"10544","Jordan","JOR","Yams","fabio" +"10545","Jordan","JOR","Sugar cane","fabio" +"10546","Jordan","JOR","Sugar beet","fabio" +"10547","Jordan","JOR","Beans","fabio" +"10548","Jordan","JOR","Peas","fabio" +"10549","Jordan","JOR","Pulses, Other and products","fabio" +"10550","Jordan","JOR","Nuts and products","fabio" +"10551","Jordan","JOR","Soyabeans","fabio" +"10552","Jordan","JOR","Groundnuts (Shelled Eq)","fabio" +"10553","Jordan","JOR","Sunflower seed","fabio" +"10554","Jordan","JOR","Rape and Mustardseed","fabio" +"10555","Jordan","JOR","Seed cotton","fabio" +"10556","Jordan","JOR","Coconuts - Incl Copra","fabio" +"10557","Jordan","JOR","Sesame seed","fabio" +"10558","Jordan","JOR","Oil, palm fruit","fabio" +"10559","Jordan","JOR","Olives (including preserved)","fabio" +"10560","Jordan","JOR","Oilcrops, Other","fabio" +"10561","Jordan","JOR","Tomatoes and products","fabio" +"10562","Jordan","JOR","Onions","fabio" +"10563","Jordan","JOR","Vegetables, Other","fabio" +"10564","Jordan","JOR","Oranges, Mandarines","fabio" +"10565","Jordan","JOR","Lemons, Limes and products","fabio" +"10566","Jordan","JOR","Grapefruit and products","fabio" +"10567","Jordan","JOR","Citrus, Other","fabio" +"10568","Jordan","JOR","Bananas","fabio" +"10569","Jordan","JOR","Plantains","fabio" +"10570","Jordan","JOR","Apples and products","fabio" +"10571","Jordan","JOR","Pineapples and products","fabio" +"10572","Jordan","JOR","Dates","fabio" +"10573","Jordan","JOR","Grapes and products (excl wine)","fabio" +"10574","Jordan","JOR","Fruits, Other","fabio" +"10575","Jordan","JOR","Coffee and products","fabio" +"10576","Jordan","JOR","Cocoa Beans and products","fabio" +"10577","Jordan","JOR","Tea (including mate)","fabio" +"10578","Jordan","JOR","Hops","fabio" +"10579","Jordan","JOR","Pepper","fabio" +"10580","Jordan","JOR","Pimento","fabio" +"10581","Jordan","JOR","Cloves","fabio" +"10582","Jordan","JOR","Spices, Other","fabio" +"10583","Jordan","JOR","Jute","fabio" +"10584","Jordan","JOR","Jute-Like Fibres","fabio" +"10585","Jordan","JOR","Soft-Fibres, Other","fabio" +"10586","Jordan","JOR","Sisal","fabio" +"10587","Jordan","JOR","Abaca","fabio" +"10588","Jordan","JOR","Hard Fibres, Other","fabio" +"10589","Jordan","JOR","Tobacco","fabio" +"10590","Jordan","JOR","Rubber","fabio" +"10591","Jordan","JOR","Fodder crops","fabio" +"10592","Jordan","JOR","Grazing","fabio" +"10593","Jordan","JOR","Cottonseed","fabio" +"10594","Jordan","JOR","Palm kernels","fabio" +"10595","Jordan","JOR","Sugar non-centrifugal","fabio" +"10596","Jordan","JOR","Molasses","fabio" +"10597","Jordan","JOR","Sugar, Refined Equiv","fabio" +"10598","Jordan","JOR","Sweeteners, Other","fabio" +"10599","Jordan","JOR","Soyabean Oil","fabio" +"10600","Jordan","JOR","Groundnut Oil","fabio" +"10601","Jordan","JOR","Sunflowerseed Oil","fabio" +"10602","Jordan","JOR","Rape and Mustard Oil","fabio" +"10603","Jordan","JOR","Cottonseed Oil","fabio" +"10604","Jordan","JOR","Palmkernel Oil","fabio" +"10605","Jordan","JOR","Palm Oil","fabio" +"10606","Jordan","JOR","Coconut Oil","fabio" +"10607","Jordan","JOR","Sesameseed Oil","fabio" +"10608","Jordan","JOR","Olive Oil","fabio" +"10609","Jordan","JOR","Ricebran Oil","fabio" +"10610","Jordan","JOR","Maize Germ Oil","fabio" +"10611","Jordan","JOR","Oilcrops Oil, Other","fabio" +"10612","Jordan","JOR","Soyabean Cake","fabio" +"10613","Jordan","JOR","Groundnut Cake","fabio" +"10614","Jordan","JOR","Sunflowerseed Cake","fabio" +"10615","Jordan","JOR","Rape and Mustard Cake","fabio" +"10616","Jordan","JOR","Cottonseed Cake","fabio" +"10617","Jordan","JOR","Palmkernel Cake","fabio" +"10618","Jordan","JOR","Copra Cake","fabio" +"10619","Jordan","JOR","Sesameseed Cake","fabio" +"10620","Jordan","JOR","Oilseed Cakes, Other","fabio" +"10621","Jordan","JOR","Wine","fabio" +"10622","Jordan","JOR","Beer","fabio" +"10623","Jordan","JOR","Beverages, Fermented","fabio" +"10624","Jordan","JOR","Beverages, Alcoholic","fabio" +"10625","Jordan","JOR","Alcohol, Non-Food","fabio" +"10626","Jordan","JOR","Cotton lint","fabio" +"10627","Jordan","JOR","Cattle","fabio" +"10628","Jordan","JOR","Buffaloes","fabio" +"10629","Jordan","JOR","Sheep","fabio" +"10630","Jordan","JOR","Goats","fabio" +"10631","Jordan","JOR","Pigs","fabio" +"10632","Jordan","JOR","Poultry Birds","fabio" +"10633","Jordan","JOR","Horses","fabio" +"10634","Jordan","JOR","Asses","fabio" +"10635","Jordan","JOR","Mules","fabio" +"10636","Jordan","JOR","Camels","fabio" +"10637","Jordan","JOR","Camelids, other","fabio" +"10638","Jordan","JOR","Rabbits and hares","fabio" +"10639","Jordan","JOR","Rodents, other","fabio" +"10640","Jordan","JOR","Live animals, other","fabio" +"10641","Jordan","JOR","Milk - Excluding Butter","fabio" +"10642","Jordan","JOR","Butter, Ghee","fabio" +"10643","Jordan","JOR","Eggs","fabio" +"10644","Jordan","JOR","Wool (Clean Eq.)","fabio" +"10645","Jordan","JOR","Bovine Meat","fabio" +"10646","Jordan","JOR","Mutton & Goat Meat","fabio" +"10647","Jordan","JOR","Pigmeat","fabio" +"10648","Jordan","JOR","Poultry Meat","fabio" +"10649","Jordan","JOR","Meat, Other","fabio" +"10650","Jordan","JOR","Offals, Edible","fabio" +"10651","Jordan","JOR","Fats, Animals, Raw","fabio" +"10652","Jordan","JOR","Hides and skins","fabio" +"10653","Jordan","JOR","Meat Meal","fabio" +"10654","Jordan","JOR","Pet food","fabio" +"10655","Jordan","JOR","Honey","fabio" +"10656","Jordan","JOR","Silk","fabio" +"10657","Jordan","JOR","Fish, Seafood","fabio" +"10658","Jordan","JOR","Wood fuel","fabio" +"10659","Jordan","JOR","Industrial roundwood, coniferous","fabio" +"10660","Jordan","JOR","Industrial roundwood, non-coniferous","fabio" +"10661","Kyrgyzstan","KGZ","Rice (Milled Equivalent)","fabio" +"10662","Kyrgyzstan","KGZ","Wheat and products","fabio" +"10663","Kyrgyzstan","KGZ","Barley and products","fabio" +"10664","Kyrgyzstan","KGZ","Maize and products","fabio" +"10665","Kyrgyzstan","KGZ","Rye and products","fabio" +"10666","Kyrgyzstan","KGZ","Oats","fabio" +"10667","Kyrgyzstan","KGZ","Millet and products","fabio" +"10668","Kyrgyzstan","KGZ","Sorghum and products","fabio" +"10669","Kyrgyzstan","KGZ","Cereals, Other","fabio" +"10670","Kyrgyzstan","KGZ","Potatoes and products","fabio" +"10671","Kyrgyzstan","KGZ","Cassava and products","fabio" +"10672","Kyrgyzstan","KGZ","Sweet potatoes","fabio" +"10673","Kyrgyzstan","KGZ","Roots, Other","fabio" +"10674","Kyrgyzstan","KGZ","Yams","fabio" +"10675","Kyrgyzstan","KGZ","Sugar cane","fabio" +"10676","Kyrgyzstan","KGZ","Sugar beet","fabio" +"10677","Kyrgyzstan","KGZ","Beans","fabio" +"10678","Kyrgyzstan","KGZ","Peas","fabio" +"10679","Kyrgyzstan","KGZ","Pulses, Other and products","fabio" +"10680","Kyrgyzstan","KGZ","Nuts and products","fabio" +"10681","Kyrgyzstan","KGZ","Soyabeans","fabio" +"10682","Kyrgyzstan","KGZ","Groundnuts (Shelled Eq)","fabio" +"10683","Kyrgyzstan","KGZ","Sunflower seed","fabio" +"10684","Kyrgyzstan","KGZ","Rape and Mustardseed","fabio" +"10685","Kyrgyzstan","KGZ","Seed cotton","fabio" +"10686","Kyrgyzstan","KGZ","Coconuts - Incl Copra","fabio" +"10687","Kyrgyzstan","KGZ","Sesame seed","fabio" +"10688","Kyrgyzstan","KGZ","Oil, palm fruit","fabio" +"10689","Kyrgyzstan","KGZ","Olives (including preserved)","fabio" +"10690","Kyrgyzstan","KGZ","Oilcrops, Other","fabio" +"10691","Kyrgyzstan","KGZ","Tomatoes and products","fabio" +"10692","Kyrgyzstan","KGZ","Onions","fabio" +"10693","Kyrgyzstan","KGZ","Vegetables, Other","fabio" +"10694","Kyrgyzstan","KGZ","Oranges, Mandarines","fabio" +"10695","Kyrgyzstan","KGZ","Lemons, Limes and products","fabio" +"10696","Kyrgyzstan","KGZ","Grapefruit and products","fabio" +"10697","Kyrgyzstan","KGZ","Citrus, Other","fabio" +"10698","Kyrgyzstan","KGZ","Bananas","fabio" +"10699","Kyrgyzstan","KGZ","Plantains","fabio" +"10700","Kyrgyzstan","KGZ","Apples and products","fabio" +"10701","Kyrgyzstan","KGZ","Pineapples and products","fabio" +"10702","Kyrgyzstan","KGZ","Dates","fabio" +"10703","Kyrgyzstan","KGZ","Grapes and products (excl wine)","fabio" +"10704","Kyrgyzstan","KGZ","Fruits, Other","fabio" +"10705","Kyrgyzstan","KGZ","Coffee and products","fabio" +"10706","Kyrgyzstan","KGZ","Cocoa Beans and products","fabio" +"10707","Kyrgyzstan","KGZ","Tea (including mate)","fabio" +"10708","Kyrgyzstan","KGZ","Hops","fabio" +"10709","Kyrgyzstan","KGZ","Pepper","fabio" +"10710","Kyrgyzstan","KGZ","Pimento","fabio" +"10711","Kyrgyzstan","KGZ","Cloves","fabio" +"10712","Kyrgyzstan","KGZ","Spices, Other","fabio" +"10713","Kyrgyzstan","KGZ","Jute","fabio" +"10714","Kyrgyzstan","KGZ","Jute-Like Fibres","fabio" +"10715","Kyrgyzstan","KGZ","Soft-Fibres, Other","fabio" +"10716","Kyrgyzstan","KGZ","Sisal","fabio" +"10717","Kyrgyzstan","KGZ","Abaca","fabio" +"10718","Kyrgyzstan","KGZ","Hard Fibres, Other","fabio" +"10719","Kyrgyzstan","KGZ","Tobacco","fabio" +"10720","Kyrgyzstan","KGZ","Rubber","fabio" +"10721","Kyrgyzstan","KGZ","Fodder crops","fabio" +"10722","Kyrgyzstan","KGZ","Grazing","fabio" +"10723","Kyrgyzstan","KGZ","Cottonseed","fabio" +"10724","Kyrgyzstan","KGZ","Palm kernels","fabio" +"10725","Kyrgyzstan","KGZ","Sugar non-centrifugal","fabio" +"10726","Kyrgyzstan","KGZ","Molasses","fabio" +"10727","Kyrgyzstan","KGZ","Sugar, Refined Equiv","fabio" +"10728","Kyrgyzstan","KGZ","Sweeteners, Other","fabio" +"10729","Kyrgyzstan","KGZ","Soyabean Oil","fabio" +"10730","Kyrgyzstan","KGZ","Groundnut Oil","fabio" +"10731","Kyrgyzstan","KGZ","Sunflowerseed Oil","fabio" +"10732","Kyrgyzstan","KGZ","Rape and Mustard Oil","fabio" +"10733","Kyrgyzstan","KGZ","Cottonseed Oil","fabio" +"10734","Kyrgyzstan","KGZ","Palmkernel Oil","fabio" +"10735","Kyrgyzstan","KGZ","Palm Oil","fabio" +"10736","Kyrgyzstan","KGZ","Coconut Oil","fabio" +"10737","Kyrgyzstan","KGZ","Sesameseed Oil","fabio" +"10738","Kyrgyzstan","KGZ","Olive Oil","fabio" +"10739","Kyrgyzstan","KGZ","Ricebran Oil","fabio" +"10740","Kyrgyzstan","KGZ","Maize Germ Oil","fabio" +"10741","Kyrgyzstan","KGZ","Oilcrops Oil, Other","fabio" +"10742","Kyrgyzstan","KGZ","Soyabean Cake","fabio" +"10743","Kyrgyzstan","KGZ","Groundnut Cake","fabio" +"10744","Kyrgyzstan","KGZ","Sunflowerseed Cake","fabio" +"10745","Kyrgyzstan","KGZ","Rape and Mustard Cake","fabio" +"10746","Kyrgyzstan","KGZ","Cottonseed Cake","fabio" +"10747","Kyrgyzstan","KGZ","Palmkernel Cake","fabio" +"10748","Kyrgyzstan","KGZ","Copra Cake","fabio" +"10749","Kyrgyzstan","KGZ","Sesameseed Cake","fabio" +"10750","Kyrgyzstan","KGZ","Oilseed Cakes, Other","fabio" +"10751","Kyrgyzstan","KGZ","Wine","fabio" +"10752","Kyrgyzstan","KGZ","Beer","fabio" +"10753","Kyrgyzstan","KGZ","Beverages, Fermented","fabio" +"10754","Kyrgyzstan","KGZ","Beverages, Alcoholic","fabio" +"10755","Kyrgyzstan","KGZ","Alcohol, Non-Food","fabio" +"10756","Kyrgyzstan","KGZ","Cotton lint","fabio" +"10757","Kyrgyzstan","KGZ","Cattle","fabio" +"10758","Kyrgyzstan","KGZ","Buffaloes","fabio" +"10759","Kyrgyzstan","KGZ","Sheep","fabio" +"10760","Kyrgyzstan","KGZ","Goats","fabio" +"10761","Kyrgyzstan","KGZ","Pigs","fabio" +"10762","Kyrgyzstan","KGZ","Poultry Birds","fabio" +"10763","Kyrgyzstan","KGZ","Horses","fabio" +"10764","Kyrgyzstan","KGZ","Asses","fabio" +"10765","Kyrgyzstan","KGZ","Mules","fabio" +"10766","Kyrgyzstan","KGZ","Camels","fabio" +"10767","Kyrgyzstan","KGZ","Camelids, other","fabio" +"10768","Kyrgyzstan","KGZ","Rabbits and hares","fabio" +"10769","Kyrgyzstan","KGZ","Rodents, other","fabio" +"10770","Kyrgyzstan","KGZ","Live animals, other","fabio" +"10771","Kyrgyzstan","KGZ","Milk - Excluding Butter","fabio" +"10772","Kyrgyzstan","KGZ","Butter, Ghee","fabio" +"10773","Kyrgyzstan","KGZ","Eggs","fabio" +"10774","Kyrgyzstan","KGZ","Wool (Clean Eq.)","fabio" +"10775","Kyrgyzstan","KGZ","Bovine Meat","fabio" +"10776","Kyrgyzstan","KGZ","Mutton & Goat Meat","fabio" +"10777","Kyrgyzstan","KGZ","Pigmeat","fabio" +"10778","Kyrgyzstan","KGZ","Poultry Meat","fabio" +"10779","Kyrgyzstan","KGZ","Meat, Other","fabio" +"10780","Kyrgyzstan","KGZ","Offals, Edible","fabio" +"10781","Kyrgyzstan","KGZ","Fats, Animals, Raw","fabio" +"10782","Kyrgyzstan","KGZ","Hides and skins","fabio" +"10783","Kyrgyzstan","KGZ","Meat Meal","fabio" +"10784","Kyrgyzstan","KGZ","Pet food","fabio" +"10785","Kyrgyzstan","KGZ","Honey","fabio" +"10786","Kyrgyzstan","KGZ","Silk","fabio" +"10787","Kyrgyzstan","KGZ","Fish, Seafood","fabio" +"10788","Kyrgyzstan","KGZ","Wood fuel","fabio" +"10789","Kyrgyzstan","KGZ","Industrial roundwood, coniferous","fabio" +"10790","Kyrgyzstan","KGZ","Industrial roundwood, non-coniferous","fabio" +"10791","Kenya","KEN","Rice (Milled Equivalent)","fabio" +"10792","Kenya","KEN","Wheat and products","fabio" +"10793","Kenya","KEN","Barley and products","fabio" +"10794","Kenya","KEN","Maize and products","fabio" +"10795","Kenya","KEN","Rye and products","fabio" +"10796","Kenya","KEN","Oats","fabio" +"10797","Kenya","KEN","Millet and products","fabio" +"10798","Kenya","KEN","Sorghum and products","fabio" +"10799","Kenya","KEN","Cereals, Other","fabio" +"10800","Kenya","KEN","Potatoes and products","fabio" +"10801","Kenya","KEN","Cassava and products","fabio" +"10802","Kenya","KEN","Sweet potatoes","fabio" +"10803","Kenya","KEN","Roots, Other","fabio" +"10804","Kenya","KEN","Yams","fabio" +"10805","Kenya","KEN","Sugar cane","fabio" +"10806","Kenya","KEN","Sugar beet","fabio" +"10807","Kenya","KEN","Beans","fabio" +"10808","Kenya","KEN","Peas","fabio" +"10809","Kenya","KEN","Pulses, Other and products","fabio" +"10810","Kenya","KEN","Nuts and products","fabio" +"10811","Kenya","KEN","Soyabeans","fabio" +"10812","Kenya","KEN","Groundnuts (Shelled Eq)","fabio" +"10813","Kenya","KEN","Sunflower seed","fabio" +"10814","Kenya","KEN","Rape and Mustardseed","fabio" +"10815","Kenya","KEN","Seed cotton","fabio" +"10816","Kenya","KEN","Coconuts - Incl Copra","fabio" +"10817","Kenya","KEN","Sesame seed","fabio" +"10818","Kenya","KEN","Oil, palm fruit","fabio" +"10819","Kenya","KEN","Olives (including preserved)","fabio" +"10820","Kenya","KEN","Oilcrops, Other","fabio" +"10821","Kenya","KEN","Tomatoes and products","fabio" +"10822","Kenya","KEN","Onions","fabio" +"10823","Kenya","KEN","Vegetables, Other","fabio" +"10824","Kenya","KEN","Oranges, Mandarines","fabio" +"10825","Kenya","KEN","Lemons, Limes and products","fabio" +"10826","Kenya","KEN","Grapefruit and products","fabio" +"10827","Kenya","KEN","Citrus, Other","fabio" +"10828","Kenya","KEN","Bananas","fabio" +"10829","Kenya","KEN","Plantains","fabio" +"10830","Kenya","KEN","Apples and products","fabio" +"10831","Kenya","KEN","Pineapples and products","fabio" +"10832","Kenya","KEN","Dates","fabio" +"10833","Kenya","KEN","Grapes and products (excl wine)","fabio" +"10834","Kenya","KEN","Fruits, Other","fabio" +"10835","Kenya","KEN","Coffee and products","fabio" +"10836","Kenya","KEN","Cocoa Beans and products","fabio" +"10837","Kenya","KEN","Tea (including mate)","fabio" +"10838","Kenya","KEN","Hops","fabio" +"10839","Kenya","KEN","Pepper","fabio" +"10840","Kenya","KEN","Pimento","fabio" +"10841","Kenya","KEN","Cloves","fabio" +"10842","Kenya","KEN","Spices, Other","fabio" +"10843","Kenya","KEN","Jute","fabio" +"10844","Kenya","KEN","Jute-Like Fibres","fabio" +"10845","Kenya","KEN","Soft-Fibres, Other","fabio" +"10846","Kenya","KEN","Sisal","fabio" +"10847","Kenya","KEN","Abaca","fabio" +"10848","Kenya","KEN","Hard Fibres, Other","fabio" +"10849","Kenya","KEN","Tobacco","fabio" +"10850","Kenya","KEN","Rubber","fabio" +"10851","Kenya","KEN","Fodder crops","fabio" +"10852","Kenya","KEN","Grazing","fabio" +"10853","Kenya","KEN","Cottonseed","fabio" +"10854","Kenya","KEN","Palm kernels","fabio" +"10855","Kenya","KEN","Sugar non-centrifugal","fabio" +"10856","Kenya","KEN","Molasses","fabio" +"10857","Kenya","KEN","Sugar, Refined Equiv","fabio" +"10858","Kenya","KEN","Sweeteners, Other","fabio" +"10859","Kenya","KEN","Soyabean Oil","fabio" +"10860","Kenya","KEN","Groundnut Oil","fabio" +"10861","Kenya","KEN","Sunflowerseed Oil","fabio" +"10862","Kenya","KEN","Rape and Mustard Oil","fabio" +"10863","Kenya","KEN","Cottonseed Oil","fabio" +"10864","Kenya","KEN","Palmkernel Oil","fabio" +"10865","Kenya","KEN","Palm Oil","fabio" +"10866","Kenya","KEN","Coconut Oil","fabio" +"10867","Kenya","KEN","Sesameseed Oil","fabio" +"10868","Kenya","KEN","Olive Oil","fabio" +"10869","Kenya","KEN","Ricebran Oil","fabio" +"10870","Kenya","KEN","Maize Germ Oil","fabio" +"10871","Kenya","KEN","Oilcrops Oil, Other","fabio" +"10872","Kenya","KEN","Soyabean Cake","fabio" +"10873","Kenya","KEN","Groundnut Cake","fabio" +"10874","Kenya","KEN","Sunflowerseed Cake","fabio" +"10875","Kenya","KEN","Rape and Mustard Cake","fabio" +"10876","Kenya","KEN","Cottonseed Cake","fabio" +"10877","Kenya","KEN","Palmkernel Cake","fabio" +"10878","Kenya","KEN","Copra Cake","fabio" +"10879","Kenya","KEN","Sesameseed Cake","fabio" +"10880","Kenya","KEN","Oilseed Cakes, Other","fabio" +"10881","Kenya","KEN","Wine","fabio" +"10882","Kenya","KEN","Beer","fabio" +"10883","Kenya","KEN","Beverages, Fermented","fabio" +"10884","Kenya","KEN","Beverages, Alcoholic","fabio" +"10885","Kenya","KEN","Alcohol, Non-Food","fabio" +"10886","Kenya","KEN","Cotton lint","fabio" +"10887","Kenya","KEN","Cattle","fabio" +"10888","Kenya","KEN","Buffaloes","fabio" +"10889","Kenya","KEN","Sheep","fabio" +"10890","Kenya","KEN","Goats","fabio" +"10891","Kenya","KEN","Pigs","fabio" +"10892","Kenya","KEN","Poultry Birds","fabio" +"10893","Kenya","KEN","Horses","fabio" +"10894","Kenya","KEN","Asses","fabio" +"10895","Kenya","KEN","Mules","fabio" +"10896","Kenya","KEN","Camels","fabio" +"10897","Kenya","KEN","Camelids, other","fabio" +"10898","Kenya","KEN","Rabbits and hares","fabio" +"10899","Kenya","KEN","Rodents, other","fabio" +"10900","Kenya","KEN","Live animals, other","fabio" +"10901","Kenya","KEN","Milk - Excluding Butter","fabio" +"10902","Kenya","KEN","Butter, Ghee","fabio" +"10903","Kenya","KEN","Eggs","fabio" +"10904","Kenya","KEN","Wool (Clean Eq.)","fabio" +"10905","Kenya","KEN","Bovine Meat","fabio" +"10906","Kenya","KEN","Mutton & Goat Meat","fabio" +"10907","Kenya","KEN","Pigmeat","fabio" +"10908","Kenya","KEN","Poultry Meat","fabio" +"10909","Kenya","KEN","Meat, Other","fabio" +"10910","Kenya","KEN","Offals, Edible","fabio" +"10911","Kenya","KEN","Fats, Animals, Raw","fabio" +"10912","Kenya","KEN","Hides and skins","fabio" +"10913","Kenya","KEN","Meat Meal","fabio" +"10914","Kenya","KEN","Pet food","fabio" +"10915","Kenya","KEN","Honey","fabio" +"10916","Kenya","KEN","Silk","fabio" +"10917","Kenya","KEN","Fish, Seafood","fabio" +"10918","Kenya","KEN","Wood fuel","fabio" +"10919","Kenya","KEN","Industrial roundwood, coniferous","fabio" +"10920","Kenya","KEN","Industrial roundwood, non-coniferous","fabio" +"10921","Cambodia","KHM","Rice (Milled Equivalent)","fabio" +"10922","Cambodia","KHM","Wheat and products","fabio" +"10923","Cambodia","KHM","Barley and products","fabio" +"10924","Cambodia","KHM","Maize and products","fabio" +"10925","Cambodia","KHM","Rye and products","fabio" +"10926","Cambodia","KHM","Oats","fabio" +"10927","Cambodia","KHM","Millet and products","fabio" +"10928","Cambodia","KHM","Sorghum and products","fabio" +"10929","Cambodia","KHM","Cereals, Other","fabio" +"10930","Cambodia","KHM","Potatoes and products","fabio" +"10931","Cambodia","KHM","Cassava and products","fabio" +"10932","Cambodia","KHM","Sweet potatoes","fabio" +"10933","Cambodia","KHM","Roots, Other","fabio" +"10934","Cambodia","KHM","Yams","fabio" +"10935","Cambodia","KHM","Sugar cane","fabio" +"10936","Cambodia","KHM","Sugar beet","fabio" +"10937","Cambodia","KHM","Beans","fabio" +"10938","Cambodia","KHM","Peas","fabio" +"10939","Cambodia","KHM","Pulses, Other and products","fabio" +"10940","Cambodia","KHM","Nuts and products","fabio" +"10941","Cambodia","KHM","Soyabeans","fabio" +"10942","Cambodia","KHM","Groundnuts (Shelled Eq)","fabio" +"10943","Cambodia","KHM","Sunflower seed","fabio" +"10944","Cambodia","KHM","Rape and Mustardseed","fabio" +"10945","Cambodia","KHM","Seed cotton","fabio" +"10946","Cambodia","KHM","Coconuts - Incl Copra","fabio" +"10947","Cambodia","KHM","Sesame seed","fabio" +"10948","Cambodia","KHM","Oil, palm fruit","fabio" +"10949","Cambodia","KHM","Olives (including preserved)","fabio" +"10950","Cambodia","KHM","Oilcrops, Other","fabio" +"10951","Cambodia","KHM","Tomatoes and products","fabio" +"10952","Cambodia","KHM","Onions","fabio" +"10953","Cambodia","KHM","Vegetables, Other","fabio" +"10954","Cambodia","KHM","Oranges, Mandarines","fabio" +"10955","Cambodia","KHM","Lemons, Limes and products","fabio" +"10956","Cambodia","KHM","Grapefruit and products","fabio" +"10957","Cambodia","KHM","Citrus, Other","fabio" +"10958","Cambodia","KHM","Bananas","fabio" +"10959","Cambodia","KHM","Plantains","fabio" +"10960","Cambodia","KHM","Apples and products","fabio" +"10961","Cambodia","KHM","Pineapples and products","fabio" +"10962","Cambodia","KHM","Dates","fabio" +"10963","Cambodia","KHM","Grapes and products (excl wine)","fabio" +"10964","Cambodia","KHM","Fruits, Other","fabio" +"10965","Cambodia","KHM","Coffee and products","fabio" +"10966","Cambodia","KHM","Cocoa Beans and products","fabio" +"10967","Cambodia","KHM","Tea (including mate)","fabio" +"10968","Cambodia","KHM","Hops","fabio" +"10969","Cambodia","KHM","Pepper","fabio" +"10970","Cambodia","KHM","Pimento","fabio" +"10971","Cambodia","KHM","Cloves","fabio" +"10972","Cambodia","KHM","Spices, Other","fabio" +"10973","Cambodia","KHM","Jute","fabio" +"10974","Cambodia","KHM","Jute-Like Fibres","fabio" +"10975","Cambodia","KHM","Soft-Fibres, Other","fabio" +"10976","Cambodia","KHM","Sisal","fabio" +"10977","Cambodia","KHM","Abaca","fabio" +"10978","Cambodia","KHM","Hard Fibres, Other","fabio" +"10979","Cambodia","KHM","Tobacco","fabio" +"10980","Cambodia","KHM","Rubber","fabio" +"10981","Cambodia","KHM","Fodder crops","fabio" +"10982","Cambodia","KHM","Grazing","fabio" +"10983","Cambodia","KHM","Cottonseed","fabio" +"10984","Cambodia","KHM","Palm kernels","fabio" +"10985","Cambodia","KHM","Sugar non-centrifugal","fabio" +"10986","Cambodia","KHM","Molasses","fabio" +"10987","Cambodia","KHM","Sugar, Refined Equiv","fabio" +"10988","Cambodia","KHM","Sweeteners, Other","fabio" +"10989","Cambodia","KHM","Soyabean Oil","fabio" +"10990","Cambodia","KHM","Groundnut Oil","fabio" +"10991","Cambodia","KHM","Sunflowerseed Oil","fabio" +"10992","Cambodia","KHM","Rape and Mustard Oil","fabio" +"10993","Cambodia","KHM","Cottonseed Oil","fabio" +"10994","Cambodia","KHM","Palmkernel Oil","fabio" +"10995","Cambodia","KHM","Palm Oil","fabio" +"10996","Cambodia","KHM","Coconut Oil","fabio" +"10997","Cambodia","KHM","Sesameseed Oil","fabio" +"10998","Cambodia","KHM","Olive Oil","fabio" +"10999","Cambodia","KHM","Ricebran Oil","fabio" +"11000","Cambodia","KHM","Maize Germ Oil","fabio" +"11001","Cambodia","KHM","Oilcrops Oil, Other","fabio" +"11002","Cambodia","KHM","Soyabean Cake","fabio" +"11003","Cambodia","KHM","Groundnut Cake","fabio" +"11004","Cambodia","KHM","Sunflowerseed Cake","fabio" +"11005","Cambodia","KHM","Rape and Mustard Cake","fabio" +"11006","Cambodia","KHM","Cottonseed Cake","fabio" +"11007","Cambodia","KHM","Palmkernel Cake","fabio" +"11008","Cambodia","KHM","Copra Cake","fabio" +"11009","Cambodia","KHM","Sesameseed Cake","fabio" +"11010","Cambodia","KHM","Oilseed Cakes, Other","fabio" +"11011","Cambodia","KHM","Wine","fabio" +"11012","Cambodia","KHM","Beer","fabio" +"11013","Cambodia","KHM","Beverages, Fermented","fabio" +"11014","Cambodia","KHM","Beverages, Alcoholic","fabio" +"11015","Cambodia","KHM","Alcohol, Non-Food","fabio" +"11016","Cambodia","KHM","Cotton lint","fabio" +"11017","Cambodia","KHM","Cattle","fabio" +"11018","Cambodia","KHM","Buffaloes","fabio" +"11019","Cambodia","KHM","Sheep","fabio" +"11020","Cambodia","KHM","Goats","fabio" +"11021","Cambodia","KHM","Pigs","fabio" +"11022","Cambodia","KHM","Poultry Birds","fabio" +"11023","Cambodia","KHM","Horses","fabio" +"11024","Cambodia","KHM","Asses","fabio" +"11025","Cambodia","KHM","Mules","fabio" +"11026","Cambodia","KHM","Camels","fabio" +"11027","Cambodia","KHM","Camelids, other","fabio" +"11028","Cambodia","KHM","Rabbits and hares","fabio" +"11029","Cambodia","KHM","Rodents, other","fabio" +"11030","Cambodia","KHM","Live animals, other","fabio" +"11031","Cambodia","KHM","Milk - Excluding Butter","fabio" +"11032","Cambodia","KHM","Butter, Ghee","fabio" +"11033","Cambodia","KHM","Eggs","fabio" +"11034","Cambodia","KHM","Wool (Clean Eq.)","fabio" +"11035","Cambodia","KHM","Bovine Meat","fabio" +"11036","Cambodia","KHM","Mutton & Goat Meat","fabio" +"11037","Cambodia","KHM","Pigmeat","fabio" +"11038","Cambodia","KHM","Poultry Meat","fabio" +"11039","Cambodia","KHM","Meat, Other","fabio" +"11040","Cambodia","KHM","Offals, Edible","fabio" +"11041","Cambodia","KHM","Fats, Animals, Raw","fabio" +"11042","Cambodia","KHM","Hides and skins","fabio" +"11043","Cambodia","KHM","Meat Meal","fabio" +"11044","Cambodia","KHM","Pet food","fabio" +"11045","Cambodia","KHM","Honey","fabio" +"11046","Cambodia","KHM","Silk","fabio" +"11047","Cambodia","KHM","Fish, Seafood","fabio" +"11048","Cambodia","KHM","Wood fuel","fabio" +"11049","Cambodia","KHM","Industrial roundwood, coniferous","fabio" +"11050","Cambodia","KHM","Industrial roundwood, non-coniferous","fabio" +"11051","Democratic People's Republic of Korea","PRK","Rice (Milled Equivalent)","fabio" +"11052","Democratic People's Republic of Korea","PRK","Wheat and products","fabio" +"11053","Democratic People's Republic of Korea","PRK","Barley and products","fabio" +"11054","Democratic People's Republic of Korea","PRK","Maize and products","fabio" +"11055","Democratic People's Republic of Korea","PRK","Rye and products","fabio" +"11056","Democratic People's Republic of Korea","PRK","Oats","fabio" +"11057","Democratic People's Republic of Korea","PRK","Millet and products","fabio" +"11058","Democratic People's Republic of Korea","PRK","Sorghum and products","fabio" +"11059","Democratic People's Republic of Korea","PRK","Cereals, Other","fabio" +"11060","Democratic People's Republic of Korea","PRK","Potatoes and products","fabio" +"11061","Democratic People's Republic of Korea","PRK","Cassava and products","fabio" +"11062","Democratic People's Republic of Korea","PRK","Sweet potatoes","fabio" +"11063","Democratic People's Republic of Korea","PRK","Roots, Other","fabio" +"11064","Democratic People's Republic of Korea","PRK","Yams","fabio" +"11065","Democratic People's Republic of Korea","PRK","Sugar cane","fabio" +"11066","Democratic People's Republic of Korea","PRK","Sugar beet","fabio" +"11067","Democratic People's Republic of Korea","PRK","Beans","fabio" +"11068","Democratic People's Republic of Korea","PRK","Peas","fabio" +"11069","Democratic People's Republic of Korea","PRK","Pulses, Other and products","fabio" +"11070","Democratic People's Republic of Korea","PRK","Nuts and products","fabio" +"11071","Democratic People's Republic of Korea","PRK","Soyabeans","fabio" +"11072","Democratic People's Republic of Korea","PRK","Groundnuts (Shelled Eq)","fabio" +"11073","Democratic People's Republic of Korea","PRK","Sunflower seed","fabio" +"11074","Democratic People's Republic of Korea","PRK","Rape and Mustardseed","fabio" +"11075","Democratic People's Republic of Korea","PRK","Seed cotton","fabio" +"11076","Democratic People's Republic of Korea","PRK","Coconuts - Incl Copra","fabio" +"11077","Democratic People's Republic of Korea","PRK","Sesame seed","fabio" +"11078","Democratic People's Republic of Korea","PRK","Oil, palm fruit","fabio" +"11079","Democratic People's Republic of Korea","PRK","Olives (including preserved)","fabio" +"11080","Democratic People's Republic of Korea","PRK","Oilcrops, Other","fabio" +"11081","Democratic People's Republic of Korea","PRK","Tomatoes and products","fabio" +"11082","Democratic People's Republic of Korea","PRK","Onions","fabio" +"11083","Democratic People's Republic of Korea","PRK","Vegetables, Other","fabio" +"11084","Democratic People's Republic of Korea","PRK","Oranges, Mandarines","fabio" +"11085","Democratic People's Republic of Korea","PRK","Lemons, Limes and products","fabio" +"11086","Democratic People's Republic of Korea","PRK","Grapefruit and products","fabio" +"11087","Democratic People's Republic of Korea","PRK","Citrus, Other","fabio" +"11088","Democratic People's Republic of Korea","PRK","Bananas","fabio" +"11089","Democratic People's Republic of Korea","PRK","Plantains","fabio" +"11090","Democratic People's Republic of Korea","PRK","Apples and products","fabio" +"11091","Democratic People's Republic of Korea","PRK","Pineapples and products","fabio" +"11092","Democratic People's Republic of Korea","PRK","Dates","fabio" +"11093","Democratic People's Republic of Korea","PRK","Grapes and products (excl wine)","fabio" +"11094","Democratic People's Republic of Korea","PRK","Fruits, Other","fabio" +"11095","Democratic People's Republic of Korea","PRK","Coffee and products","fabio" +"11096","Democratic People's Republic of Korea","PRK","Cocoa Beans and products","fabio" +"11097","Democratic People's Republic of Korea","PRK","Tea (including mate)","fabio" +"11098","Democratic People's Republic of Korea","PRK","Hops","fabio" +"11099","Democratic People's Republic of Korea","PRK","Pepper","fabio" +"11100","Democratic People's Republic of Korea","PRK","Pimento","fabio" +"11101","Democratic People's Republic of Korea","PRK","Cloves","fabio" +"11102","Democratic People's Republic of Korea","PRK","Spices, Other","fabio" +"11103","Democratic People's Republic of Korea","PRK","Jute","fabio" +"11104","Democratic People's Republic of Korea","PRK","Jute-Like Fibres","fabio" +"11105","Democratic People's Republic of Korea","PRK","Soft-Fibres, Other","fabio" +"11106","Democratic People's Republic of Korea","PRK","Sisal","fabio" +"11107","Democratic People's Republic of Korea","PRK","Abaca","fabio" +"11108","Democratic People's Republic of Korea","PRK","Hard Fibres, Other","fabio" +"11109","Democratic People's Republic of Korea","PRK","Tobacco","fabio" +"11110","Democratic People's Republic of Korea","PRK","Rubber","fabio" +"11111","Democratic People's Republic of Korea","PRK","Fodder crops","fabio" +"11112","Democratic People's Republic of Korea","PRK","Grazing","fabio" +"11113","Democratic People's Republic of Korea","PRK","Cottonseed","fabio" +"11114","Democratic People's Republic of Korea","PRK","Palm kernels","fabio" +"11115","Democratic People's Republic of Korea","PRK","Sugar non-centrifugal","fabio" +"11116","Democratic People's Republic of Korea","PRK","Molasses","fabio" +"11117","Democratic People's Republic of Korea","PRK","Sugar, Refined Equiv","fabio" +"11118","Democratic People's Republic of Korea","PRK","Sweeteners, Other","fabio" +"11119","Democratic People's Republic of Korea","PRK","Soyabean Oil","fabio" +"11120","Democratic People's Republic of Korea","PRK","Groundnut Oil","fabio" +"11121","Democratic People's Republic of Korea","PRK","Sunflowerseed Oil","fabio" +"11122","Democratic People's Republic of Korea","PRK","Rape and Mustard Oil","fabio" +"11123","Democratic People's Republic of Korea","PRK","Cottonseed Oil","fabio" +"11124","Democratic People's Republic of Korea","PRK","Palmkernel Oil","fabio" +"11125","Democratic People's Republic of Korea","PRK","Palm Oil","fabio" +"11126","Democratic People's Republic of Korea","PRK","Coconut Oil","fabio" +"11127","Democratic People's Republic of Korea","PRK","Sesameseed Oil","fabio" +"11128","Democratic People's Republic of Korea","PRK","Olive Oil","fabio" +"11129","Democratic People's Republic of Korea","PRK","Ricebran Oil","fabio" +"11130","Democratic People's Republic of Korea","PRK","Maize Germ Oil","fabio" +"11131","Democratic People's Republic of Korea","PRK","Oilcrops Oil, Other","fabio" +"11132","Democratic People's Republic of Korea","PRK","Soyabean Cake","fabio" +"11133","Democratic People's Republic of Korea","PRK","Groundnut Cake","fabio" +"11134","Democratic People's Republic of Korea","PRK","Sunflowerseed Cake","fabio" +"11135","Democratic People's Republic of Korea","PRK","Rape and Mustard Cake","fabio" +"11136","Democratic People's Republic of Korea","PRK","Cottonseed Cake","fabio" +"11137","Democratic People's Republic of Korea","PRK","Palmkernel Cake","fabio" +"11138","Democratic People's Republic of Korea","PRK","Copra Cake","fabio" +"11139","Democratic People's Republic of Korea","PRK","Sesameseed Cake","fabio" +"11140","Democratic People's Republic of Korea","PRK","Oilseed Cakes, Other","fabio" +"11141","Democratic People's Republic of Korea","PRK","Wine","fabio" +"11142","Democratic People's Republic of Korea","PRK","Beer","fabio" +"11143","Democratic People's Republic of Korea","PRK","Beverages, Fermented","fabio" +"11144","Democratic People's Republic of Korea","PRK","Beverages, Alcoholic","fabio" +"11145","Democratic People's Republic of Korea","PRK","Alcohol, Non-Food","fabio" +"11146","Democratic People's Republic of Korea","PRK","Cotton lint","fabio" +"11147","Democratic People's Republic of Korea","PRK","Cattle","fabio" +"11148","Democratic People's Republic of Korea","PRK","Buffaloes","fabio" +"11149","Democratic People's Republic of Korea","PRK","Sheep","fabio" +"11150","Democratic People's Republic of Korea","PRK","Goats","fabio" +"11151","Democratic People's Republic of Korea","PRK","Pigs","fabio" +"11152","Democratic People's Republic of Korea","PRK","Poultry Birds","fabio" +"11153","Democratic People's Republic of Korea","PRK","Horses","fabio" +"11154","Democratic People's Republic of Korea","PRK","Asses","fabio" +"11155","Democratic People's Republic of Korea","PRK","Mules","fabio" +"11156","Democratic People's Republic of Korea","PRK","Camels","fabio" +"11157","Democratic People's Republic of Korea","PRK","Camelids, other","fabio" +"11158","Democratic People's Republic of Korea","PRK","Rabbits and hares","fabio" +"11159","Democratic People's Republic of Korea","PRK","Rodents, other","fabio" +"11160","Democratic People's Republic of Korea","PRK","Live animals, other","fabio" +"11161","Democratic People's Republic of Korea","PRK","Milk - Excluding Butter","fabio" +"11162","Democratic People's Republic of Korea","PRK","Butter, Ghee","fabio" +"11163","Democratic People's Republic of Korea","PRK","Eggs","fabio" +"11164","Democratic People's Republic of Korea","PRK","Wool (Clean Eq.)","fabio" +"11165","Democratic People's Republic of Korea","PRK","Bovine Meat","fabio" +"11166","Democratic People's Republic of Korea","PRK","Mutton & Goat Meat","fabio" +"11167","Democratic People's Republic of Korea","PRK","Pigmeat","fabio" +"11168","Democratic People's Republic of Korea","PRK","Poultry Meat","fabio" +"11169","Democratic People's Republic of Korea","PRK","Meat, Other","fabio" +"11170","Democratic People's Republic of Korea","PRK","Offals, Edible","fabio" +"11171","Democratic People's Republic of Korea","PRK","Fats, Animals, Raw","fabio" +"11172","Democratic People's Republic of Korea","PRK","Hides and skins","fabio" +"11173","Democratic People's Republic of Korea","PRK","Meat Meal","fabio" +"11174","Democratic People's Republic of Korea","PRK","Pet food","fabio" +"11175","Democratic People's Republic of Korea","PRK","Honey","fabio" +"11176","Democratic People's Republic of Korea","PRK","Silk","fabio" +"11177","Democratic People's Republic of Korea","PRK","Fish, Seafood","fabio" +"11178","Democratic People's Republic of Korea","PRK","Wood fuel","fabio" +"11179","Democratic People's Republic of Korea","PRK","Industrial roundwood, coniferous","fabio" +"11180","Democratic People's Republic of Korea","PRK","Industrial roundwood, non-coniferous","fabio" +"11181","Republic of Korea","KOR","Rice (Milled Equivalent)","fabio" +"11182","Republic of Korea","KOR","Wheat and products","fabio" +"11183","Republic of Korea","KOR","Barley and products","fabio" +"11184","Republic of Korea","KOR","Maize and products","fabio" +"11185","Republic of Korea","KOR","Rye and products","fabio" +"11186","Republic of Korea","KOR","Oats","fabio" +"11187","Republic of Korea","KOR","Millet and products","fabio" +"11188","Republic of Korea","KOR","Sorghum and products","fabio" +"11189","Republic of Korea","KOR","Cereals, Other","fabio" +"11190","Republic of Korea","KOR","Potatoes and products","fabio" +"11191","Republic of Korea","KOR","Cassava and products","fabio" +"11192","Republic of Korea","KOR","Sweet potatoes","fabio" +"11193","Republic of Korea","KOR","Roots, Other","fabio" +"11194","Republic of Korea","KOR","Yams","fabio" +"11195","Republic of Korea","KOR","Sugar cane","fabio" +"11196","Republic of Korea","KOR","Sugar beet","fabio" +"11197","Republic of Korea","KOR","Beans","fabio" +"11198","Republic of Korea","KOR","Peas","fabio" +"11199","Republic of Korea","KOR","Pulses, Other and products","fabio" +"11200","Republic of Korea","KOR","Nuts and products","fabio" +"11201","Republic of Korea","KOR","Soyabeans","fabio" +"11202","Republic of Korea","KOR","Groundnuts (Shelled Eq)","fabio" +"11203","Republic of Korea","KOR","Sunflower seed","fabio" +"11204","Republic of Korea","KOR","Rape and Mustardseed","fabio" +"11205","Republic of Korea","KOR","Seed cotton","fabio" +"11206","Republic of Korea","KOR","Coconuts - Incl Copra","fabio" +"11207","Republic of Korea","KOR","Sesame seed","fabio" +"11208","Republic of Korea","KOR","Oil, palm fruit","fabio" +"11209","Republic of Korea","KOR","Olives (including preserved)","fabio" +"11210","Republic of Korea","KOR","Oilcrops, Other","fabio" +"11211","Republic of Korea","KOR","Tomatoes and products","fabio" +"11212","Republic of Korea","KOR","Onions","fabio" +"11213","Republic of Korea","KOR","Vegetables, Other","fabio" +"11214","Republic of Korea","KOR","Oranges, Mandarines","fabio" +"11215","Republic of Korea","KOR","Lemons, Limes and products","fabio" +"11216","Republic of Korea","KOR","Grapefruit and products","fabio" +"11217","Republic of Korea","KOR","Citrus, Other","fabio" +"11218","Republic of Korea","KOR","Bananas","fabio" +"11219","Republic of Korea","KOR","Plantains","fabio" +"11220","Republic of Korea","KOR","Apples and products","fabio" +"11221","Republic of Korea","KOR","Pineapples and products","fabio" +"11222","Republic of Korea","KOR","Dates","fabio" +"11223","Republic of Korea","KOR","Grapes and products (excl wine)","fabio" +"11224","Republic of Korea","KOR","Fruits, Other","fabio" +"11225","Republic of Korea","KOR","Coffee and products","fabio" +"11226","Republic of Korea","KOR","Cocoa Beans and products","fabio" +"11227","Republic of Korea","KOR","Tea (including mate)","fabio" +"11228","Republic of Korea","KOR","Hops","fabio" +"11229","Republic of Korea","KOR","Pepper","fabio" +"11230","Republic of Korea","KOR","Pimento","fabio" +"11231","Republic of Korea","KOR","Cloves","fabio" +"11232","Republic of Korea","KOR","Spices, Other","fabio" +"11233","Republic of Korea","KOR","Jute","fabio" +"11234","Republic of Korea","KOR","Jute-Like Fibres","fabio" +"11235","Republic of Korea","KOR","Soft-Fibres, Other","fabio" +"11236","Republic of Korea","KOR","Sisal","fabio" +"11237","Republic of Korea","KOR","Abaca","fabio" +"11238","Republic of Korea","KOR","Hard Fibres, Other","fabio" +"11239","Republic of Korea","KOR","Tobacco","fabio" +"11240","Republic of Korea","KOR","Rubber","fabio" +"11241","Republic of Korea","KOR","Fodder crops","fabio" +"11242","Republic of Korea","KOR","Grazing","fabio" +"11243","Republic of Korea","KOR","Cottonseed","fabio" +"11244","Republic of Korea","KOR","Palm kernels","fabio" +"11245","Republic of Korea","KOR","Sugar non-centrifugal","fabio" +"11246","Republic of Korea","KOR","Molasses","fabio" +"11247","Republic of Korea","KOR","Sugar, Refined Equiv","fabio" +"11248","Republic of Korea","KOR","Sweeteners, Other","fabio" +"11249","Republic of Korea","KOR","Soyabean Oil","fabio" +"11250","Republic of Korea","KOR","Groundnut Oil","fabio" +"11251","Republic of Korea","KOR","Sunflowerseed Oil","fabio" +"11252","Republic of Korea","KOR","Rape and Mustard Oil","fabio" +"11253","Republic of Korea","KOR","Cottonseed Oil","fabio" +"11254","Republic of Korea","KOR","Palmkernel Oil","fabio" +"11255","Republic of Korea","KOR","Palm Oil","fabio" +"11256","Republic of Korea","KOR","Coconut Oil","fabio" +"11257","Republic of Korea","KOR","Sesameseed Oil","fabio" +"11258","Republic of Korea","KOR","Olive Oil","fabio" +"11259","Republic of Korea","KOR","Ricebran Oil","fabio" +"11260","Republic of Korea","KOR","Maize Germ Oil","fabio" +"11261","Republic of Korea","KOR","Oilcrops Oil, Other","fabio" +"11262","Republic of Korea","KOR","Soyabean Cake","fabio" +"11263","Republic of Korea","KOR","Groundnut Cake","fabio" +"11264","Republic of Korea","KOR","Sunflowerseed Cake","fabio" +"11265","Republic of Korea","KOR","Rape and Mustard Cake","fabio" +"11266","Republic of Korea","KOR","Cottonseed Cake","fabio" +"11267","Republic of Korea","KOR","Palmkernel Cake","fabio" +"11268","Republic of Korea","KOR","Copra Cake","fabio" +"11269","Republic of Korea","KOR","Sesameseed Cake","fabio" +"11270","Republic of Korea","KOR","Oilseed Cakes, Other","fabio" +"11271","Republic of Korea","KOR","Wine","fabio" +"11272","Republic of Korea","KOR","Beer","fabio" +"11273","Republic of Korea","KOR","Beverages, Fermented","fabio" +"11274","Republic of Korea","KOR","Beverages, Alcoholic","fabio" +"11275","Republic of Korea","KOR","Alcohol, Non-Food","fabio" +"11276","Republic of Korea","KOR","Cotton lint","fabio" +"11277","Republic of Korea","KOR","Cattle","fabio" +"11278","Republic of Korea","KOR","Buffaloes","fabio" +"11279","Republic of Korea","KOR","Sheep","fabio" +"11280","Republic of Korea","KOR","Goats","fabio" +"11281","Republic of Korea","KOR","Pigs","fabio" +"11282","Republic of Korea","KOR","Poultry Birds","fabio" +"11283","Republic of Korea","KOR","Horses","fabio" +"11284","Republic of Korea","KOR","Asses","fabio" +"11285","Republic of Korea","KOR","Mules","fabio" +"11286","Republic of Korea","KOR","Camels","fabio" +"11287","Republic of Korea","KOR","Camelids, other","fabio" +"11288","Republic of Korea","KOR","Rabbits and hares","fabio" +"11289","Republic of Korea","KOR","Rodents, other","fabio" +"11290","Republic of Korea","KOR","Live animals, other","fabio" +"11291","Republic of Korea","KOR","Milk - Excluding Butter","fabio" +"11292","Republic of Korea","KOR","Butter, Ghee","fabio" +"11293","Republic of Korea","KOR","Eggs","fabio" +"11294","Republic of Korea","KOR","Wool (Clean Eq.)","fabio" +"11295","Republic of Korea","KOR","Bovine Meat","fabio" +"11296","Republic of Korea","KOR","Mutton & Goat Meat","fabio" +"11297","Republic of Korea","KOR","Pigmeat","fabio" +"11298","Republic of Korea","KOR","Poultry Meat","fabio" +"11299","Republic of Korea","KOR","Meat, Other","fabio" +"11300","Republic of Korea","KOR","Offals, Edible","fabio" +"11301","Republic of Korea","KOR","Fats, Animals, Raw","fabio" +"11302","Republic of Korea","KOR","Hides and skins","fabio" +"11303","Republic of Korea","KOR","Meat Meal","fabio" +"11304","Republic of Korea","KOR","Pet food","fabio" +"11305","Republic of Korea","KOR","Honey","fabio" +"11306","Republic of Korea","KOR","Silk","fabio" +"11307","Republic of Korea","KOR","Fish, Seafood","fabio" +"11308","Republic of Korea","KOR","Wood fuel","fabio" +"11309","Republic of Korea","KOR","Industrial roundwood, coniferous","fabio" +"11310","Republic of Korea","KOR","Industrial roundwood, non-coniferous","fabio" +"11311","Kuwait","KWT","Rice (Milled Equivalent)","fabio" +"11312","Kuwait","KWT","Wheat and products","fabio" +"11313","Kuwait","KWT","Barley and products","fabio" +"11314","Kuwait","KWT","Maize and products","fabio" +"11315","Kuwait","KWT","Rye and products","fabio" +"11316","Kuwait","KWT","Oats","fabio" +"11317","Kuwait","KWT","Millet and products","fabio" +"11318","Kuwait","KWT","Sorghum and products","fabio" +"11319","Kuwait","KWT","Cereals, Other","fabio" +"11320","Kuwait","KWT","Potatoes and products","fabio" +"11321","Kuwait","KWT","Cassava and products","fabio" +"11322","Kuwait","KWT","Sweet potatoes","fabio" +"11323","Kuwait","KWT","Roots, Other","fabio" +"11324","Kuwait","KWT","Yams","fabio" +"11325","Kuwait","KWT","Sugar cane","fabio" +"11326","Kuwait","KWT","Sugar beet","fabio" +"11327","Kuwait","KWT","Beans","fabio" +"11328","Kuwait","KWT","Peas","fabio" +"11329","Kuwait","KWT","Pulses, Other and products","fabio" +"11330","Kuwait","KWT","Nuts and products","fabio" +"11331","Kuwait","KWT","Soyabeans","fabio" +"11332","Kuwait","KWT","Groundnuts (Shelled Eq)","fabio" +"11333","Kuwait","KWT","Sunflower seed","fabio" +"11334","Kuwait","KWT","Rape and Mustardseed","fabio" +"11335","Kuwait","KWT","Seed cotton","fabio" +"11336","Kuwait","KWT","Coconuts - Incl Copra","fabio" +"11337","Kuwait","KWT","Sesame seed","fabio" +"11338","Kuwait","KWT","Oil, palm fruit","fabio" +"11339","Kuwait","KWT","Olives (including preserved)","fabio" +"11340","Kuwait","KWT","Oilcrops, Other","fabio" +"11341","Kuwait","KWT","Tomatoes and products","fabio" +"11342","Kuwait","KWT","Onions","fabio" +"11343","Kuwait","KWT","Vegetables, Other","fabio" +"11344","Kuwait","KWT","Oranges, Mandarines","fabio" +"11345","Kuwait","KWT","Lemons, Limes and products","fabio" +"11346","Kuwait","KWT","Grapefruit and products","fabio" +"11347","Kuwait","KWT","Citrus, Other","fabio" +"11348","Kuwait","KWT","Bananas","fabio" +"11349","Kuwait","KWT","Plantains","fabio" +"11350","Kuwait","KWT","Apples and products","fabio" +"11351","Kuwait","KWT","Pineapples and products","fabio" +"11352","Kuwait","KWT","Dates","fabio" +"11353","Kuwait","KWT","Grapes and products (excl wine)","fabio" +"11354","Kuwait","KWT","Fruits, Other","fabio" +"11355","Kuwait","KWT","Coffee and products","fabio" +"11356","Kuwait","KWT","Cocoa Beans and products","fabio" +"11357","Kuwait","KWT","Tea (including mate)","fabio" +"11358","Kuwait","KWT","Hops","fabio" +"11359","Kuwait","KWT","Pepper","fabio" +"11360","Kuwait","KWT","Pimento","fabio" +"11361","Kuwait","KWT","Cloves","fabio" +"11362","Kuwait","KWT","Spices, Other","fabio" +"11363","Kuwait","KWT","Jute","fabio" +"11364","Kuwait","KWT","Jute-Like Fibres","fabio" +"11365","Kuwait","KWT","Soft-Fibres, Other","fabio" +"11366","Kuwait","KWT","Sisal","fabio" +"11367","Kuwait","KWT","Abaca","fabio" +"11368","Kuwait","KWT","Hard Fibres, Other","fabio" +"11369","Kuwait","KWT","Tobacco","fabio" +"11370","Kuwait","KWT","Rubber","fabio" +"11371","Kuwait","KWT","Fodder crops","fabio" +"11372","Kuwait","KWT","Grazing","fabio" +"11373","Kuwait","KWT","Cottonseed","fabio" +"11374","Kuwait","KWT","Palm kernels","fabio" +"11375","Kuwait","KWT","Sugar non-centrifugal","fabio" +"11376","Kuwait","KWT","Molasses","fabio" +"11377","Kuwait","KWT","Sugar, Refined Equiv","fabio" +"11378","Kuwait","KWT","Sweeteners, Other","fabio" +"11379","Kuwait","KWT","Soyabean Oil","fabio" +"11380","Kuwait","KWT","Groundnut Oil","fabio" +"11381","Kuwait","KWT","Sunflowerseed Oil","fabio" +"11382","Kuwait","KWT","Rape and Mustard Oil","fabio" +"11383","Kuwait","KWT","Cottonseed Oil","fabio" +"11384","Kuwait","KWT","Palmkernel Oil","fabio" +"11385","Kuwait","KWT","Palm Oil","fabio" +"11386","Kuwait","KWT","Coconut Oil","fabio" +"11387","Kuwait","KWT","Sesameseed Oil","fabio" +"11388","Kuwait","KWT","Olive Oil","fabio" +"11389","Kuwait","KWT","Ricebran Oil","fabio" +"11390","Kuwait","KWT","Maize Germ Oil","fabio" +"11391","Kuwait","KWT","Oilcrops Oil, Other","fabio" +"11392","Kuwait","KWT","Soyabean Cake","fabio" +"11393","Kuwait","KWT","Groundnut Cake","fabio" +"11394","Kuwait","KWT","Sunflowerseed Cake","fabio" +"11395","Kuwait","KWT","Rape and Mustard Cake","fabio" +"11396","Kuwait","KWT","Cottonseed Cake","fabio" +"11397","Kuwait","KWT","Palmkernel Cake","fabio" +"11398","Kuwait","KWT","Copra Cake","fabio" +"11399","Kuwait","KWT","Sesameseed Cake","fabio" +"11400","Kuwait","KWT","Oilseed Cakes, Other","fabio" +"11401","Kuwait","KWT","Wine","fabio" +"11402","Kuwait","KWT","Beer","fabio" +"11403","Kuwait","KWT","Beverages, Fermented","fabio" +"11404","Kuwait","KWT","Beverages, Alcoholic","fabio" +"11405","Kuwait","KWT","Alcohol, Non-Food","fabio" +"11406","Kuwait","KWT","Cotton lint","fabio" +"11407","Kuwait","KWT","Cattle","fabio" +"11408","Kuwait","KWT","Buffaloes","fabio" +"11409","Kuwait","KWT","Sheep","fabio" +"11410","Kuwait","KWT","Goats","fabio" +"11411","Kuwait","KWT","Pigs","fabio" +"11412","Kuwait","KWT","Poultry Birds","fabio" +"11413","Kuwait","KWT","Horses","fabio" +"11414","Kuwait","KWT","Asses","fabio" +"11415","Kuwait","KWT","Mules","fabio" +"11416","Kuwait","KWT","Camels","fabio" +"11417","Kuwait","KWT","Camelids, other","fabio" +"11418","Kuwait","KWT","Rabbits and hares","fabio" +"11419","Kuwait","KWT","Rodents, other","fabio" +"11420","Kuwait","KWT","Live animals, other","fabio" +"11421","Kuwait","KWT","Milk - Excluding Butter","fabio" +"11422","Kuwait","KWT","Butter, Ghee","fabio" +"11423","Kuwait","KWT","Eggs","fabio" +"11424","Kuwait","KWT","Wool (Clean Eq.)","fabio" +"11425","Kuwait","KWT","Bovine Meat","fabio" +"11426","Kuwait","KWT","Mutton & Goat Meat","fabio" +"11427","Kuwait","KWT","Pigmeat","fabio" +"11428","Kuwait","KWT","Poultry Meat","fabio" +"11429","Kuwait","KWT","Meat, Other","fabio" +"11430","Kuwait","KWT","Offals, Edible","fabio" +"11431","Kuwait","KWT","Fats, Animals, Raw","fabio" +"11432","Kuwait","KWT","Hides and skins","fabio" +"11433","Kuwait","KWT","Meat Meal","fabio" +"11434","Kuwait","KWT","Pet food","fabio" +"11435","Kuwait","KWT","Honey","fabio" +"11436","Kuwait","KWT","Silk","fabio" +"11437","Kuwait","KWT","Fish, Seafood","fabio" +"11438","Kuwait","KWT","Wood fuel","fabio" +"11439","Kuwait","KWT","Industrial roundwood, coniferous","fabio" +"11440","Kuwait","KWT","Industrial roundwood, non-coniferous","fabio" +"11441","Latvia","LVA","Rice (Milled Equivalent)","fabio" +"11442","Latvia","LVA","Wheat and products","fabio" +"11443","Latvia","LVA","Barley and products","fabio" +"11444","Latvia","LVA","Maize and products","fabio" +"11445","Latvia","LVA","Rye and products","fabio" +"11446","Latvia","LVA","Oats","fabio" +"11447","Latvia","LVA","Millet and products","fabio" +"11448","Latvia","LVA","Sorghum and products","fabio" +"11449","Latvia","LVA","Cereals, Other","fabio" +"11450","Latvia","LVA","Potatoes and products","fabio" +"11451","Latvia","LVA","Cassava and products","fabio" +"11452","Latvia","LVA","Sweet potatoes","fabio" +"11453","Latvia","LVA","Roots, Other","fabio" +"11454","Latvia","LVA","Yams","fabio" +"11455","Latvia","LVA","Sugar cane","fabio" +"11456","Latvia","LVA","Sugar beet","fabio" +"11457","Latvia","LVA","Beans","fabio" +"11458","Latvia","LVA","Peas","fabio" +"11459","Latvia","LVA","Pulses, Other and products","fabio" +"11460","Latvia","LVA","Nuts and products","fabio" +"11461","Latvia","LVA","Soyabeans","fabio" +"11462","Latvia","LVA","Groundnuts (Shelled Eq)","fabio" +"11463","Latvia","LVA","Sunflower seed","fabio" +"11464","Latvia","LVA","Rape and Mustardseed","fabio" +"11465","Latvia","LVA","Seed cotton","fabio" +"11466","Latvia","LVA","Coconuts - Incl Copra","fabio" +"11467","Latvia","LVA","Sesame seed","fabio" +"11468","Latvia","LVA","Oil, palm fruit","fabio" +"11469","Latvia","LVA","Olives (including preserved)","fabio" +"11470","Latvia","LVA","Oilcrops, Other","fabio" +"11471","Latvia","LVA","Tomatoes and products","fabio" +"11472","Latvia","LVA","Onions","fabio" +"11473","Latvia","LVA","Vegetables, Other","fabio" +"11474","Latvia","LVA","Oranges, Mandarines","fabio" +"11475","Latvia","LVA","Lemons, Limes and products","fabio" +"11476","Latvia","LVA","Grapefruit and products","fabio" +"11477","Latvia","LVA","Citrus, Other","fabio" +"11478","Latvia","LVA","Bananas","fabio" +"11479","Latvia","LVA","Plantains","fabio" +"11480","Latvia","LVA","Apples and products","fabio" +"11481","Latvia","LVA","Pineapples and products","fabio" +"11482","Latvia","LVA","Dates","fabio" +"11483","Latvia","LVA","Grapes and products (excl wine)","fabio" +"11484","Latvia","LVA","Fruits, Other","fabio" +"11485","Latvia","LVA","Coffee and products","fabio" +"11486","Latvia","LVA","Cocoa Beans and products","fabio" +"11487","Latvia","LVA","Tea (including mate)","fabio" +"11488","Latvia","LVA","Hops","fabio" +"11489","Latvia","LVA","Pepper","fabio" +"11490","Latvia","LVA","Pimento","fabio" +"11491","Latvia","LVA","Cloves","fabio" +"11492","Latvia","LVA","Spices, Other","fabio" +"11493","Latvia","LVA","Jute","fabio" +"11494","Latvia","LVA","Jute-Like Fibres","fabio" +"11495","Latvia","LVA","Soft-Fibres, Other","fabio" +"11496","Latvia","LVA","Sisal","fabio" +"11497","Latvia","LVA","Abaca","fabio" +"11498","Latvia","LVA","Hard Fibres, Other","fabio" +"11499","Latvia","LVA","Tobacco","fabio" +"11500","Latvia","LVA","Rubber","fabio" +"11501","Latvia","LVA","Fodder crops","fabio" +"11502","Latvia","LVA","Grazing","fabio" +"11503","Latvia","LVA","Cottonseed","fabio" +"11504","Latvia","LVA","Palm kernels","fabio" +"11505","Latvia","LVA","Sugar non-centrifugal","fabio" +"11506","Latvia","LVA","Molasses","fabio" +"11507","Latvia","LVA","Sugar, Refined Equiv","fabio" +"11508","Latvia","LVA","Sweeteners, Other","fabio" +"11509","Latvia","LVA","Soyabean Oil","fabio" +"11510","Latvia","LVA","Groundnut Oil","fabio" +"11511","Latvia","LVA","Sunflowerseed Oil","fabio" +"11512","Latvia","LVA","Rape and Mustard Oil","fabio" +"11513","Latvia","LVA","Cottonseed Oil","fabio" +"11514","Latvia","LVA","Palmkernel Oil","fabio" +"11515","Latvia","LVA","Palm Oil","fabio" +"11516","Latvia","LVA","Coconut Oil","fabio" +"11517","Latvia","LVA","Sesameseed Oil","fabio" +"11518","Latvia","LVA","Olive Oil","fabio" +"11519","Latvia","LVA","Ricebran Oil","fabio" +"11520","Latvia","LVA","Maize Germ Oil","fabio" +"11521","Latvia","LVA","Oilcrops Oil, Other","fabio" +"11522","Latvia","LVA","Soyabean Cake","fabio" +"11523","Latvia","LVA","Groundnut Cake","fabio" +"11524","Latvia","LVA","Sunflowerseed Cake","fabio" +"11525","Latvia","LVA","Rape and Mustard Cake","fabio" +"11526","Latvia","LVA","Cottonseed Cake","fabio" +"11527","Latvia","LVA","Palmkernel Cake","fabio" +"11528","Latvia","LVA","Copra Cake","fabio" +"11529","Latvia","LVA","Sesameseed Cake","fabio" +"11530","Latvia","LVA","Oilseed Cakes, Other","fabio" +"11531","Latvia","LVA","Wine","fabio" +"11532","Latvia","LVA","Beer","fabio" +"11533","Latvia","LVA","Beverages, Fermented","fabio" +"11534","Latvia","LVA","Beverages, Alcoholic","fabio" +"11535","Latvia","LVA","Alcohol, Non-Food","fabio" +"11536","Latvia","LVA","Cotton lint","fabio" +"11537","Latvia","LVA","Cattle","fabio" +"11538","Latvia","LVA","Buffaloes","fabio" +"11539","Latvia","LVA","Sheep","fabio" +"11540","Latvia","LVA","Goats","fabio" +"11541","Latvia","LVA","Pigs","fabio" +"11542","Latvia","LVA","Poultry Birds","fabio" +"11543","Latvia","LVA","Horses","fabio" +"11544","Latvia","LVA","Asses","fabio" +"11545","Latvia","LVA","Mules","fabio" +"11546","Latvia","LVA","Camels","fabio" +"11547","Latvia","LVA","Camelids, other","fabio" +"11548","Latvia","LVA","Rabbits and hares","fabio" +"11549","Latvia","LVA","Rodents, other","fabio" +"11550","Latvia","LVA","Live animals, other","fabio" +"11551","Latvia","LVA","Milk - Excluding Butter","fabio" +"11552","Latvia","LVA","Butter, Ghee","fabio" +"11553","Latvia","LVA","Eggs","fabio" +"11554","Latvia","LVA","Wool (Clean Eq.)","fabio" +"11555","Latvia","LVA","Bovine Meat","fabio" +"11556","Latvia","LVA","Mutton & Goat Meat","fabio" +"11557","Latvia","LVA","Pigmeat","fabio" +"11558","Latvia","LVA","Poultry Meat","fabio" +"11559","Latvia","LVA","Meat, Other","fabio" +"11560","Latvia","LVA","Offals, Edible","fabio" +"11561","Latvia","LVA","Fats, Animals, Raw","fabio" +"11562","Latvia","LVA","Hides and skins","fabio" +"11563","Latvia","LVA","Meat Meal","fabio" +"11564","Latvia","LVA","Pet food","fabio" +"11565","Latvia","LVA","Honey","fabio" +"11566","Latvia","LVA","Silk","fabio" +"11567","Latvia","LVA","Fish, Seafood","fabio" +"11568","Latvia","LVA","Wood fuel","fabio" +"11569","Latvia","LVA","Industrial roundwood, coniferous","fabio" +"11570","Latvia","LVA","Industrial roundwood, non-coniferous","fabio" +"11571","Lao People's Democratic Republic","LAO","Rice (Milled Equivalent)","fabio" +"11572","Lao People's Democratic Republic","LAO","Wheat and products","fabio" +"11573","Lao People's Democratic Republic","LAO","Barley and products","fabio" +"11574","Lao People's Democratic Republic","LAO","Maize and products","fabio" +"11575","Lao People's Democratic Republic","LAO","Rye and products","fabio" +"11576","Lao People's Democratic Republic","LAO","Oats","fabio" +"11577","Lao People's Democratic Republic","LAO","Millet and products","fabio" +"11578","Lao People's Democratic Republic","LAO","Sorghum and products","fabio" +"11579","Lao People's Democratic Republic","LAO","Cereals, Other","fabio" +"11580","Lao People's Democratic Republic","LAO","Potatoes and products","fabio" +"11581","Lao People's Democratic Republic","LAO","Cassava and products","fabio" +"11582","Lao People's Democratic Republic","LAO","Sweet potatoes","fabio" +"11583","Lao People's Democratic Republic","LAO","Roots, Other","fabio" +"11584","Lao People's Democratic Republic","LAO","Yams","fabio" +"11585","Lao People's Democratic Republic","LAO","Sugar cane","fabio" +"11586","Lao People's Democratic Republic","LAO","Sugar beet","fabio" +"11587","Lao People's Democratic Republic","LAO","Beans","fabio" +"11588","Lao People's Democratic Republic","LAO","Peas","fabio" +"11589","Lao People's Democratic Republic","LAO","Pulses, Other and products","fabio" +"11590","Lao People's Democratic Republic","LAO","Nuts and products","fabio" +"11591","Lao People's Democratic Republic","LAO","Soyabeans","fabio" +"11592","Lao People's Democratic Republic","LAO","Groundnuts (Shelled Eq)","fabio" +"11593","Lao People's Democratic Republic","LAO","Sunflower seed","fabio" +"11594","Lao People's Democratic Republic","LAO","Rape and Mustardseed","fabio" +"11595","Lao People's Democratic Republic","LAO","Seed cotton","fabio" +"11596","Lao People's Democratic Republic","LAO","Coconuts - Incl Copra","fabio" +"11597","Lao People's Democratic Republic","LAO","Sesame seed","fabio" +"11598","Lao People's Democratic Republic","LAO","Oil, palm fruit","fabio" +"11599","Lao People's Democratic Republic","LAO","Olives (including preserved)","fabio" +"11600","Lao People's Democratic Republic","LAO","Oilcrops, Other","fabio" +"11601","Lao People's Democratic Republic","LAO","Tomatoes and products","fabio" +"11602","Lao People's Democratic Republic","LAO","Onions","fabio" +"11603","Lao People's Democratic Republic","LAO","Vegetables, Other","fabio" +"11604","Lao People's Democratic Republic","LAO","Oranges, Mandarines","fabio" +"11605","Lao People's Democratic Republic","LAO","Lemons, Limes and products","fabio" +"11606","Lao People's Democratic Republic","LAO","Grapefruit and products","fabio" +"11607","Lao People's Democratic Republic","LAO","Citrus, Other","fabio" +"11608","Lao People's Democratic Republic","LAO","Bananas","fabio" +"11609","Lao People's Democratic Republic","LAO","Plantains","fabio" +"11610","Lao People's Democratic Republic","LAO","Apples and products","fabio" +"11611","Lao People's Democratic Republic","LAO","Pineapples and products","fabio" +"11612","Lao People's Democratic Republic","LAO","Dates","fabio" +"11613","Lao People's Democratic Republic","LAO","Grapes and products (excl wine)","fabio" +"11614","Lao People's Democratic Republic","LAO","Fruits, Other","fabio" +"11615","Lao People's Democratic Republic","LAO","Coffee and products","fabio" +"11616","Lao People's Democratic Republic","LAO","Cocoa Beans and products","fabio" +"11617","Lao People's Democratic Republic","LAO","Tea (including mate)","fabio" +"11618","Lao People's Democratic Republic","LAO","Hops","fabio" +"11619","Lao People's Democratic Republic","LAO","Pepper","fabio" +"11620","Lao People's Democratic Republic","LAO","Pimento","fabio" +"11621","Lao People's Democratic Republic","LAO","Cloves","fabio" +"11622","Lao People's Democratic Republic","LAO","Spices, Other","fabio" +"11623","Lao People's Democratic Republic","LAO","Jute","fabio" +"11624","Lao People's Democratic Republic","LAO","Jute-Like Fibres","fabio" +"11625","Lao People's Democratic Republic","LAO","Soft-Fibres, Other","fabio" +"11626","Lao People's Democratic Republic","LAO","Sisal","fabio" +"11627","Lao People's Democratic Republic","LAO","Abaca","fabio" +"11628","Lao People's Democratic Republic","LAO","Hard Fibres, Other","fabio" +"11629","Lao People's Democratic Republic","LAO","Tobacco","fabio" +"11630","Lao People's Democratic Republic","LAO","Rubber","fabio" +"11631","Lao People's Democratic Republic","LAO","Fodder crops","fabio" +"11632","Lao People's Democratic Republic","LAO","Grazing","fabio" +"11633","Lao People's Democratic Republic","LAO","Cottonseed","fabio" +"11634","Lao People's Democratic Republic","LAO","Palm kernels","fabio" +"11635","Lao People's Democratic Republic","LAO","Sugar non-centrifugal","fabio" +"11636","Lao People's Democratic Republic","LAO","Molasses","fabio" +"11637","Lao People's Democratic Republic","LAO","Sugar, Refined Equiv","fabio" +"11638","Lao People's Democratic Republic","LAO","Sweeteners, Other","fabio" +"11639","Lao People's Democratic Republic","LAO","Soyabean Oil","fabio" +"11640","Lao People's Democratic Republic","LAO","Groundnut Oil","fabio" +"11641","Lao People's Democratic Republic","LAO","Sunflowerseed Oil","fabio" +"11642","Lao People's Democratic Republic","LAO","Rape and Mustard Oil","fabio" +"11643","Lao People's Democratic Republic","LAO","Cottonseed Oil","fabio" +"11644","Lao People's Democratic Republic","LAO","Palmkernel Oil","fabio" +"11645","Lao People's Democratic Republic","LAO","Palm Oil","fabio" +"11646","Lao People's Democratic Republic","LAO","Coconut Oil","fabio" +"11647","Lao People's Democratic Republic","LAO","Sesameseed Oil","fabio" +"11648","Lao People's Democratic Republic","LAO","Olive Oil","fabio" +"11649","Lao People's Democratic Republic","LAO","Ricebran Oil","fabio" +"11650","Lao People's Democratic Republic","LAO","Maize Germ Oil","fabio" +"11651","Lao People's Democratic Republic","LAO","Oilcrops Oil, Other","fabio" +"11652","Lao People's Democratic Republic","LAO","Soyabean Cake","fabio" +"11653","Lao People's Democratic Republic","LAO","Groundnut Cake","fabio" +"11654","Lao People's Democratic Republic","LAO","Sunflowerseed Cake","fabio" +"11655","Lao People's Democratic Republic","LAO","Rape and Mustard Cake","fabio" +"11656","Lao People's Democratic Republic","LAO","Cottonseed Cake","fabio" +"11657","Lao People's Democratic Republic","LAO","Palmkernel Cake","fabio" +"11658","Lao People's Democratic Republic","LAO","Copra Cake","fabio" +"11659","Lao People's Democratic Republic","LAO","Sesameseed Cake","fabio" +"11660","Lao People's Democratic Republic","LAO","Oilseed Cakes, Other","fabio" +"11661","Lao People's Democratic Republic","LAO","Wine","fabio" +"11662","Lao People's Democratic Republic","LAO","Beer","fabio" +"11663","Lao People's Democratic Republic","LAO","Beverages, Fermented","fabio" +"11664","Lao People's Democratic Republic","LAO","Beverages, Alcoholic","fabio" +"11665","Lao People's Democratic Republic","LAO","Alcohol, Non-Food","fabio" +"11666","Lao People's Democratic Republic","LAO","Cotton lint","fabio" +"11667","Lao People's Democratic Republic","LAO","Cattle","fabio" +"11668","Lao People's Democratic Republic","LAO","Buffaloes","fabio" +"11669","Lao People's Democratic Republic","LAO","Sheep","fabio" +"11670","Lao People's Democratic Republic","LAO","Goats","fabio" +"11671","Lao People's Democratic Republic","LAO","Pigs","fabio" +"11672","Lao People's Democratic Republic","LAO","Poultry Birds","fabio" +"11673","Lao People's Democratic Republic","LAO","Horses","fabio" +"11674","Lao People's Democratic Republic","LAO","Asses","fabio" +"11675","Lao People's Democratic Republic","LAO","Mules","fabio" +"11676","Lao People's Democratic Republic","LAO","Camels","fabio" +"11677","Lao People's Democratic Republic","LAO","Camelids, other","fabio" +"11678","Lao People's Democratic Republic","LAO","Rabbits and hares","fabio" +"11679","Lao People's Democratic Republic","LAO","Rodents, other","fabio" +"11680","Lao People's Democratic Republic","LAO","Live animals, other","fabio" +"11681","Lao People's Democratic Republic","LAO","Milk - Excluding Butter","fabio" +"11682","Lao People's Democratic Republic","LAO","Butter, Ghee","fabio" +"11683","Lao People's Democratic Republic","LAO","Eggs","fabio" +"11684","Lao People's Democratic Republic","LAO","Wool (Clean Eq.)","fabio" +"11685","Lao People's Democratic Republic","LAO","Bovine Meat","fabio" +"11686","Lao People's Democratic Republic","LAO","Mutton & Goat Meat","fabio" +"11687","Lao People's Democratic Republic","LAO","Pigmeat","fabio" +"11688","Lao People's Democratic Republic","LAO","Poultry Meat","fabio" +"11689","Lao People's Democratic Republic","LAO","Meat, Other","fabio" +"11690","Lao People's Democratic Republic","LAO","Offals, Edible","fabio" +"11691","Lao People's Democratic Republic","LAO","Fats, Animals, Raw","fabio" +"11692","Lao People's Democratic Republic","LAO","Hides and skins","fabio" +"11693","Lao People's Democratic Republic","LAO","Meat Meal","fabio" +"11694","Lao People's Democratic Republic","LAO","Pet food","fabio" +"11695","Lao People's Democratic Republic","LAO","Honey","fabio" +"11696","Lao People's Democratic Republic","LAO","Silk","fabio" +"11697","Lao People's Democratic Republic","LAO","Fish, Seafood","fabio" +"11698","Lao People's Democratic Republic","LAO","Wood fuel","fabio" +"11699","Lao People's Democratic Republic","LAO","Industrial roundwood, coniferous","fabio" +"11700","Lao People's Democratic Republic","LAO","Industrial roundwood, non-coniferous","fabio" +"11701","Lebanon","LBN","Rice (Milled Equivalent)","fabio" +"11702","Lebanon","LBN","Wheat and products","fabio" +"11703","Lebanon","LBN","Barley and products","fabio" +"11704","Lebanon","LBN","Maize and products","fabio" +"11705","Lebanon","LBN","Rye and products","fabio" +"11706","Lebanon","LBN","Oats","fabio" +"11707","Lebanon","LBN","Millet and products","fabio" +"11708","Lebanon","LBN","Sorghum and products","fabio" +"11709","Lebanon","LBN","Cereals, Other","fabio" +"11710","Lebanon","LBN","Potatoes and products","fabio" +"11711","Lebanon","LBN","Cassava and products","fabio" +"11712","Lebanon","LBN","Sweet potatoes","fabio" +"11713","Lebanon","LBN","Roots, Other","fabio" +"11714","Lebanon","LBN","Yams","fabio" +"11715","Lebanon","LBN","Sugar cane","fabio" +"11716","Lebanon","LBN","Sugar beet","fabio" +"11717","Lebanon","LBN","Beans","fabio" +"11718","Lebanon","LBN","Peas","fabio" +"11719","Lebanon","LBN","Pulses, Other and products","fabio" +"11720","Lebanon","LBN","Nuts and products","fabio" +"11721","Lebanon","LBN","Soyabeans","fabio" +"11722","Lebanon","LBN","Groundnuts (Shelled Eq)","fabio" +"11723","Lebanon","LBN","Sunflower seed","fabio" +"11724","Lebanon","LBN","Rape and Mustardseed","fabio" +"11725","Lebanon","LBN","Seed cotton","fabio" +"11726","Lebanon","LBN","Coconuts - Incl Copra","fabio" +"11727","Lebanon","LBN","Sesame seed","fabio" +"11728","Lebanon","LBN","Oil, palm fruit","fabio" +"11729","Lebanon","LBN","Olives (including preserved)","fabio" +"11730","Lebanon","LBN","Oilcrops, Other","fabio" +"11731","Lebanon","LBN","Tomatoes and products","fabio" +"11732","Lebanon","LBN","Onions","fabio" +"11733","Lebanon","LBN","Vegetables, Other","fabio" +"11734","Lebanon","LBN","Oranges, Mandarines","fabio" +"11735","Lebanon","LBN","Lemons, Limes and products","fabio" +"11736","Lebanon","LBN","Grapefruit and products","fabio" +"11737","Lebanon","LBN","Citrus, Other","fabio" +"11738","Lebanon","LBN","Bananas","fabio" +"11739","Lebanon","LBN","Plantains","fabio" +"11740","Lebanon","LBN","Apples and products","fabio" +"11741","Lebanon","LBN","Pineapples and products","fabio" +"11742","Lebanon","LBN","Dates","fabio" +"11743","Lebanon","LBN","Grapes and products (excl wine)","fabio" +"11744","Lebanon","LBN","Fruits, Other","fabio" +"11745","Lebanon","LBN","Coffee and products","fabio" +"11746","Lebanon","LBN","Cocoa Beans and products","fabio" +"11747","Lebanon","LBN","Tea (including mate)","fabio" +"11748","Lebanon","LBN","Hops","fabio" +"11749","Lebanon","LBN","Pepper","fabio" +"11750","Lebanon","LBN","Pimento","fabio" +"11751","Lebanon","LBN","Cloves","fabio" +"11752","Lebanon","LBN","Spices, Other","fabio" +"11753","Lebanon","LBN","Jute","fabio" +"11754","Lebanon","LBN","Jute-Like Fibres","fabio" +"11755","Lebanon","LBN","Soft-Fibres, Other","fabio" +"11756","Lebanon","LBN","Sisal","fabio" +"11757","Lebanon","LBN","Abaca","fabio" +"11758","Lebanon","LBN","Hard Fibres, Other","fabio" +"11759","Lebanon","LBN","Tobacco","fabio" +"11760","Lebanon","LBN","Rubber","fabio" +"11761","Lebanon","LBN","Fodder crops","fabio" +"11762","Lebanon","LBN","Grazing","fabio" +"11763","Lebanon","LBN","Cottonseed","fabio" +"11764","Lebanon","LBN","Palm kernels","fabio" +"11765","Lebanon","LBN","Sugar non-centrifugal","fabio" +"11766","Lebanon","LBN","Molasses","fabio" +"11767","Lebanon","LBN","Sugar, Refined Equiv","fabio" +"11768","Lebanon","LBN","Sweeteners, Other","fabio" +"11769","Lebanon","LBN","Soyabean Oil","fabio" +"11770","Lebanon","LBN","Groundnut Oil","fabio" +"11771","Lebanon","LBN","Sunflowerseed Oil","fabio" +"11772","Lebanon","LBN","Rape and Mustard Oil","fabio" +"11773","Lebanon","LBN","Cottonseed Oil","fabio" +"11774","Lebanon","LBN","Palmkernel Oil","fabio" +"11775","Lebanon","LBN","Palm Oil","fabio" +"11776","Lebanon","LBN","Coconut Oil","fabio" +"11777","Lebanon","LBN","Sesameseed Oil","fabio" +"11778","Lebanon","LBN","Olive Oil","fabio" +"11779","Lebanon","LBN","Ricebran Oil","fabio" +"11780","Lebanon","LBN","Maize Germ Oil","fabio" +"11781","Lebanon","LBN","Oilcrops Oil, Other","fabio" +"11782","Lebanon","LBN","Soyabean Cake","fabio" +"11783","Lebanon","LBN","Groundnut Cake","fabio" +"11784","Lebanon","LBN","Sunflowerseed Cake","fabio" +"11785","Lebanon","LBN","Rape and Mustard Cake","fabio" +"11786","Lebanon","LBN","Cottonseed Cake","fabio" +"11787","Lebanon","LBN","Palmkernel Cake","fabio" +"11788","Lebanon","LBN","Copra Cake","fabio" +"11789","Lebanon","LBN","Sesameseed Cake","fabio" +"11790","Lebanon","LBN","Oilseed Cakes, Other","fabio" +"11791","Lebanon","LBN","Wine","fabio" +"11792","Lebanon","LBN","Beer","fabio" +"11793","Lebanon","LBN","Beverages, Fermented","fabio" +"11794","Lebanon","LBN","Beverages, Alcoholic","fabio" +"11795","Lebanon","LBN","Alcohol, Non-Food","fabio" +"11796","Lebanon","LBN","Cotton lint","fabio" +"11797","Lebanon","LBN","Cattle","fabio" +"11798","Lebanon","LBN","Buffaloes","fabio" +"11799","Lebanon","LBN","Sheep","fabio" +"11800","Lebanon","LBN","Goats","fabio" +"11801","Lebanon","LBN","Pigs","fabio" +"11802","Lebanon","LBN","Poultry Birds","fabio" +"11803","Lebanon","LBN","Horses","fabio" +"11804","Lebanon","LBN","Asses","fabio" +"11805","Lebanon","LBN","Mules","fabio" +"11806","Lebanon","LBN","Camels","fabio" +"11807","Lebanon","LBN","Camelids, other","fabio" +"11808","Lebanon","LBN","Rabbits and hares","fabio" +"11809","Lebanon","LBN","Rodents, other","fabio" +"11810","Lebanon","LBN","Live animals, other","fabio" +"11811","Lebanon","LBN","Milk - Excluding Butter","fabio" +"11812","Lebanon","LBN","Butter, Ghee","fabio" +"11813","Lebanon","LBN","Eggs","fabio" +"11814","Lebanon","LBN","Wool (Clean Eq.)","fabio" +"11815","Lebanon","LBN","Bovine Meat","fabio" +"11816","Lebanon","LBN","Mutton & Goat Meat","fabio" +"11817","Lebanon","LBN","Pigmeat","fabio" +"11818","Lebanon","LBN","Poultry Meat","fabio" +"11819","Lebanon","LBN","Meat, Other","fabio" +"11820","Lebanon","LBN","Offals, Edible","fabio" +"11821","Lebanon","LBN","Fats, Animals, Raw","fabio" +"11822","Lebanon","LBN","Hides and skins","fabio" +"11823","Lebanon","LBN","Meat Meal","fabio" +"11824","Lebanon","LBN","Pet food","fabio" +"11825","Lebanon","LBN","Honey","fabio" +"11826","Lebanon","LBN","Silk","fabio" +"11827","Lebanon","LBN","Fish, Seafood","fabio" +"11828","Lebanon","LBN","Wood fuel","fabio" +"11829","Lebanon","LBN","Industrial roundwood, coniferous","fabio" +"11830","Lebanon","LBN","Industrial roundwood, non-coniferous","fabio" +"11831","Lesotho","LSO","Rice (Milled Equivalent)","fabio" +"11832","Lesotho","LSO","Wheat and products","fabio" +"11833","Lesotho","LSO","Barley and products","fabio" +"11834","Lesotho","LSO","Maize and products","fabio" +"11835","Lesotho","LSO","Rye and products","fabio" +"11836","Lesotho","LSO","Oats","fabio" +"11837","Lesotho","LSO","Millet and products","fabio" +"11838","Lesotho","LSO","Sorghum and products","fabio" +"11839","Lesotho","LSO","Cereals, Other","fabio" +"11840","Lesotho","LSO","Potatoes and products","fabio" +"11841","Lesotho","LSO","Cassava and products","fabio" +"11842","Lesotho","LSO","Sweet potatoes","fabio" +"11843","Lesotho","LSO","Roots, Other","fabio" +"11844","Lesotho","LSO","Yams","fabio" +"11845","Lesotho","LSO","Sugar cane","fabio" +"11846","Lesotho","LSO","Sugar beet","fabio" +"11847","Lesotho","LSO","Beans","fabio" +"11848","Lesotho","LSO","Peas","fabio" +"11849","Lesotho","LSO","Pulses, Other and products","fabio" +"11850","Lesotho","LSO","Nuts and products","fabio" +"11851","Lesotho","LSO","Soyabeans","fabio" +"11852","Lesotho","LSO","Groundnuts (Shelled Eq)","fabio" +"11853","Lesotho","LSO","Sunflower seed","fabio" +"11854","Lesotho","LSO","Rape and Mustardseed","fabio" +"11855","Lesotho","LSO","Seed cotton","fabio" +"11856","Lesotho","LSO","Coconuts - Incl Copra","fabio" +"11857","Lesotho","LSO","Sesame seed","fabio" +"11858","Lesotho","LSO","Oil, palm fruit","fabio" +"11859","Lesotho","LSO","Olives (including preserved)","fabio" +"11860","Lesotho","LSO","Oilcrops, Other","fabio" +"11861","Lesotho","LSO","Tomatoes and products","fabio" +"11862","Lesotho","LSO","Onions","fabio" +"11863","Lesotho","LSO","Vegetables, Other","fabio" +"11864","Lesotho","LSO","Oranges, Mandarines","fabio" +"11865","Lesotho","LSO","Lemons, Limes and products","fabio" +"11866","Lesotho","LSO","Grapefruit and products","fabio" +"11867","Lesotho","LSO","Citrus, Other","fabio" +"11868","Lesotho","LSO","Bananas","fabio" +"11869","Lesotho","LSO","Plantains","fabio" +"11870","Lesotho","LSO","Apples and products","fabio" +"11871","Lesotho","LSO","Pineapples and products","fabio" +"11872","Lesotho","LSO","Dates","fabio" +"11873","Lesotho","LSO","Grapes and products (excl wine)","fabio" +"11874","Lesotho","LSO","Fruits, Other","fabio" +"11875","Lesotho","LSO","Coffee and products","fabio" +"11876","Lesotho","LSO","Cocoa Beans and products","fabio" +"11877","Lesotho","LSO","Tea (including mate)","fabio" +"11878","Lesotho","LSO","Hops","fabio" +"11879","Lesotho","LSO","Pepper","fabio" +"11880","Lesotho","LSO","Pimento","fabio" +"11881","Lesotho","LSO","Cloves","fabio" +"11882","Lesotho","LSO","Spices, Other","fabio" +"11883","Lesotho","LSO","Jute","fabio" +"11884","Lesotho","LSO","Jute-Like Fibres","fabio" +"11885","Lesotho","LSO","Soft-Fibres, Other","fabio" +"11886","Lesotho","LSO","Sisal","fabio" +"11887","Lesotho","LSO","Abaca","fabio" +"11888","Lesotho","LSO","Hard Fibres, Other","fabio" +"11889","Lesotho","LSO","Tobacco","fabio" +"11890","Lesotho","LSO","Rubber","fabio" +"11891","Lesotho","LSO","Fodder crops","fabio" +"11892","Lesotho","LSO","Grazing","fabio" +"11893","Lesotho","LSO","Cottonseed","fabio" +"11894","Lesotho","LSO","Palm kernels","fabio" +"11895","Lesotho","LSO","Sugar non-centrifugal","fabio" +"11896","Lesotho","LSO","Molasses","fabio" +"11897","Lesotho","LSO","Sugar, Refined Equiv","fabio" +"11898","Lesotho","LSO","Sweeteners, Other","fabio" +"11899","Lesotho","LSO","Soyabean Oil","fabio" +"11900","Lesotho","LSO","Groundnut Oil","fabio" +"11901","Lesotho","LSO","Sunflowerseed Oil","fabio" +"11902","Lesotho","LSO","Rape and Mustard Oil","fabio" +"11903","Lesotho","LSO","Cottonseed Oil","fabio" +"11904","Lesotho","LSO","Palmkernel Oil","fabio" +"11905","Lesotho","LSO","Palm Oil","fabio" +"11906","Lesotho","LSO","Coconut Oil","fabio" +"11907","Lesotho","LSO","Sesameseed Oil","fabio" +"11908","Lesotho","LSO","Olive Oil","fabio" +"11909","Lesotho","LSO","Ricebran Oil","fabio" +"11910","Lesotho","LSO","Maize Germ Oil","fabio" +"11911","Lesotho","LSO","Oilcrops Oil, Other","fabio" +"11912","Lesotho","LSO","Soyabean Cake","fabio" +"11913","Lesotho","LSO","Groundnut Cake","fabio" +"11914","Lesotho","LSO","Sunflowerseed Cake","fabio" +"11915","Lesotho","LSO","Rape and Mustard Cake","fabio" +"11916","Lesotho","LSO","Cottonseed Cake","fabio" +"11917","Lesotho","LSO","Palmkernel Cake","fabio" +"11918","Lesotho","LSO","Copra Cake","fabio" +"11919","Lesotho","LSO","Sesameseed Cake","fabio" +"11920","Lesotho","LSO","Oilseed Cakes, Other","fabio" +"11921","Lesotho","LSO","Wine","fabio" +"11922","Lesotho","LSO","Beer","fabio" +"11923","Lesotho","LSO","Beverages, Fermented","fabio" +"11924","Lesotho","LSO","Beverages, Alcoholic","fabio" +"11925","Lesotho","LSO","Alcohol, Non-Food","fabio" +"11926","Lesotho","LSO","Cotton lint","fabio" +"11927","Lesotho","LSO","Cattle","fabio" +"11928","Lesotho","LSO","Buffaloes","fabio" +"11929","Lesotho","LSO","Sheep","fabio" +"11930","Lesotho","LSO","Goats","fabio" +"11931","Lesotho","LSO","Pigs","fabio" +"11932","Lesotho","LSO","Poultry Birds","fabio" +"11933","Lesotho","LSO","Horses","fabio" +"11934","Lesotho","LSO","Asses","fabio" +"11935","Lesotho","LSO","Mules","fabio" +"11936","Lesotho","LSO","Camels","fabio" +"11937","Lesotho","LSO","Camelids, other","fabio" +"11938","Lesotho","LSO","Rabbits and hares","fabio" +"11939","Lesotho","LSO","Rodents, other","fabio" +"11940","Lesotho","LSO","Live animals, other","fabio" +"11941","Lesotho","LSO","Milk - Excluding Butter","fabio" +"11942","Lesotho","LSO","Butter, Ghee","fabio" +"11943","Lesotho","LSO","Eggs","fabio" +"11944","Lesotho","LSO","Wool (Clean Eq.)","fabio" +"11945","Lesotho","LSO","Bovine Meat","fabio" +"11946","Lesotho","LSO","Mutton & Goat Meat","fabio" +"11947","Lesotho","LSO","Pigmeat","fabio" +"11948","Lesotho","LSO","Poultry Meat","fabio" +"11949","Lesotho","LSO","Meat, Other","fabio" +"11950","Lesotho","LSO","Offals, Edible","fabio" +"11951","Lesotho","LSO","Fats, Animals, Raw","fabio" +"11952","Lesotho","LSO","Hides and skins","fabio" +"11953","Lesotho","LSO","Meat Meal","fabio" +"11954","Lesotho","LSO","Pet food","fabio" +"11955","Lesotho","LSO","Honey","fabio" +"11956","Lesotho","LSO","Silk","fabio" +"11957","Lesotho","LSO","Fish, Seafood","fabio" +"11958","Lesotho","LSO","Wood fuel","fabio" +"11959","Lesotho","LSO","Industrial roundwood, coniferous","fabio" +"11960","Lesotho","LSO","Industrial roundwood, non-coniferous","fabio" +"11961","Liberia","LBR","Rice (Milled Equivalent)","fabio" +"11962","Liberia","LBR","Wheat and products","fabio" +"11963","Liberia","LBR","Barley and products","fabio" +"11964","Liberia","LBR","Maize and products","fabio" +"11965","Liberia","LBR","Rye and products","fabio" +"11966","Liberia","LBR","Oats","fabio" +"11967","Liberia","LBR","Millet and products","fabio" +"11968","Liberia","LBR","Sorghum and products","fabio" +"11969","Liberia","LBR","Cereals, Other","fabio" +"11970","Liberia","LBR","Potatoes and products","fabio" +"11971","Liberia","LBR","Cassava and products","fabio" +"11972","Liberia","LBR","Sweet potatoes","fabio" +"11973","Liberia","LBR","Roots, Other","fabio" +"11974","Liberia","LBR","Yams","fabio" +"11975","Liberia","LBR","Sugar cane","fabio" +"11976","Liberia","LBR","Sugar beet","fabio" +"11977","Liberia","LBR","Beans","fabio" +"11978","Liberia","LBR","Peas","fabio" +"11979","Liberia","LBR","Pulses, Other and products","fabio" +"11980","Liberia","LBR","Nuts and products","fabio" +"11981","Liberia","LBR","Soyabeans","fabio" +"11982","Liberia","LBR","Groundnuts (Shelled Eq)","fabio" +"11983","Liberia","LBR","Sunflower seed","fabio" +"11984","Liberia","LBR","Rape and Mustardseed","fabio" +"11985","Liberia","LBR","Seed cotton","fabio" +"11986","Liberia","LBR","Coconuts - Incl Copra","fabio" +"11987","Liberia","LBR","Sesame seed","fabio" +"11988","Liberia","LBR","Oil, palm fruit","fabio" +"11989","Liberia","LBR","Olives (including preserved)","fabio" +"11990","Liberia","LBR","Oilcrops, Other","fabio" +"11991","Liberia","LBR","Tomatoes and products","fabio" +"11992","Liberia","LBR","Onions","fabio" +"11993","Liberia","LBR","Vegetables, Other","fabio" +"11994","Liberia","LBR","Oranges, Mandarines","fabio" +"11995","Liberia","LBR","Lemons, Limes and products","fabio" +"11996","Liberia","LBR","Grapefruit and products","fabio" +"11997","Liberia","LBR","Citrus, Other","fabio" +"11998","Liberia","LBR","Bananas","fabio" +"11999","Liberia","LBR","Plantains","fabio" +"12000","Liberia","LBR","Apples and products","fabio" +"12001","Liberia","LBR","Pineapples and products","fabio" +"12002","Liberia","LBR","Dates","fabio" +"12003","Liberia","LBR","Grapes and products (excl wine)","fabio" +"12004","Liberia","LBR","Fruits, Other","fabio" +"12005","Liberia","LBR","Coffee and products","fabio" +"12006","Liberia","LBR","Cocoa Beans and products","fabio" +"12007","Liberia","LBR","Tea (including mate)","fabio" +"12008","Liberia","LBR","Hops","fabio" +"12009","Liberia","LBR","Pepper","fabio" +"12010","Liberia","LBR","Pimento","fabio" +"12011","Liberia","LBR","Cloves","fabio" +"12012","Liberia","LBR","Spices, Other","fabio" +"12013","Liberia","LBR","Jute","fabio" +"12014","Liberia","LBR","Jute-Like Fibres","fabio" +"12015","Liberia","LBR","Soft-Fibres, Other","fabio" +"12016","Liberia","LBR","Sisal","fabio" +"12017","Liberia","LBR","Abaca","fabio" +"12018","Liberia","LBR","Hard Fibres, Other","fabio" +"12019","Liberia","LBR","Tobacco","fabio" +"12020","Liberia","LBR","Rubber","fabio" +"12021","Liberia","LBR","Fodder crops","fabio" +"12022","Liberia","LBR","Grazing","fabio" +"12023","Liberia","LBR","Cottonseed","fabio" +"12024","Liberia","LBR","Palm kernels","fabio" +"12025","Liberia","LBR","Sugar non-centrifugal","fabio" +"12026","Liberia","LBR","Molasses","fabio" +"12027","Liberia","LBR","Sugar, Refined Equiv","fabio" +"12028","Liberia","LBR","Sweeteners, Other","fabio" +"12029","Liberia","LBR","Soyabean Oil","fabio" +"12030","Liberia","LBR","Groundnut Oil","fabio" +"12031","Liberia","LBR","Sunflowerseed Oil","fabio" +"12032","Liberia","LBR","Rape and Mustard Oil","fabio" +"12033","Liberia","LBR","Cottonseed Oil","fabio" +"12034","Liberia","LBR","Palmkernel Oil","fabio" +"12035","Liberia","LBR","Palm Oil","fabio" +"12036","Liberia","LBR","Coconut Oil","fabio" +"12037","Liberia","LBR","Sesameseed Oil","fabio" +"12038","Liberia","LBR","Olive Oil","fabio" +"12039","Liberia","LBR","Ricebran Oil","fabio" +"12040","Liberia","LBR","Maize Germ Oil","fabio" +"12041","Liberia","LBR","Oilcrops Oil, Other","fabio" +"12042","Liberia","LBR","Soyabean Cake","fabio" +"12043","Liberia","LBR","Groundnut Cake","fabio" +"12044","Liberia","LBR","Sunflowerseed Cake","fabio" +"12045","Liberia","LBR","Rape and Mustard Cake","fabio" +"12046","Liberia","LBR","Cottonseed Cake","fabio" +"12047","Liberia","LBR","Palmkernel Cake","fabio" +"12048","Liberia","LBR","Copra Cake","fabio" +"12049","Liberia","LBR","Sesameseed Cake","fabio" +"12050","Liberia","LBR","Oilseed Cakes, Other","fabio" +"12051","Liberia","LBR","Wine","fabio" +"12052","Liberia","LBR","Beer","fabio" +"12053","Liberia","LBR","Beverages, Fermented","fabio" +"12054","Liberia","LBR","Beverages, Alcoholic","fabio" +"12055","Liberia","LBR","Alcohol, Non-Food","fabio" +"12056","Liberia","LBR","Cotton lint","fabio" +"12057","Liberia","LBR","Cattle","fabio" +"12058","Liberia","LBR","Buffaloes","fabio" +"12059","Liberia","LBR","Sheep","fabio" +"12060","Liberia","LBR","Goats","fabio" +"12061","Liberia","LBR","Pigs","fabio" +"12062","Liberia","LBR","Poultry Birds","fabio" +"12063","Liberia","LBR","Horses","fabio" +"12064","Liberia","LBR","Asses","fabio" +"12065","Liberia","LBR","Mules","fabio" +"12066","Liberia","LBR","Camels","fabio" +"12067","Liberia","LBR","Camelids, other","fabio" +"12068","Liberia","LBR","Rabbits and hares","fabio" +"12069","Liberia","LBR","Rodents, other","fabio" +"12070","Liberia","LBR","Live animals, other","fabio" +"12071","Liberia","LBR","Milk - Excluding Butter","fabio" +"12072","Liberia","LBR","Butter, Ghee","fabio" +"12073","Liberia","LBR","Eggs","fabio" +"12074","Liberia","LBR","Wool (Clean Eq.)","fabio" +"12075","Liberia","LBR","Bovine Meat","fabio" +"12076","Liberia","LBR","Mutton & Goat Meat","fabio" +"12077","Liberia","LBR","Pigmeat","fabio" +"12078","Liberia","LBR","Poultry Meat","fabio" +"12079","Liberia","LBR","Meat, Other","fabio" +"12080","Liberia","LBR","Offals, Edible","fabio" +"12081","Liberia","LBR","Fats, Animals, Raw","fabio" +"12082","Liberia","LBR","Hides and skins","fabio" +"12083","Liberia","LBR","Meat Meal","fabio" +"12084","Liberia","LBR","Pet food","fabio" +"12085","Liberia","LBR","Honey","fabio" +"12086","Liberia","LBR","Silk","fabio" +"12087","Liberia","LBR","Fish, Seafood","fabio" +"12088","Liberia","LBR","Wood fuel","fabio" +"12089","Liberia","LBR","Industrial roundwood, coniferous","fabio" +"12090","Liberia","LBR","Industrial roundwood, non-coniferous","fabio" +"12091","Libya","LBY","Rice (Milled Equivalent)","fabio" +"12092","Libya","LBY","Wheat and products","fabio" +"12093","Libya","LBY","Barley and products","fabio" +"12094","Libya","LBY","Maize and products","fabio" +"12095","Libya","LBY","Rye and products","fabio" +"12096","Libya","LBY","Oats","fabio" +"12097","Libya","LBY","Millet and products","fabio" +"12098","Libya","LBY","Sorghum and products","fabio" +"12099","Libya","LBY","Cereals, Other","fabio" +"12100","Libya","LBY","Potatoes and products","fabio" +"12101","Libya","LBY","Cassava and products","fabio" +"12102","Libya","LBY","Sweet potatoes","fabio" +"12103","Libya","LBY","Roots, Other","fabio" +"12104","Libya","LBY","Yams","fabio" +"12105","Libya","LBY","Sugar cane","fabio" +"12106","Libya","LBY","Sugar beet","fabio" +"12107","Libya","LBY","Beans","fabio" +"12108","Libya","LBY","Peas","fabio" +"12109","Libya","LBY","Pulses, Other and products","fabio" +"12110","Libya","LBY","Nuts and products","fabio" +"12111","Libya","LBY","Soyabeans","fabio" +"12112","Libya","LBY","Groundnuts (Shelled Eq)","fabio" +"12113","Libya","LBY","Sunflower seed","fabio" +"12114","Libya","LBY","Rape and Mustardseed","fabio" +"12115","Libya","LBY","Seed cotton","fabio" +"12116","Libya","LBY","Coconuts - Incl Copra","fabio" +"12117","Libya","LBY","Sesame seed","fabio" +"12118","Libya","LBY","Oil, palm fruit","fabio" +"12119","Libya","LBY","Olives (including preserved)","fabio" +"12120","Libya","LBY","Oilcrops, Other","fabio" +"12121","Libya","LBY","Tomatoes and products","fabio" +"12122","Libya","LBY","Onions","fabio" +"12123","Libya","LBY","Vegetables, Other","fabio" +"12124","Libya","LBY","Oranges, Mandarines","fabio" +"12125","Libya","LBY","Lemons, Limes and products","fabio" +"12126","Libya","LBY","Grapefruit and products","fabio" +"12127","Libya","LBY","Citrus, Other","fabio" +"12128","Libya","LBY","Bananas","fabio" +"12129","Libya","LBY","Plantains","fabio" +"12130","Libya","LBY","Apples and products","fabio" +"12131","Libya","LBY","Pineapples and products","fabio" +"12132","Libya","LBY","Dates","fabio" +"12133","Libya","LBY","Grapes and products (excl wine)","fabio" +"12134","Libya","LBY","Fruits, Other","fabio" +"12135","Libya","LBY","Coffee and products","fabio" +"12136","Libya","LBY","Cocoa Beans and products","fabio" +"12137","Libya","LBY","Tea (including mate)","fabio" +"12138","Libya","LBY","Hops","fabio" +"12139","Libya","LBY","Pepper","fabio" +"12140","Libya","LBY","Pimento","fabio" +"12141","Libya","LBY","Cloves","fabio" +"12142","Libya","LBY","Spices, Other","fabio" +"12143","Libya","LBY","Jute","fabio" +"12144","Libya","LBY","Jute-Like Fibres","fabio" +"12145","Libya","LBY","Soft-Fibres, Other","fabio" +"12146","Libya","LBY","Sisal","fabio" +"12147","Libya","LBY","Abaca","fabio" +"12148","Libya","LBY","Hard Fibres, Other","fabio" +"12149","Libya","LBY","Tobacco","fabio" +"12150","Libya","LBY","Rubber","fabio" +"12151","Libya","LBY","Fodder crops","fabio" +"12152","Libya","LBY","Grazing","fabio" +"12153","Libya","LBY","Cottonseed","fabio" +"12154","Libya","LBY","Palm kernels","fabio" +"12155","Libya","LBY","Sugar non-centrifugal","fabio" +"12156","Libya","LBY","Molasses","fabio" +"12157","Libya","LBY","Sugar, Refined Equiv","fabio" +"12158","Libya","LBY","Sweeteners, Other","fabio" +"12159","Libya","LBY","Soyabean Oil","fabio" +"12160","Libya","LBY","Groundnut Oil","fabio" +"12161","Libya","LBY","Sunflowerseed Oil","fabio" +"12162","Libya","LBY","Rape and Mustard Oil","fabio" +"12163","Libya","LBY","Cottonseed Oil","fabio" +"12164","Libya","LBY","Palmkernel Oil","fabio" +"12165","Libya","LBY","Palm Oil","fabio" +"12166","Libya","LBY","Coconut Oil","fabio" +"12167","Libya","LBY","Sesameseed Oil","fabio" +"12168","Libya","LBY","Olive Oil","fabio" +"12169","Libya","LBY","Ricebran Oil","fabio" +"12170","Libya","LBY","Maize Germ Oil","fabio" +"12171","Libya","LBY","Oilcrops Oil, Other","fabio" +"12172","Libya","LBY","Soyabean Cake","fabio" +"12173","Libya","LBY","Groundnut Cake","fabio" +"12174","Libya","LBY","Sunflowerseed Cake","fabio" +"12175","Libya","LBY","Rape and Mustard Cake","fabio" +"12176","Libya","LBY","Cottonseed Cake","fabio" +"12177","Libya","LBY","Palmkernel Cake","fabio" +"12178","Libya","LBY","Copra Cake","fabio" +"12179","Libya","LBY","Sesameseed Cake","fabio" +"12180","Libya","LBY","Oilseed Cakes, Other","fabio" +"12181","Libya","LBY","Wine","fabio" +"12182","Libya","LBY","Beer","fabio" +"12183","Libya","LBY","Beverages, Fermented","fabio" +"12184","Libya","LBY","Beverages, Alcoholic","fabio" +"12185","Libya","LBY","Alcohol, Non-Food","fabio" +"12186","Libya","LBY","Cotton lint","fabio" +"12187","Libya","LBY","Cattle","fabio" +"12188","Libya","LBY","Buffaloes","fabio" +"12189","Libya","LBY","Sheep","fabio" +"12190","Libya","LBY","Goats","fabio" +"12191","Libya","LBY","Pigs","fabio" +"12192","Libya","LBY","Poultry Birds","fabio" +"12193","Libya","LBY","Horses","fabio" +"12194","Libya","LBY","Asses","fabio" +"12195","Libya","LBY","Mules","fabio" +"12196","Libya","LBY","Camels","fabio" +"12197","Libya","LBY","Camelids, other","fabio" +"12198","Libya","LBY","Rabbits and hares","fabio" +"12199","Libya","LBY","Rodents, other","fabio" +"12200","Libya","LBY","Live animals, other","fabio" +"12201","Libya","LBY","Milk - Excluding Butter","fabio" +"12202","Libya","LBY","Butter, Ghee","fabio" +"12203","Libya","LBY","Eggs","fabio" +"12204","Libya","LBY","Wool (Clean Eq.)","fabio" +"12205","Libya","LBY","Bovine Meat","fabio" +"12206","Libya","LBY","Mutton & Goat Meat","fabio" +"12207","Libya","LBY","Pigmeat","fabio" +"12208","Libya","LBY","Poultry Meat","fabio" +"12209","Libya","LBY","Meat, Other","fabio" +"12210","Libya","LBY","Offals, Edible","fabio" +"12211","Libya","LBY","Fats, Animals, Raw","fabio" +"12212","Libya","LBY","Hides and skins","fabio" +"12213","Libya","LBY","Meat Meal","fabio" +"12214","Libya","LBY","Pet food","fabio" +"12215","Libya","LBY","Honey","fabio" +"12216","Libya","LBY","Silk","fabio" +"12217","Libya","LBY","Fish, Seafood","fabio" +"12218","Libya","LBY","Wood fuel","fabio" +"12219","Libya","LBY","Industrial roundwood, coniferous","fabio" +"12220","Libya","LBY","Industrial roundwood, non-coniferous","fabio" +"12221","Lithuania","LTU","Rice (Milled Equivalent)","fabio" +"12222","Lithuania","LTU","Wheat and products","fabio" +"12223","Lithuania","LTU","Barley and products","fabio" +"12224","Lithuania","LTU","Maize and products","fabio" +"12225","Lithuania","LTU","Rye and products","fabio" +"12226","Lithuania","LTU","Oats","fabio" +"12227","Lithuania","LTU","Millet and products","fabio" +"12228","Lithuania","LTU","Sorghum and products","fabio" +"12229","Lithuania","LTU","Cereals, Other","fabio" +"12230","Lithuania","LTU","Potatoes and products","fabio" +"12231","Lithuania","LTU","Cassava and products","fabio" +"12232","Lithuania","LTU","Sweet potatoes","fabio" +"12233","Lithuania","LTU","Roots, Other","fabio" +"12234","Lithuania","LTU","Yams","fabio" +"12235","Lithuania","LTU","Sugar cane","fabio" +"12236","Lithuania","LTU","Sugar beet","fabio" +"12237","Lithuania","LTU","Beans","fabio" +"12238","Lithuania","LTU","Peas","fabio" +"12239","Lithuania","LTU","Pulses, Other and products","fabio" +"12240","Lithuania","LTU","Nuts and products","fabio" +"12241","Lithuania","LTU","Soyabeans","fabio" +"12242","Lithuania","LTU","Groundnuts (Shelled Eq)","fabio" +"12243","Lithuania","LTU","Sunflower seed","fabio" +"12244","Lithuania","LTU","Rape and Mustardseed","fabio" +"12245","Lithuania","LTU","Seed cotton","fabio" +"12246","Lithuania","LTU","Coconuts - Incl Copra","fabio" +"12247","Lithuania","LTU","Sesame seed","fabio" +"12248","Lithuania","LTU","Oil, palm fruit","fabio" +"12249","Lithuania","LTU","Olives (including preserved)","fabio" +"12250","Lithuania","LTU","Oilcrops, Other","fabio" +"12251","Lithuania","LTU","Tomatoes and products","fabio" +"12252","Lithuania","LTU","Onions","fabio" +"12253","Lithuania","LTU","Vegetables, Other","fabio" +"12254","Lithuania","LTU","Oranges, Mandarines","fabio" +"12255","Lithuania","LTU","Lemons, Limes and products","fabio" +"12256","Lithuania","LTU","Grapefruit and products","fabio" +"12257","Lithuania","LTU","Citrus, Other","fabio" +"12258","Lithuania","LTU","Bananas","fabio" +"12259","Lithuania","LTU","Plantains","fabio" +"12260","Lithuania","LTU","Apples and products","fabio" +"12261","Lithuania","LTU","Pineapples and products","fabio" +"12262","Lithuania","LTU","Dates","fabio" +"12263","Lithuania","LTU","Grapes and products (excl wine)","fabio" +"12264","Lithuania","LTU","Fruits, Other","fabio" +"12265","Lithuania","LTU","Coffee and products","fabio" +"12266","Lithuania","LTU","Cocoa Beans and products","fabio" +"12267","Lithuania","LTU","Tea (including mate)","fabio" +"12268","Lithuania","LTU","Hops","fabio" +"12269","Lithuania","LTU","Pepper","fabio" +"12270","Lithuania","LTU","Pimento","fabio" +"12271","Lithuania","LTU","Cloves","fabio" +"12272","Lithuania","LTU","Spices, Other","fabio" +"12273","Lithuania","LTU","Jute","fabio" +"12274","Lithuania","LTU","Jute-Like Fibres","fabio" +"12275","Lithuania","LTU","Soft-Fibres, Other","fabio" +"12276","Lithuania","LTU","Sisal","fabio" +"12277","Lithuania","LTU","Abaca","fabio" +"12278","Lithuania","LTU","Hard Fibres, Other","fabio" +"12279","Lithuania","LTU","Tobacco","fabio" +"12280","Lithuania","LTU","Rubber","fabio" +"12281","Lithuania","LTU","Fodder crops","fabio" +"12282","Lithuania","LTU","Grazing","fabio" +"12283","Lithuania","LTU","Cottonseed","fabio" +"12284","Lithuania","LTU","Palm kernels","fabio" +"12285","Lithuania","LTU","Sugar non-centrifugal","fabio" +"12286","Lithuania","LTU","Molasses","fabio" +"12287","Lithuania","LTU","Sugar, Refined Equiv","fabio" +"12288","Lithuania","LTU","Sweeteners, Other","fabio" +"12289","Lithuania","LTU","Soyabean Oil","fabio" +"12290","Lithuania","LTU","Groundnut Oil","fabio" +"12291","Lithuania","LTU","Sunflowerseed Oil","fabio" +"12292","Lithuania","LTU","Rape and Mustard Oil","fabio" +"12293","Lithuania","LTU","Cottonseed Oil","fabio" +"12294","Lithuania","LTU","Palmkernel Oil","fabio" +"12295","Lithuania","LTU","Palm Oil","fabio" +"12296","Lithuania","LTU","Coconut Oil","fabio" +"12297","Lithuania","LTU","Sesameseed Oil","fabio" +"12298","Lithuania","LTU","Olive Oil","fabio" +"12299","Lithuania","LTU","Ricebran Oil","fabio" +"12300","Lithuania","LTU","Maize Germ Oil","fabio" +"12301","Lithuania","LTU","Oilcrops Oil, Other","fabio" +"12302","Lithuania","LTU","Soyabean Cake","fabio" +"12303","Lithuania","LTU","Groundnut Cake","fabio" +"12304","Lithuania","LTU","Sunflowerseed Cake","fabio" +"12305","Lithuania","LTU","Rape and Mustard Cake","fabio" +"12306","Lithuania","LTU","Cottonseed Cake","fabio" +"12307","Lithuania","LTU","Palmkernel Cake","fabio" +"12308","Lithuania","LTU","Copra Cake","fabio" +"12309","Lithuania","LTU","Sesameseed Cake","fabio" +"12310","Lithuania","LTU","Oilseed Cakes, Other","fabio" +"12311","Lithuania","LTU","Wine","fabio" +"12312","Lithuania","LTU","Beer","fabio" +"12313","Lithuania","LTU","Beverages, Fermented","fabio" +"12314","Lithuania","LTU","Beverages, Alcoholic","fabio" +"12315","Lithuania","LTU","Alcohol, Non-Food","fabio" +"12316","Lithuania","LTU","Cotton lint","fabio" +"12317","Lithuania","LTU","Cattle","fabio" +"12318","Lithuania","LTU","Buffaloes","fabio" +"12319","Lithuania","LTU","Sheep","fabio" +"12320","Lithuania","LTU","Goats","fabio" +"12321","Lithuania","LTU","Pigs","fabio" +"12322","Lithuania","LTU","Poultry Birds","fabio" +"12323","Lithuania","LTU","Horses","fabio" +"12324","Lithuania","LTU","Asses","fabio" +"12325","Lithuania","LTU","Mules","fabio" +"12326","Lithuania","LTU","Camels","fabio" +"12327","Lithuania","LTU","Camelids, other","fabio" +"12328","Lithuania","LTU","Rabbits and hares","fabio" +"12329","Lithuania","LTU","Rodents, other","fabio" +"12330","Lithuania","LTU","Live animals, other","fabio" +"12331","Lithuania","LTU","Milk - Excluding Butter","fabio" +"12332","Lithuania","LTU","Butter, Ghee","fabio" +"12333","Lithuania","LTU","Eggs","fabio" +"12334","Lithuania","LTU","Wool (Clean Eq.)","fabio" +"12335","Lithuania","LTU","Bovine Meat","fabio" +"12336","Lithuania","LTU","Mutton & Goat Meat","fabio" +"12337","Lithuania","LTU","Pigmeat","fabio" +"12338","Lithuania","LTU","Poultry Meat","fabio" +"12339","Lithuania","LTU","Meat, Other","fabio" +"12340","Lithuania","LTU","Offals, Edible","fabio" +"12341","Lithuania","LTU","Fats, Animals, Raw","fabio" +"12342","Lithuania","LTU","Hides and skins","fabio" +"12343","Lithuania","LTU","Meat Meal","fabio" +"12344","Lithuania","LTU","Pet food","fabio" +"12345","Lithuania","LTU","Honey","fabio" +"12346","Lithuania","LTU","Silk","fabio" +"12347","Lithuania","LTU","Fish, Seafood","fabio" +"12348","Lithuania","LTU","Wood fuel","fabio" +"12349","Lithuania","LTU","Industrial roundwood, coniferous","fabio" +"12350","Lithuania","LTU","Industrial roundwood, non-coniferous","fabio" +"12351","China, Macao SAR","MAC","Rice (Milled Equivalent)","fabio" +"12352","China, Macao SAR","MAC","Wheat and products","fabio" +"12353","China, Macao SAR","MAC","Barley and products","fabio" +"12354","China, Macao SAR","MAC","Maize and products","fabio" +"12355","China, Macao SAR","MAC","Rye and products","fabio" +"12356","China, Macao SAR","MAC","Oats","fabio" +"12357","China, Macao SAR","MAC","Millet and products","fabio" +"12358","China, Macao SAR","MAC","Sorghum and products","fabio" +"12359","China, Macao SAR","MAC","Cereals, Other","fabio" +"12360","China, Macao SAR","MAC","Potatoes and products","fabio" +"12361","China, Macao SAR","MAC","Cassava and products","fabio" +"12362","China, Macao SAR","MAC","Sweet potatoes","fabio" +"12363","China, Macao SAR","MAC","Roots, Other","fabio" +"12364","China, Macao SAR","MAC","Yams","fabio" +"12365","China, Macao SAR","MAC","Sugar cane","fabio" +"12366","China, Macao SAR","MAC","Sugar beet","fabio" +"12367","China, Macao SAR","MAC","Beans","fabio" +"12368","China, Macao SAR","MAC","Peas","fabio" +"12369","China, Macao SAR","MAC","Pulses, Other and products","fabio" +"12370","China, Macao SAR","MAC","Nuts and products","fabio" +"12371","China, Macao SAR","MAC","Soyabeans","fabio" +"12372","China, Macao SAR","MAC","Groundnuts (Shelled Eq)","fabio" +"12373","China, Macao SAR","MAC","Sunflower seed","fabio" +"12374","China, Macao SAR","MAC","Rape and Mustardseed","fabio" +"12375","China, Macao SAR","MAC","Seed cotton","fabio" +"12376","China, Macao SAR","MAC","Coconuts - Incl Copra","fabio" +"12377","China, Macao SAR","MAC","Sesame seed","fabio" +"12378","China, Macao SAR","MAC","Oil, palm fruit","fabio" +"12379","China, Macao SAR","MAC","Olives (including preserved)","fabio" +"12380","China, Macao SAR","MAC","Oilcrops, Other","fabio" +"12381","China, Macao SAR","MAC","Tomatoes and products","fabio" +"12382","China, Macao SAR","MAC","Onions","fabio" +"12383","China, Macao SAR","MAC","Vegetables, Other","fabio" +"12384","China, Macao SAR","MAC","Oranges, Mandarines","fabio" +"12385","China, Macao SAR","MAC","Lemons, Limes and products","fabio" +"12386","China, Macao SAR","MAC","Grapefruit and products","fabio" +"12387","China, Macao SAR","MAC","Citrus, Other","fabio" +"12388","China, Macao SAR","MAC","Bananas","fabio" +"12389","China, Macao SAR","MAC","Plantains","fabio" +"12390","China, Macao SAR","MAC","Apples and products","fabio" +"12391","China, Macao SAR","MAC","Pineapples and products","fabio" +"12392","China, Macao SAR","MAC","Dates","fabio" +"12393","China, Macao SAR","MAC","Grapes and products (excl wine)","fabio" +"12394","China, Macao SAR","MAC","Fruits, Other","fabio" +"12395","China, Macao SAR","MAC","Coffee and products","fabio" +"12396","China, Macao SAR","MAC","Cocoa Beans and products","fabio" +"12397","China, Macao SAR","MAC","Tea (including mate)","fabio" +"12398","China, Macao SAR","MAC","Hops","fabio" +"12399","China, Macao SAR","MAC","Pepper","fabio" +"12400","China, Macao SAR","MAC","Pimento","fabio" +"12401","China, Macao SAR","MAC","Cloves","fabio" +"12402","China, Macao SAR","MAC","Spices, Other","fabio" +"12403","China, Macao SAR","MAC","Jute","fabio" +"12404","China, Macao SAR","MAC","Jute-Like Fibres","fabio" +"12405","China, Macao SAR","MAC","Soft-Fibres, Other","fabio" +"12406","China, Macao SAR","MAC","Sisal","fabio" +"12407","China, Macao SAR","MAC","Abaca","fabio" +"12408","China, Macao SAR","MAC","Hard Fibres, Other","fabio" +"12409","China, Macao SAR","MAC","Tobacco","fabio" +"12410","China, Macao SAR","MAC","Rubber","fabio" +"12411","China, Macao SAR","MAC","Fodder crops","fabio" +"12412","China, Macao SAR","MAC","Grazing","fabio" +"12413","China, Macao SAR","MAC","Cottonseed","fabio" +"12414","China, Macao SAR","MAC","Palm kernels","fabio" +"12415","China, Macao SAR","MAC","Sugar non-centrifugal","fabio" +"12416","China, Macao SAR","MAC","Molasses","fabio" +"12417","China, Macao SAR","MAC","Sugar, Refined Equiv","fabio" +"12418","China, Macao SAR","MAC","Sweeteners, Other","fabio" +"12419","China, Macao SAR","MAC","Soyabean Oil","fabio" +"12420","China, Macao SAR","MAC","Groundnut Oil","fabio" +"12421","China, Macao SAR","MAC","Sunflowerseed Oil","fabio" +"12422","China, Macao SAR","MAC","Rape and Mustard Oil","fabio" +"12423","China, Macao SAR","MAC","Cottonseed Oil","fabio" +"12424","China, Macao SAR","MAC","Palmkernel Oil","fabio" +"12425","China, Macao SAR","MAC","Palm Oil","fabio" +"12426","China, Macao SAR","MAC","Coconut Oil","fabio" +"12427","China, Macao SAR","MAC","Sesameseed Oil","fabio" +"12428","China, Macao SAR","MAC","Olive Oil","fabio" +"12429","China, Macao SAR","MAC","Ricebran Oil","fabio" +"12430","China, Macao SAR","MAC","Maize Germ Oil","fabio" +"12431","China, Macao SAR","MAC","Oilcrops Oil, Other","fabio" +"12432","China, Macao SAR","MAC","Soyabean Cake","fabio" +"12433","China, Macao SAR","MAC","Groundnut Cake","fabio" +"12434","China, Macao SAR","MAC","Sunflowerseed Cake","fabio" +"12435","China, Macao SAR","MAC","Rape and Mustard Cake","fabio" +"12436","China, Macao SAR","MAC","Cottonseed Cake","fabio" +"12437","China, Macao SAR","MAC","Palmkernel Cake","fabio" +"12438","China, Macao SAR","MAC","Copra Cake","fabio" +"12439","China, Macao SAR","MAC","Sesameseed Cake","fabio" +"12440","China, Macao SAR","MAC","Oilseed Cakes, Other","fabio" +"12441","China, Macao SAR","MAC","Wine","fabio" +"12442","China, Macao SAR","MAC","Beer","fabio" +"12443","China, Macao SAR","MAC","Beverages, Fermented","fabio" +"12444","China, Macao SAR","MAC","Beverages, Alcoholic","fabio" +"12445","China, Macao SAR","MAC","Alcohol, Non-Food","fabio" +"12446","China, Macao SAR","MAC","Cotton lint","fabio" +"12447","China, Macao SAR","MAC","Cattle","fabio" +"12448","China, Macao SAR","MAC","Buffaloes","fabio" +"12449","China, Macao SAR","MAC","Sheep","fabio" +"12450","China, Macao SAR","MAC","Goats","fabio" +"12451","China, Macao SAR","MAC","Pigs","fabio" +"12452","China, Macao SAR","MAC","Poultry Birds","fabio" +"12453","China, Macao SAR","MAC","Horses","fabio" +"12454","China, Macao SAR","MAC","Asses","fabio" +"12455","China, Macao SAR","MAC","Mules","fabio" +"12456","China, Macao SAR","MAC","Camels","fabio" +"12457","China, Macao SAR","MAC","Camelids, other","fabio" +"12458","China, Macao SAR","MAC","Rabbits and hares","fabio" +"12459","China, Macao SAR","MAC","Rodents, other","fabio" +"12460","China, Macao SAR","MAC","Live animals, other","fabio" +"12461","China, Macao SAR","MAC","Milk - Excluding Butter","fabio" +"12462","China, Macao SAR","MAC","Butter, Ghee","fabio" +"12463","China, Macao SAR","MAC","Eggs","fabio" +"12464","China, Macao SAR","MAC","Wool (Clean Eq.)","fabio" +"12465","China, Macao SAR","MAC","Bovine Meat","fabio" +"12466","China, Macao SAR","MAC","Mutton & Goat Meat","fabio" +"12467","China, Macao SAR","MAC","Pigmeat","fabio" +"12468","China, Macao SAR","MAC","Poultry Meat","fabio" +"12469","China, Macao SAR","MAC","Meat, Other","fabio" +"12470","China, Macao SAR","MAC","Offals, Edible","fabio" +"12471","China, Macao SAR","MAC","Fats, Animals, Raw","fabio" +"12472","China, Macao SAR","MAC","Hides and skins","fabio" +"12473","China, Macao SAR","MAC","Meat Meal","fabio" +"12474","China, Macao SAR","MAC","Pet food","fabio" +"12475","China, Macao SAR","MAC","Honey","fabio" +"12476","China, Macao SAR","MAC","Silk","fabio" +"12477","China, Macao SAR","MAC","Fish, Seafood","fabio" +"12478","China, Macao SAR","MAC","Wood fuel","fabio" +"12479","China, Macao SAR","MAC","Industrial roundwood, coniferous","fabio" +"12480","China, Macao SAR","MAC","Industrial roundwood, non-coniferous","fabio" +"12481","Madagascar","MDG","Rice (Milled Equivalent)","fabio" +"12482","Madagascar","MDG","Wheat and products","fabio" +"12483","Madagascar","MDG","Barley and products","fabio" +"12484","Madagascar","MDG","Maize and products","fabio" +"12485","Madagascar","MDG","Rye and products","fabio" +"12486","Madagascar","MDG","Oats","fabio" +"12487","Madagascar","MDG","Millet and products","fabio" +"12488","Madagascar","MDG","Sorghum and products","fabio" +"12489","Madagascar","MDG","Cereals, Other","fabio" +"12490","Madagascar","MDG","Potatoes and products","fabio" +"12491","Madagascar","MDG","Cassava and products","fabio" +"12492","Madagascar","MDG","Sweet potatoes","fabio" +"12493","Madagascar","MDG","Roots, Other","fabio" +"12494","Madagascar","MDG","Yams","fabio" +"12495","Madagascar","MDG","Sugar cane","fabio" +"12496","Madagascar","MDG","Sugar beet","fabio" +"12497","Madagascar","MDG","Beans","fabio" +"12498","Madagascar","MDG","Peas","fabio" +"12499","Madagascar","MDG","Pulses, Other and products","fabio" +"12500","Madagascar","MDG","Nuts and products","fabio" +"12501","Madagascar","MDG","Soyabeans","fabio" +"12502","Madagascar","MDG","Groundnuts (Shelled Eq)","fabio" +"12503","Madagascar","MDG","Sunflower seed","fabio" +"12504","Madagascar","MDG","Rape and Mustardseed","fabio" +"12505","Madagascar","MDG","Seed cotton","fabio" +"12506","Madagascar","MDG","Coconuts - Incl Copra","fabio" +"12507","Madagascar","MDG","Sesame seed","fabio" +"12508","Madagascar","MDG","Oil, palm fruit","fabio" +"12509","Madagascar","MDG","Olives (including preserved)","fabio" +"12510","Madagascar","MDG","Oilcrops, Other","fabio" +"12511","Madagascar","MDG","Tomatoes and products","fabio" +"12512","Madagascar","MDG","Onions","fabio" +"12513","Madagascar","MDG","Vegetables, Other","fabio" +"12514","Madagascar","MDG","Oranges, Mandarines","fabio" +"12515","Madagascar","MDG","Lemons, Limes and products","fabio" +"12516","Madagascar","MDG","Grapefruit and products","fabio" +"12517","Madagascar","MDG","Citrus, Other","fabio" +"12518","Madagascar","MDG","Bananas","fabio" +"12519","Madagascar","MDG","Plantains","fabio" +"12520","Madagascar","MDG","Apples and products","fabio" +"12521","Madagascar","MDG","Pineapples and products","fabio" +"12522","Madagascar","MDG","Dates","fabio" +"12523","Madagascar","MDG","Grapes and products (excl wine)","fabio" +"12524","Madagascar","MDG","Fruits, Other","fabio" +"12525","Madagascar","MDG","Coffee and products","fabio" +"12526","Madagascar","MDG","Cocoa Beans and products","fabio" +"12527","Madagascar","MDG","Tea (including mate)","fabio" +"12528","Madagascar","MDG","Hops","fabio" +"12529","Madagascar","MDG","Pepper","fabio" +"12530","Madagascar","MDG","Pimento","fabio" +"12531","Madagascar","MDG","Cloves","fabio" +"12532","Madagascar","MDG","Spices, Other","fabio" +"12533","Madagascar","MDG","Jute","fabio" +"12534","Madagascar","MDG","Jute-Like Fibres","fabio" +"12535","Madagascar","MDG","Soft-Fibres, Other","fabio" +"12536","Madagascar","MDG","Sisal","fabio" +"12537","Madagascar","MDG","Abaca","fabio" +"12538","Madagascar","MDG","Hard Fibres, Other","fabio" +"12539","Madagascar","MDG","Tobacco","fabio" +"12540","Madagascar","MDG","Rubber","fabio" +"12541","Madagascar","MDG","Fodder crops","fabio" +"12542","Madagascar","MDG","Grazing","fabio" +"12543","Madagascar","MDG","Cottonseed","fabio" +"12544","Madagascar","MDG","Palm kernels","fabio" +"12545","Madagascar","MDG","Sugar non-centrifugal","fabio" +"12546","Madagascar","MDG","Molasses","fabio" +"12547","Madagascar","MDG","Sugar, Refined Equiv","fabio" +"12548","Madagascar","MDG","Sweeteners, Other","fabio" +"12549","Madagascar","MDG","Soyabean Oil","fabio" +"12550","Madagascar","MDG","Groundnut Oil","fabio" +"12551","Madagascar","MDG","Sunflowerseed Oil","fabio" +"12552","Madagascar","MDG","Rape and Mustard Oil","fabio" +"12553","Madagascar","MDG","Cottonseed Oil","fabio" +"12554","Madagascar","MDG","Palmkernel Oil","fabio" +"12555","Madagascar","MDG","Palm Oil","fabio" +"12556","Madagascar","MDG","Coconut Oil","fabio" +"12557","Madagascar","MDG","Sesameseed Oil","fabio" +"12558","Madagascar","MDG","Olive Oil","fabio" +"12559","Madagascar","MDG","Ricebran Oil","fabio" +"12560","Madagascar","MDG","Maize Germ Oil","fabio" +"12561","Madagascar","MDG","Oilcrops Oil, Other","fabio" +"12562","Madagascar","MDG","Soyabean Cake","fabio" +"12563","Madagascar","MDG","Groundnut Cake","fabio" +"12564","Madagascar","MDG","Sunflowerseed Cake","fabio" +"12565","Madagascar","MDG","Rape and Mustard Cake","fabio" +"12566","Madagascar","MDG","Cottonseed Cake","fabio" +"12567","Madagascar","MDG","Palmkernel Cake","fabio" +"12568","Madagascar","MDG","Copra Cake","fabio" +"12569","Madagascar","MDG","Sesameseed Cake","fabio" +"12570","Madagascar","MDG","Oilseed Cakes, Other","fabio" +"12571","Madagascar","MDG","Wine","fabio" +"12572","Madagascar","MDG","Beer","fabio" +"12573","Madagascar","MDG","Beverages, Fermented","fabio" +"12574","Madagascar","MDG","Beverages, Alcoholic","fabio" +"12575","Madagascar","MDG","Alcohol, Non-Food","fabio" +"12576","Madagascar","MDG","Cotton lint","fabio" +"12577","Madagascar","MDG","Cattle","fabio" +"12578","Madagascar","MDG","Buffaloes","fabio" +"12579","Madagascar","MDG","Sheep","fabio" +"12580","Madagascar","MDG","Goats","fabio" +"12581","Madagascar","MDG","Pigs","fabio" +"12582","Madagascar","MDG","Poultry Birds","fabio" +"12583","Madagascar","MDG","Horses","fabio" +"12584","Madagascar","MDG","Asses","fabio" +"12585","Madagascar","MDG","Mules","fabio" +"12586","Madagascar","MDG","Camels","fabio" +"12587","Madagascar","MDG","Camelids, other","fabio" +"12588","Madagascar","MDG","Rabbits and hares","fabio" +"12589","Madagascar","MDG","Rodents, other","fabio" +"12590","Madagascar","MDG","Live animals, other","fabio" +"12591","Madagascar","MDG","Milk - Excluding Butter","fabio" +"12592","Madagascar","MDG","Butter, Ghee","fabio" +"12593","Madagascar","MDG","Eggs","fabio" +"12594","Madagascar","MDG","Wool (Clean Eq.)","fabio" +"12595","Madagascar","MDG","Bovine Meat","fabio" +"12596","Madagascar","MDG","Mutton & Goat Meat","fabio" +"12597","Madagascar","MDG","Pigmeat","fabio" +"12598","Madagascar","MDG","Poultry Meat","fabio" +"12599","Madagascar","MDG","Meat, Other","fabio" +"12600","Madagascar","MDG","Offals, Edible","fabio" +"12601","Madagascar","MDG","Fats, Animals, Raw","fabio" +"12602","Madagascar","MDG","Hides and skins","fabio" +"12603","Madagascar","MDG","Meat Meal","fabio" +"12604","Madagascar","MDG","Pet food","fabio" +"12605","Madagascar","MDG","Honey","fabio" +"12606","Madagascar","MDG","Silk","fabio" +"12607","Madagascar","MDG","Fish, Seafood","fabio" +"12608","Madagascar","MDG","Wood fuel","fabio" +"12609","Madagascar","MDG","Industrial roundwood, coniferous","fabio" +"12610","Madagascar","MDG","Industrial roundwood, non-coniferous","fabio" +"12611","Malawi","MWI","Rice (Milled Equivalent)","fabio" +"12612","Malawi","MWI","Wheat and products","fabio" +"12613","Malawi","MWI","Barley and products","fabio" +"12614","Malawi","MWI","Maize and products","fabio" +"12615","Malawi","MWI","Rye and products","fabio" +"12616","Malawi","MWI","Oats","fabio" +"12617","Malawi","MWI","Millet and products","fabio" +"12618","Malawi","MWI","Sorghum and products","fabio" +"12619","Malawi","MWI","Cereals, Other","fabio" +"12620","Malawi","MWI","Potatoes and products","fabio" +"12621","Malawi","MWI","Cassava and products","fabio" +"12622","Malawi","MWI","Sweet potatoes","fabio" +"12623","Malawi","MWI","Roots, Other","fabio" +"12624","Malawi","MWI","Yams","fabio" +"12625","Malawi","MWI","Sugar cane","fabio" +"12626","Malawi","MWI","Sugar beet","fabio" +"12627","Malawi","MWI","Beans","fabio" +"12628","Malawi","MWI","Peas","fabio" +"12629","Malawi","MWI","Pulses, Other and products","fabio" +"12630","Malawi","MWI","Nuts and products","fabio" +"12631","Malawi","MWI","Soyabeans","fabio" +"12632","Malawi","MWI","Groundnuts (Shelled Eq)","fabio" +"12633","Malawi","MWI","Sunflower seed","fabio" +"12634","Malawi","MWI","Rape and Mustardseed","fabio" +"12635","Malawi","MWI","Seed cotton","fabio" +"12636","Malawi","MWI","Coconuts - Incl Copra","fabio" +"12637","Malawi","MWI","Sesame seed","fabio" +"12638","Malawi","MWI","Oil, palm fruit","fabio" +"12639","Malawi","MWI","Olives (including preserved)","fabio" +"12640","Malawi","MWI","Oilcrops, Other","fabio" +"12641","Malawi","MWI","Tomatoes and products","fabio" +"12642","Malawi","MWI","Onions","fabio" +"12643","Malawi","MWI","Vegetables, Other","fabio" +"12644","Malawi","MWI","Oranges, Mandarines","fabio" +"12645","Malawi","MWI","Lemons, Limes and products","fabio" +"12646","Malawi","MWI","Grapefruit and products","fabio" +"12647","Malawi","MWI","Citrus, Other","fabio" +"12648","Malawi","MWI","Bananas","fabio" +"12649","Malawi","MWI","Plantains","fabio" +"12650","Malawi","MWI","Apples and products","fabio" +"12651","Malawi","MWI","Pineapples and products","fabio" +"12652","Malawi","MWI","Dates","fabio" +"12653","Malawi","MWI","Grapes and products (excl wine)","fabio" +"12654","Malawi","MWI","Fruits, Other","fabio" +"12655","Malawi","MWI","Coffee and products","fabio" +"12656","Malawi","MWI","Cocoa Beans and products","fabio" +"12657","Malawi","MWI","Tea (including mate)","fabio" +"12658","Malawi","MWI","Hops","fabio" +"12659","Malawi","MWI","Pepper","fabio" +"12660","Malawi","MWI","Pimento","fabio" +"12661","Malawi","MWI","Cloves","fabio" +"12662","Malawi","MWI","Spices, Other","fabio" +"12663","Malawi","MWI","Jute","fabio" +"12664","Malawi","MWI","Jute-Like Fibres","fabio" +"12665","Malawi","MWI","Soft-Fibres, Other","fabio" +"12666","Malawi","MWI","Sisal","fabio" +"12667","Malawi","MWI","Abaca","fabio" +"12668","Malawi","MWI","Hard Fibres, Other","fabio" +"12669","Malawi","MWI","Tobacco","fabio" +"12670","Malawi","MWI","Rubber","fabio" +"12671","Malawi","MWI","Fodder crops","fabio" +"12672","Malawi","MWI","Grazing","fabio" +"12673","Malawi","MWI","Cottonseed","fabio" +"12674","Malawi","MWI","Palm kernels","fabio" +"12675","Malawi","MWI","Sugar non-centrifugal","fabio" +"12676","Malawi","MWI","Molasses","fabio" +"12677","Malawi","MWI","Sugar, Refined Equiv","fabio" +"12678","Malawi","MWI","Sweeteners, Other","fabio" +"12679","Malawi","MWI","Soyabean Oil","fabio" +"12680","Malawi","MWI","Groundnut Oil","fabio" +"12681","Malawi","MWI","Sunflowerseed Oil","fabio" +"12682","Malawi","MWI","Rape and Mustard Oil","fabio" +"12683","Malawi","MWI","Cottonseed Oil","fabio" +"12684","Malawi","MWI","Palmkernel Oil","fabio" +"12685","Malawi","MWI","Palm Oil","fabio" +"12686","Malawi","MWI","Coconut Oil","fabio" +"12687","Malawi","MWI","Sesameseed Oil","fabio" +"12688","Malawi","MWI","Olive Oil","fabio" +"12689","Malawi","MWI","Ricebran Oil","fabio" +"12690","Malawi","MWI","Maize Germ Oil","fabio" +"12691","Malawi","MWI","Oilcrops Oil, Other","fabio" +"12692","Malawi","MWI","Soyabean Cake","fabio" +"12693","Malawi","MWI","Groundnut Cake","fabio" +"12694","Malawi","MWI","Sunflowerseed Cake","fabio" +"12695","Malawi","MWI","Rape and Mustard Cake","fabio" +"12696","Malawi","MWI","Cottonseed Cake","fabio" +"12697","Malawi","MWI","Palmkernel Cake","fabio" +"12698","Malawi","MWI","Copra Cake","fabio" +"12699","Malawi","MWI","Sesameseed Cake","fabio" +"12700","Malawi","MWI","Oilseed Cakes, Other","fabio" +"12701","Malawi","MWI","Wine","fabio" +"12702","Malawi","MWI","Beer","fabio" +"12703","Malawi","MWI","Beverages, Fermented","fabio" +"12704","Malawi","MWI","Beverages, Alcoholic","fabio" +"12705","Malawi","MWI","Alcohol, Non-Food","fabio" +"12706","Malawi","MWI","Cotton lint","fabio" +"12707","Malawi","MWI","Cattle","fabio" +"12708","Malawi","MWI","Buffaloes","fabio" +"12709","Malawi","MWI","Sheep","fabio" +"12710","Malawi","MWI","Goats","fabio" +"12711","Malawi","MWI","Pigs","fabio" +"12712","Malawi","MWI","Poultry Birds","fabio" +"12713","Malawi","MWI","Horses","fabio" +"12714","Malawi","MWI","Asses","fabio" +"12715","Malawi","MWI","Mules","fabio" +"12716","Malawi","MWI","Camels","fabio" +"12717","Malawi","MWI","Camelids, other","fabio" +"12718","Malawi","MWI","Rabbits and hares","fabio" +"12719","Malawi","MWI","Rodents, other","fabio" +"12720","Malawi","MWI","Live animals, other","fabio" +"12721","Malawi","MWI","Milk - Excluding Butter","fabio" +"12722","Malawi","MWI","Butter, Ghee","fabio" +"12723","Malawi","MWI","Eggs","fabio" +"12724","Malawi","MWI","Wool (Clean Eq.)","fabio" +"12725","Malawi","MWI","Bovine Meat","fabio" +"12726","Malawi","MWI","Mutton & Goat Meat","fabio" +"12727","Malawi","MWI","Pigmeat","fabio" +"12728","Malawi","MWI","Poultry Meat","fabio" +"12729","Malawi","MWI","Meat, Other","fabio" +"12730","Malawi","MWI","Offals, Edible","fabio" +"12731","Malawi","MWI","Fats, Animals, Raw","fabio" +"12732","Malawi","MWI","Hides and skins","fabio" +"12733","Malawi","MWI","Meat Meal","fabio" +"12734","Malawi","MWI","Pet food","fabio" +"12735","Malawi","MWI","Honey","fabio" +"12736","Malawi","MWI","Silk","fabio" +"12737","Malawi","MWI","Fish, Seafood","fabio" +"12738","Malawi","MWI","Wood fuel","fabio" +"12739","Malawi","MWI","Industrial roundwood, coniferous","fabio" +"12740","Malawi","MWI","Industrial roundwood, non-coniferous","fabio" +"12741","Malaysia","MYS","Rice (Milled Equivalent)","fabio" +"12742","Malaysia","MYS","Wheat and products","fabio" +"12743","Malaysia","MYS","Barley and products","fabio" +"12744","Malaysia","MYS","Maize and products","fabio" +"12745","Malaysia","MYS","Rye and products","fabio" +"12746","Malaysia","MYS","Oats","fabio" +"12747","Malaysia","MYS","Millet and products","fabio" +"12748","Malaysia","MYS","Sorghum and products","fabio" +"12749","Malaysia","MYS","Cereals, Other","fabio" +"12750","Malaysia","MYS","Potatoes and products","fabio" +"12751","Malaysia","MYS","Cassava and products","fabio" +"12752","Malaysia","MYS","Sweet potatoes","fabio" +"12753","Malaysia","MYS","Roots, Other","fabio" +"12754","Malaysia","MYS","Yams","fabio" +"12755","Malaysia","MYS","Sugar cane","fabio" +"12756","Malaysia","MYS","Sugar beet","fabio" +"12757","Malaysia","MYS","Beans","fabio" +"12758","Malaysia","MYS","Peas","fabio" +"12759","Malaysia","MYS","Pulses, Other and products","fabio" +"12760","Malaysia","MYS","Nuts and products","fabio" +"12761","Malaysia","MYS","Soyabeans","fabio" +"12762","Malaysia","MYS","Groundnuts (Shelled Eq)","fabio" +"12763","Malaysia","MYS","Sunflower seed","fabio" +"12764","Malaysia","MYS","Rape and Mustardseed","fabio" +"12765","Malaysia","MYS","Seed cotton","fabio" +"12766","Malaysia","MYS","Coconuts - Incl Copra","fabio" +"12767","Malaysia","MYS","Sesame seed","fabio" +"12768","Malaysia","MYS","Oil, palm fruit","fabio" +"12769","Malaysia","MYS","Olives (including preserved)","fabio" +"12770","Malaysia","MYS","Oilcrops, Other","fabio" +"12771","Malaysia","MYS","Tomatoes and products","fabio" +"12772","Malaysia","MYS","Onions","fabio" +"12773","Malaysia","MYS","Vegetables, Other","fabio" +"12774","Malaysia","MYS","Oranges, Mandarines","fabio" +"12775","Malaysia","MYS","Lemons, Limes and products","fabio" +"12776","Malaysia","MYS","Grapefruit and products","fabio" +"12777","Malaysia","MYS","Citrus, Other","fabio" +"12778","Malaysia","MYS","Bananas","fabio" +"12779","Malaysia","MYS","Plantains","fabio" +"12780","Malaysia","MYS","Apples and products","fabio" +"12781","Malaysia","MYS","Pineapples and products","fabio" +"12782","Malaysia","MYS","Dates","fabio" +"12783","Malaysia","MYS","Grapes and products (excl wine)","fabio" +"12784","Malaysia","MYS","Fruits, Other","fabio" +"12785","Malaysia","MYS","Coffee and products","fabio" +"12786","Malaysia","MYS","Cocoa Beans and products","fabio" +"12787","Malaysia","MYS","Tea (including mate)","fabio" +"12788","Malaysia","MYS","Hops","fabio" +"12789","Malaysia","MYS","Pepper","fabio" +"12790","Malaysia","MYS","Pimento","fabio" +"12791","Malaysia","MYS","Cloves","fabio" +"12792","Malaysia","MYS","Spices, Other","fabio" +"12793","Malaysia","MYS","Jute","fabio" +"12794","Malaysia","MYS","Jute-Like Fibres","fabio" +"12795","Malaysia","MYS","Soft-Fibres, Other","fabio" +"12796","Malaysia","MYS","Sisal","fabio" +"12797","Malaysia","MYS","Abaca","fabio" +"12798","Malaysia","MYS","Hard Fibres, Other","fabio" +"12799","Malaysia","MYS","Tobacco","fabio" +"12800","Malaysia","MYS","Rubber","fabio" +"12801","Malaysia","MYS","Fodder crops","fabio" +"12802","Malaysia","MYS","Grazing","fabio" +"12803","Malaysia","MYS","Cottonseed","fabio" +"12804","Malaysia","MYS","Palm kernels","fabio" +"12805","Malaysia","MYS","Sugar non-centrifugal","fabio" +"12806","Malaysia","MYS","Molasses","fabio" +"12807","Malaysia","MYS","Sugar, Refined Equiv","fabio" +"12808","Malaysia","MYS","Sweeteners, Other","fabio" +"12809","Malaysia","MYS","Soyabean Oil","fabio" +"12810","Malaysia","MYS","Groundnut Oil","fabio" +"12811","Malaysia","MYS","Sunflowerseed Oil","fabio" +"12812","Malaysia","MYS","Rape and Mustard Oil","fabio" +"12813","Malaysia","MYS","Cottonseed Oil","fabio" +"12814","Malaysia","MYS","Palmkernel Oil","fabio" +"12815","Malaysia","MYS","Palm Oil","fabio" +"12816","Malaysia","MYS","Coconut Oil","fabio" +"12817","Malaysia","MYS","Sesameseed Oil","fabio" +"12818","Malaysia","MYS","Olive Oil","fabio" +"12819","Malaysia","MYS","Ricebran Oil","fabio" +"12820","Malaysia","MYS","Maize Germ Oil","fabio" +"12821","Malaysia","MYS","Oilcrops Oil, Other","fabio" +"12822","Malaysia","MYS","Soyabean Cake","fabio" +"12823","Malaysia","MYS","Groundnut Cake","fabio" +"12824","Malaysia","MYS","Sunflowerseed Cake","fabio" +"12825","Malaysia","MYS","Rape and Mustard Cake","fabio" +"12826","Malaysia","MYS","Cottonseed Cake","fabio" +"12827","Malaysia","MYS","Palmkernel Cake","fabio" +"12828","Malaysia","MYS","Copra Cake","fabio" +"12829","Malaysia","MYS","Sesameseed Cake","fabio" +"12830","Malaysia","MYS","Oilseed Cakes, Other","fabio" +"12831","Malaysia","MYS","Wine","fabio" +"12832","Malaysia","MYS","Beer","fabio" +"12833","Malaysia","MYS","Beverages, Fermented","fabio" +"12834","Malaysia","MYS","Beverages, Alcoholic","fabio" +"12835","Malaysia","MYS","Alcohol, Non-Food","fabio" +"12836","Malaysia","MYS","Cotton lint","fabio" +"12837","Malaysia","MYS","Cattle","fabio" +"12838","Malaysia","MYS","Buffaloes","fabio" +"12839","Malaysia","MYS","Sheep","fabio" +"12840","Malaysia","MYS","Goats","fabio" +"12841","Malaysia","MYS","Pigs","fabio" +"12842","Malaysia","MYS","Poultry Birds","fabio" +"12843","Malaysia","MYS","Horses","fabio" +"12844","Malaysia","MYS","Asses","fabio" +"12845","Malaysia","MYS","Mules","fabio" +"12846","Malaysia","MYS","Camels","fabio" +"12847","Malaysia","MYS","Camelids, other","fabio" +"12848","Malaysia","MYS","Rabbits and hares","fabio" +"12849","Malaysia","MYS","Rodents, other","fabio" +"12850","Malaysia","MYS","Live animals, other","fabio" +"12851","Malaysia","MYS","Milk - Excluding Butter","fabio" +"12852","Malaysia","MYS","Butter, Ghee","fabio" +"12853","Malaysia","MYS","Eggs","fabio" +"12854","Malaysia","MYS","Wool (Clean Eq.)","fabio" +"12855","Malaysia","MYS","Bovine Meat","fabio" +"12856","Malaysia","MYS","Mutton & Goat Meat","fabio" +"12857","Malaysia","MYS","Pigmeat","fabio" +"12858","Malaysia","MYS","Poultry Meat","fabio" +"12859","Malaysia","MYS","Meat, Other","fabio" +"12860","Malaysia","MYS","Offals, Edible","fabio" +"12861","Malaysia","MYS","Fats, Animals, Raw","fabio" +"12862","Malaysia","MYS","Hides and skins","fabio" +"12863","Malaysia","MYS","Meat Meal","fabio" +"12864","Malaysia","MYS","Pet food","fabio" +"12865","Malaysia","MYS","Honey","fabio" +"12866","Malaysia","MYS","Silk","fabio" +"12867","Malaysia","MYS","Fish, Seafood","fabio" +"12868","Malaysia","MYS","Wood fuel","fabio" +"12869","Malaysia","MYS","Industrial roundwood, coniferous","fabio" +"12870","Malaysia","MYS","Industrial roundwood, non-coniferous","fabio" +"12871","Maldives","MDV","Rice (Milled Equivalent)","fabio" +"12872","Maldives","MDV","Wheat and products","fabio" +"12873","Maldives","MDV","Barley and products","fabio" +"12874","Maldives","MDV","Maize and products","fabio" +"12875","Maldives","MDV","Rye and products","fabio" +"12876","Maldives","MDV","Oats","fabio" +"12877","Maldives","MDV","Millet and products","fabio" +"12878","Maldives","MDV","Sorghum and products","fabio" +"12879","Maldives","MDV","Cereals, Other","fabio" +"12880","Maldives","MDV","Potatoes and products","fabio" +"12881","Maldives","MDV","Cassava and products","fabio" +"12882","Maldives","MDV","Sweet potatoes","fabio" +"12883","Maldives","MDV","Roots, Other","fabio" +"12884","Maldives","MDV","Yams","fabio" +"12885","Maldives","MDV","Sugar cane","fabio" +"12886","Maldives","MDV","Sugar beet","fabio" +"12887","Maldives","MDV","Beans","fabio" +"12888","Maldives","MDV","Peas","fabio" +"12889","Maldives","MDV","Pulses, Other and products","fabio" +"12890","Maldives","MDV","Nuts and products","fabio" +"12891","Maldives","MDV","Soyabeans","fabio" +"12892","Maldives","MDV","Groundnuts (Shelled Eq)","fabio" +"12893","Maldives","MDV","Sunflower seed","fabio" +"12894","Maldives","MDV","Rape and Mustardseed","fabio" +"12895","Maldives","MDV","Seed cotton","fabio" +"12896","Maldives","MDV","Coconuts - Incl Copra","fabio" +"12897","Maldives","MDV","Sesame seed","fabio" +"12898","Maldives","MDV","Oil, palm fruit","fabio" +"12899","Maldives","MDV","Olives (including preserved)","fabio" +"12900","Maldives","MDV","Oilcrops, Other","fabio" +"12901","Maldives","MDV","Tomatoes and products","fabio" +"12902","Maldives","MDV","Onions","fabio" +"12903","Maldives","MDV","Vegetables, Other","fabio" +"12904","Maldives","MDV","Oranges, Mandarines","fabio" +"12905","Maldives","MDV","Lemons, Limes and products","fabio" +"12906","Maldives","MDV","Grapefruit and products","fabio" +"12907","Maldives","MDV","Citrus, Other","fabio" +"12908","Maldives","MDV","Bananas","fabio" +"12909","Maldives","MDV","Plantains","fabio" +"12910","Maldives","MDV","Apples and products","fabio" +"12911","Maldives","MDV","Pineapples and products","fabio" +"12912","Maldives","MDV","Dates","fabio" +"12913","Maldives","MDV","Grapes and products (excl wine)","fabio" +"12914","Maldives","MDV","Fruits, Other","fabio" +"12915","Maldives","MDV","Coffee and products","fabio" +"12916","Maldives","MDV","Cocoa Beans and products","fabio" +"12917","Maldives","MDV","Tea (including mate)","fabio" +"12918","Maldives","MDV","Hops","fabio" +"12919","Maldives","MDV","Pepper","fabio" +"12920","Maldives","MDV","Pimento","fabio" +"12921","Maldives","MDV","Cloves","fabio" +"12922","Maldives","MDV","Spices, Other","fabio" +"12923","Maldives","MDV","Jute","fabio" +"12924","Maldives","MDV","Jute-Like Fibres","fabio" +"12925","Maldives","MDV","Soft-Fibres, Other","fabio" +"12926","Maldives","MDV","Sisal","fabio" +"12927","Maldives","MDV","Abaca","fabio" +"12928","Maldives","MDV","Hard Fibres, Other","fabio" +"12929","Maldives","MDV","Tobacco","fabio" +"12930","Maldives","MDV","Rubber","fabio" +"12931","Maldives","MDV","Fodder crops","fabio" +"12932","Maldives","MDV","Grazing","fabio" +"12933","Maldives","MDV","Cottonseed","fabio" +"12934","Maldives","MDV","Palm kernels","fabio" +"12935","Maldives","MDV","Sugar non-centrifugal","fabio" +"12936","Maldives","MDV","Molasses","fabio" +"12937","Maldives","MDV","Sugar, Refined Equiv","fabio" +"12938","Maldives","MDV","Sweeteners, Other","fabio" +"12939","Maldives","MDV","Soyabean Oil","fabio" +"12940","Maldives","MDV","Groundnut Oil","fabio" +"12941","Maldives","MDV","Sunflowerseed Oil","fabio" +"12942","Maldives","MDV","Rape and Mustard Oil","fabio" +"12943","Maldives","MDV","Cottonseed Oil","fabio" +"12944","Maldives","MDV","Palmkernel Oil","fabio" +"12945","Maldives","MDV","Palm Oil","fabio" +"12946","Maldives","MDV","Coconut Oil","fabio" +"12947","Maldives","MDV","Sesameseed Oil","fabio" +"12948","Maldives","MDV","Olive Oil","fabio" +"12949","Maldives","MDV","Ricebran Oil","fabio" +"12950","Maldives","MDV","Maize Germ Oil","fabio" +"12951","Maldives","MDV","Oilcrops Oil, Other","fabio" +"12952","Maldives","MDV","Soyabean Cake","fabio" +"12953","Maldives","MDV","Groundnut Cake","fabio" +"12954","Maldives","MDV","Sunflowerseed Cake","fabio" +"12955","Maldives","MDV","Rape and Mustard Cake","fabio" +"12956","Maldives","MDV","Cottonseed Cake","fabio" +"12957","Maldives","MDV","Palmkernel Cake","fabio" +"12958","Maldives","MDV","Copra Cake","fabio" +"12959","Maldives","MDV","Sesameseed Cake","fabio" +"12960","Maldives","MDV","Oilseed Cakes, Other","fabio" +"12961","Maldives","MDV","Wine","fabio" +"12962","Maldives","MDV","Beer","fabio" +"12963","Maldives","MDV","Beverages, Fermented","fabio" +"12964","Maldives","MDV","Beverages, Alcoholic","fabio" +"12965","Maldives","MDV","Alcohol, Non-Food","fabio" +"12966","Maldives","MDV","Cotton lint","fabio" +"12967","Maldives","MDV","Cattle","fabio" +"12968","Maldives","MDV","Buffaloes","fabio" +"12969","Maldives","MDV","Sheep","fabio" +"12970","Maldives","MDV","Goats","fabio" +"12971","Maldives","MDV","Pigs","fabio" +"12972","Maldives","MDV","Poultry Birds","fabio" +"12973","Maldives","MDV","Horses","fabio" +"12974","Maldives","MDV","Asses","fabio" +"12975","Maldives","MDV","Mules","fabio" +"12976","Maldives","MDV","Camels","fabio" +"12977","Maldives","MDV","Camelids, other","fabio" +"12978","Maldives","MDV","Rabbits and hares","fabio" +"12979","Maldives","MDV","Rodents, other","fabio" +"12980","Maldives","MDV","Live animals, other","fabio" +"12981","Maldives","MDV","Milk - Excluding Butter","fabio" +"12982","Maldives","MDV","Butter, Ghee","fabio" +"12983","Maldives","MDV","Eggs","fabio" +"12984","Maldives","MDV","Wool (Clean Eq.)","fabio" +"12985","Maldives","MDV","Bovine Meat","fabio" +"12986","Maldives","MDV","Mutton & Goat Meat","fabio" +"12987","Maldives","MDV","Pigmeat","fabio" +"12988","Maldives","MDV","Poultry Meat","fabio" +"12989","Maldives","MDV","Meat, Other","fabio" +"12990","Maldives","MDV","Offals, Edible","fabio" +"12991","Maldives","MDV","Fats, Animals, Raw","fabio" +"12992","Maldives","MDV","Hides and skins","fabio" +"12993","Maldives","MDV","Meat Meal","fabio" +"12994","Maldives","MDV","Pet food","fabio" +"12995","Maldives","MDV","Honey","fabio" +"12996","Maldives","MDV","Silk","fabio" +"12997","Maldives","MDV","Fish, Seafood","fabio" +"12998","Maldives","MDV","Wood fuel","fabio" +"12999","Maldives","MDV","Industrial roundwood, coniferous","fabio" +"13000","Maldives","MDV","Industrial roundwood, non-coniferous","fabio" +"13001","Mali","MLI","Rice (Milled Equivalent)","fabio" +"13002","Mali","MLI","Wheat and products","fabio" +"13003","Mali","MLI","Barley and products","fabio" +"13004","Mali","MLI","Maize and products","fabio" +"13005","Mali","MLI","Rye and products","fabio" +"13006","Mali","MLI","Oats","fabio" +"13007","Mali","MLI","Millet and products","fabio" +"13008","Mali","MLI","Sorghum and products","fabio" +"13009","Mali","MLI","Cereals, Other","fabio" +"13010","Mali","MLI","Potatoes and products","fabio" +"13011","Mali","MLI","Cassava and products","fabio" +"13012","Mali","MLI","Sweet potatoes","fabio" +"13013","Mali","MLI","Roots, Other","fabio" +"13014","Mali","MLI","Yams","fabio" +"13015","Mali","MLI","Sugar cane","fabio" +"13016","Mali","MLI","Sugar beet","fabio" +"13017","Mali","MLI","Beans","fabio" +"13018","Mali","MLI","Peas","fabio" +"13019","Mali","MLI","Pulses, Other and products","fabio" +"13020","Mali","MLI","Nuts and products","fabio" +"13021","Mali","MLI","Soyabeans","fabio" +"13022","Mali","MLI","Groundnuts (Shelled Eq)","fabio" +"13023","Mali","MLI","Sunflower seed","fabio" +"13024","Mali","MLI","Rape and Mustardseed","fabio" +"13025","Mali","MLI","Seed cotton","fabio" +"13026","Mali","MLI","Coconuts - Incl Copra","fabio" +"13027","Mali","MLI","Sesame seed","fabio" +"13028","Mali","MLI","Oil, palm fruit","fabio" +"13029","Mali","MLI","Olives (including preserved)","fabio" +"13030","Mali","MLI","Oilcrops, Other","fabio" +"13031","Mali","MLI","Tomatoes and products","fabio" +"13032","Mali","MLI","Onions","fabio" +"13033","Mali","MLI","Vegetables, Other","fabio" +"13034","Mali","MLI","Oranges, Mandarines","fabio" +"13035","Mali","MLI","Lemons, Limes and products","fabio" +"13036","Mali","MLI","Grapefruit and products","fabio" +"13037","Mali","MLI","Citrus, Other","fabio" +"13038","Mali","MLI","Bananas","fabio" +"13039","Mali","MLI","Plantains","fabio" +"13040","Mali","MLI","Apples and products","fabio" +"13041","Mali","MLI","Pineapples and products","fabio" +"13042","Mali","MLI","Dates","fabio" +"13043","Mali","MLI","Grapes and products (excl wine)","fabio" +"13044","Mali","MLI","Fruits, Other","fabio" +"13045","Mali","MLI","Coffee and products","fabio" +"13046","Mali","MLI","Cocoa Beans and products","fabio" +"13047","Mali","MLI","Tea (including mate)","fabio" +"13048","Mali","MLI","Hops","fabio" +"13049","Mali","MLI","Pepper","fabio" +"13050","Mali","MLI","Pimento","fabio" +"13051","Mali","MLI","Cloves","fabio" +"13052","Mali","MLI","Spices, Other","fabio" +"13053","Mali","MLI","Jute","fabio" +"13054","Mali","MLI","Jute-Like Fibres","fabio" +"13055","Mali","MLI","Soft-Fibres, Other","fabio" +"13056","Mali","MLI","Sisal","fabio" +"13057","Mali","MLI","Abaca","fabio" +"13058","Mali","MLI","Hard Fibres, Other","fabio" +"13059","Mali","MLI","Tobacco","fabio" +"13060","Mali","MLI","Rubber","fabio" +"13061","Mali","MLI","Fodder crops","fabio" +"13062","Mali","MLI","Grazing","fabio" +"13063","Mali","MLI","Cottonseed","fabio" +"13064","Mali","MLI","Palm kernels","fabio" +"13065","Mali","MLI","Sugar non-centrifugal","fabio" +"13066","Mali","MLI","Molasses","fabio" +"13067","Mali","MLI","Sugar, Refined Equiv","fabio" +"13068","Mali","MLI","Sweeteners, Other","fabio" +"13069","Mali","MLI","Soyabean Oil","fabio" +"13070","Mali","MLI","Groundnut Oil","fabio" +"13071","Mali","MLI","Sunflowerseed Oil","fabio" +"13072","Mali","MLI","Rape and Mustard Oil","fabio" +"13073","Mali","MLI","Cottonseed Oil","fabio" +"13074","Mali","MLI","Palmkernel Oil","fabio" +"13075","Mali","MLI","Palm Oil","fabio" +"13076","Mali","MLI","Coconut Oil","fabio" +"13077","Mali","MLI","Sesameseed Oil","fabio" +"13078","Mali","MLI","Olive Oil","fabio" +"13079","Mali","MLI","Ricebran Oil","fabio" +"13080","Mali","MLI","Maize Germ Oil","fabio" +"13081","Mali","MLI","Oilcrops Oil, Other","fabio" +"13082","Mali","MLI","Soyabean Cake","fabio" +"13083","Mali","MLI","Groundnut Cake","fabio" +"13084","Mali","MLI","Sunflowerseed Cake","fabio" +"13085","Mali","MLI","Rape and Mustard Cake","fabio" +"13086","Mali","MLI","Cottonseed Cake","fabio" +"13087","Mali","MLI","Palmkernel Cake","fabio" +"13088","Mali","MLI","Copra Cake","fabio" +"13089","Mali","MLI","Sesameseed Cake","fabio" +"13090","Mali","MLI","Oilseed Cakes, Other","fabio" +"13091","Mali","MLI","Wine","fabio" +"13092","Mali","MLI","Beer","fabio" +"13093","Mali","MLI","Beverages, Fermented","fabio" +"13094","Mali","MLI","Beverages, Alcoholic","fabio" +"13095","Mali","MLI","Alcohol, Non-Food","fabio" +"13096","Mali","MLI","Cotton lint","fabio" +"13097","Mali","MLI","Cattle","fabio" +"13098","Mali","MLI","Buffaloes","fabio" +"13099","Mali","MLI","Sheep","fabio" +"13100","Mali","MLI","Goats","fabio" +"13101","Mali","MLI","Pigs","fabio" +"13102","Mali","MLI","Poultry Birds","fabio" +"13103","Mali","MLI","Horses","fabio" +"13104","Mali","MLI","Asses","fabio" +"13105","Mali","MLI","Mules","fabio" +"13106","Mali","MLI","Camels","fabio" +"13107","Mali","MLI","Camelids, other","fabio" +"13108","Mali","MLI","Rabbits and hares","fabio" +"13109","Mali","MLI","Rodents, other","fabio" +"13110","Mali","MLI","Live animals, other","fabio" +"13111","Mali","MLI","Milk - Excluding Butter","fabio" +"13112","Mali","MLI","Butter, Ghee","fabio" +"13113","Mali","MLI","Eggs","fabio" +"13114","Mali","MLI","Wool (Clean Eq.)","fabio" +"13115","Mali","MLI","Bovine Meat","fabio" +"13116","Mali","MLI","Mutton & Goat Meat","fabio" +"13117","Mali","MLI","Pigmeat","fabio" +"13118","Mali","MLI","Poultry Meat","fabio" +"13119","Mali","MLI","Meat, Other","fabio" +"13120","Mali","MLI","Offals, Edible","fabio" +"13121","Mali","MLI","Fats, Animals, Raw","fabio" +"13122","Mali","MLI","Hides and skins","fabio" +"13123","Mali","MLI","Meat Meal","fabio" +"13124","Mali","MLI","Pet food","fabio" +"13125","Mali","MLI","Honey","fabio" +"13126","Mali","MLI","Silk","fabio" +"13127","Mali","MLI","Fish, Seafood","fabio" +"13128","Mali","MLI","Wood fuel","fabio" +"13129","Mali","MLI","Industrial roundwood, coniferous","fabio" +"13130","Mali","MLI","Industrial roundwood, non-coniferous","fabio" +"13131","Malta","MLT","Rice (Milled Equivalent)","fabio" +"13132","Malta","MLT","Wheat and products","fabio" +"13133","Malta","MLT","Barley and products","fabio" +"13134","Malta","MLT","Maize and products","fabio" +"13135","Malta","MLT","Rye and products","fabio" +"13136","Malta","MLT","Oats","fabio" +"13137","Malta","MLT","Millet and products","fabio" +"13138","Malta","MLT","Sorghum and products","fabio" +"13139","Malta","MLT","Cereals, Other","fabio" +"13140","Malta","MLT","Potatoes and products","fabio" +"13141","Malta","MLT","Cassava and products","fabio" +"13142","Malta","MLT","Sweet potatoes","fabio" +"13143","Malta","MLT","Roots, Other","fabio" +"13144","Malta","MLT","Yams","fabio" +"13145","Malta","MLT","Sugar cane","fabio" +"13146","Malta","MLT","Sugar beet","fabio" +"13147","Malta","MLT","Beans","fabio" +"13148","Malta","MLT","Peas","fabio" +"13149","Malta","MLT","Pulses, Other and products","fabio" +"13150","Malta","MLT","Nuts and products","fabio" +"13151","Malta","MLT","Soyabeans","fabio" +"13152","Malta","MLT","Groundnuts (Shelled Eq)","fabio" +"13153","Malta","MLT","Sunflower seed","fabio" +"13154","Malta","MLT","Rape and Mustardseed","fabio" +"13155","Malta","MLT","Seed cotton","fabio" +"13156","Malta","MLT","Coconuts - Incl Copra","fabio" +"13157","Malta","MLT","Sesame seed","fabio" +"13158","Malta","MLT","Oil, palm fruit","fabio" +"13159","Malta","MLT","Olives (including preserved)","fabio" +"13160","Malta","MLT","Oilcrops, Other","fabio" +"13161","Malta","MLT","Tomatoes and products","fabio" +"13162","Malta","MLT","Onions","fabio" +"13163","Malta","MLT","Vegetables, Other","fabio" +"13164","Malta","MLT","Oranges, Mandarines","fabio" +"13165","Malta","MLT","Lemons, Limes and products","fabio" +"13166","Malta","MLT","Grapefruit and products","fabio" +"13167","Malta","MLT","Citrus, Other","fabio" +"13168","Malta","MLT","Bananas","fabio" +"13169","Malta","MLT","Plantains","fabio" +"13170","Malta","MLT","Apples and products","fabio" +"13171","Malta","MLT","Pineapples and products","fabio" +"13172","Malta","MLT","Dates","fabio" +"13173","Malta","MLT","Grapes and products (excl wine)","fabio" +"13174","Malta","MLT","Fruits, Other","fabio" +"13175","Malta","MLT","Coffee and products","fabio" +"13176","Malta","MLT","Cocoa Beans and products","fabio" +"13177","Malta","MLT","Tea (including mate)","fabio" +"13178","Malta","MLT","Hops","fabio" +"13179","Malta","MLT","Pepper","fabio" +"13180","Malta","MLT","Pimento","fabio" +"13181","Malta","MLT","Cloves","fabio" +"13182","Malta","MLT","Spices, Other","fabio" +"13183","Malta","MLT","Jute","fabio" +"13184","Malta","MLT","Jute-Like Fibres","fabio" +"13185","Malta","MLT","Soft-Fibres, Other","fabio" +"13186","Malta","MLT","Sisal","fabio" +"13187","Malta","MLT","Abaca","fabio" +"13188","Malta","MLT","Hard Fibres, Other","fabio" +"13189","Malta","MLT","Tobacco","fabio" +"13190","Malta","MLT","Rubber","fabio" +"13191","Malta","MLT","Fodder crops","fabio" +"13192","Malta","MLT","Grazing","fabio" +"13193","Malta","MLT","Cottonseed","fabio" +"13194","Malta","MLT","Palm kernels","fabio" +"13195","Malta","MLT","Sugar non-centrifugal","fabio" +"13196","Malta","MLT","Molasses","fabio" +"13197","Malta","MLT","Sugar, Refined Equiv","fabio" +"13198","Malta","MLT","Sweeteners, Other","fabio" +"13199","Malta","MLT","Soyabean Oil","fabio" +"13200","Malta","MLT","Groundnut Oil","fabio" +"13201","Malta","MLT","Sunflowerseed Oil","fabio" +"13202","Malta","MLT","Rape and Mustard Oil","fabio" +"13203","Malta","MLT","Cottonseed Oil","fabio" +"13204","Malta","MLT","Palmkernel Oil","fabio" +"13205","Malta","MLT","Palm Oil","fabio" +"13206","Malta","MLT","Coconut Oil","fabio" +"13207","Malta","MLT","Sesameseed Oil","fabio" +"13208","Malta","MLT","Olive Oil","fabio" +"13209","Malta","MLT","Ricebran Oil","fabio" +"13210","Malta","MLT","Maize Germ Oil","fabio" +"13211","Malta","MLT","Oilcrops Oil, Other","fabio" +"13212","Malta","MLT","Soyabean Cake","fabio" +"13213","Malta","MLT","Groundnut Cake","fabio" +"13214","Malta","MLT","Sunflowerseed Cake","fabio" +"13215","Malta","MLT","Rape and Mustard Cake","fabio" +"13216","Malta","MLT","Cottonseed Cake","fabio" +"13217","Malta","MLT","Palmkernel Cake","fabio" +"13218","Malta","MLT","Copra Cake","fabio" +"13219","Malta","MLT","Sesameseed Cake","fabio" +"13220","Malta","MLT","Oilseed Cakes, Other","fabio" +"13221","Malta","MLT","Wine","fabio" +"13222","Malta","MLT","Beer","fabio" +"13223","Malta","MLT","Beverages, Fermented","fabio" +"13224","Malta","MLT","Beverages, Alcoholic","fabio" +"13225","Malta","MLT","Alcohol, Non-Food","fabio" +"13226","Malta","MLT","Cotton lint","fabio" +"13227","Malta","MLT","Cattle","fabio" +"13228","Malta","MLT","Buffaloes","fabio" +"13229","Malta","MLT","Sheep","fabio" +"13230","Malta","MLT","Goats","fabio" +"13231","Malta","MLT","Pigs","fabio" +"13232","Malta","MLT","Poultry Birds","fabio" +"13233","Malta","MLT","Horses","fabio" +"13234","Malta","MLT","Asses","fabio" +"13235","Malta","MLT","Mules","fabio" +"13236","Malta","MLT","Camels","fabio" +"13237","Malta","MLT","Camelids, other","fabio" +"13238","Malta","MLT","Rabbits and hares","fabio" +"13239","Malta","MLT","Rodents, other","fabio" +"13240","Malta","MLT","Live animals, other","fabio" +"13241","Malta","MLT","Milk - Excluding Butter","fabio" +"13242","Malta","MLT","Butter, Ghee","fabio" +"13243","Malta","MLT","Eggs","fabio" +"13244","Malta","MLT","Wool (Clean Eq.)","fabio" +"13245","Malta","MLT","Bovine Meat","fabio" +"13246","Malta","MLT","Mutton & Goat Meat","fabio" +"13247","Malta","MLT","Pigmeat","fabio" +"13248","Malta","MLT","Poultry Meat","fabio" +"13249","Malta","MLT","Meat, Other","fabio" +"13250","Malta","MLT","Offals, Edible","fabio" +"13251","Malta","MLT","Fats, Animals, Raw","fabio" +"13252","Malta","MLT","Hides and skins","fabio" +"13253","Malta","MLT","Meat Meal","fabio" +"13254","Malta","MLT","Pet food","fabio" +"13255","Malta","MLT","Honey","fabio" +"13256","Malta","MLT","Silk","fabio" +"13257","Malta","MLT","Fish, Seafood","fabio" +"13258","Malta","MLT","Wood fuel","fabio" +"13259","Malta","MLT","Industrial roundwood, coniferous","fabio" +"13260","Malta","MLT","Industrial roundwood, non-coniferous","fabio" +"13261","Mauritania","MRT","Rice (Milled Equivalent)","fabio" +"13262","Mauritania","MRT","Wheat and products","fabio" +"13263","Mauritania","MRT","Barley and products","fabio" +"13264","Mauritania","MRT","Maize and products","fabio" +"13265","Mauritania","MRT","Rye and products","fabio" +"13266","Mauritania","MRT","Oats","fabio" +"13267","Mauritania","MRT","Millet and products","fabio" +"13268","Mauritania","MRT","Sorghum and products","fabio" +"13269","Mauritania","MRT","Cereals, Other","fabio" +"13270","Mauritania","MRT","Potatoes and products","fabio" +"13271","Mauritania","MRT","Cassava and products","fabio" +"13272","Mauritania","MRT","Sweet potatoes","fabio" +"13273","Mauritania","MRT","Roots, Other","fabio" +"13274","Mauritania","MRT","Yams","fabio" +"13275","Mauritania","MRT","Sugar cane","fabio" +"13276","Mauritania","MRT","Sugar beet","fabio" +"13277","Mauritania","MRT","Beans","fabio" +"13278","Mauritania","MRT","Peas","fabio" +"13279","Mauritania","MRT","Pulses, Other and products","fabio" +"13280","Mauritania","MRT","Nuts and products","fabio" +"13281","Mauritania","MRT","Soyabeans","fabio" +"13282","Mauritania","MRT","Groundnuts (Shelled Eq)","fabio" +"13283","Mauritania","MRT","Sunflower seed","fabio" +"13284","Mauritania","MRT","Rape and Mustardseed","fabio" +"13285","Mauritania","MRT","Seed cotton","fabio" +"13286","Mauritania","MRT","Coconuts - Incl Copra","fabio" +"13287","Mauritania","MRT","Sesame seed","fabio" +"13288","Mauritania","MRT","Oil, palm fruit","fabio" +"13289","Mauritania","MRT","Olives (including preserved)","fabio" +"13290","Mauritania","MRT","Oilcrops, Other","fabio" +"13291","Mauritania","MRT","Tomatoes and products","fabio" +"13292","Mauritania","MRT","Onions","fabio" +"13293","Mauritania","MRT","Vegetables, Other","fabio" +"13294","Mauritania","MRT","Oranges, Mandarines","fabio" +"13295","Mauritania","MRT","Lemons, Limes and products","fabio" +"13296","Mauritania","MRT","Grapefruit and products","fabio" +"13297","Mauritania","MRT","Citrus, Other","fabio" +"13298","Mauritania","MRT","Bananas","fabio" +"13299","Mauritania","MRT","Plantains","fabio" +"13300","Mauritania","MRT","Apples and products","fabio" +"13301","Mauritania","MRT","Pineapples and products","fabio" +"13302","Mauritania","MRT","Dates","fabio" +"13303","Mauritania","MRT","Grapes and products (excl wine)","fabio" +"13304","Mauritania","MRT","Fruits, Other","fabio" +"13305","Mauritania","MRT","Coffee and products","fabio" +"13306","Mauritania","MRT","Cocoa Beans and products","fabio" +"13307","Mauritania","MRT","Tea (including mate)","fabio" +"13308","Mauritania","MRT","Hops","fabio" +"13309","Mauritania","MRT","Pepper","fabio" +"13310","Mauritania","MRT","Pimento","fabio" +"13311","Mauritania","MRT","Cloves","fabio" +"13312","Mauritania","MRT","Spices, Other","fabio" +"13313","Mauritania","MRT","Jute","fabio" +"13314","Mauritania","MRT","Jute-Like Fibres","fabio" +"13315","Mauritania","MRT","Soft-Fibres, Other","fabio" +"13316","Mauritania","MRT","Sisal","fabio" +"13317","Mauritania","MRT","Abaca","fabio" +"13318","Mauritania","MRT","Hard Fibres, Other","fabio" +"13319","Mauritania","MRT","Tobacco","fabio" +"13320","Mauritania","MRT","Rubber","fabio" +"13321","Mauritania","MRT","Fodder crops","fabio" +"13322","Mauritania","MRT","Grazing","fabio" +"13323","Mauritania","MRT","Cottonseed","fabio" +"13324","Mauritania","MRT","Palm kernels","fabio" +"13325","Mauritania","MRT","Sugar non-centrifugal","fabio" +"13326","Mauritania","MRT","Molasses","fabio" +"13327","Mauritania","MRT","Sugar, Refined Equiv","fabio" +"13328","Mauritania","MRT","Sweeteners, Other","fabio" +"13329","Mauritania","MRT","Soyabean Oil","fabio" +"13330","Mauritania","MRT","Groundnut Oil","fabio" +"13331","Mauritania","MRT","Sunflowerseed Oil","fabio" +"13332","Mauritania","MRT","Rape and Mustard Oil","fabio" +"13333","Mauritania","MRT","Cottonseed Oil","fabio" +"13334","Mauritania","MRT","Palmkernel Oil","fabio" +"13335","Mauritania","MRT","Palm Oil","fabio" +"13336","Mauritania","MRT","Coconut Oil","fabio" +"13337","Mauritania","MRT","Sesameseed Oil","fabio" +"13338","Mauritania","MRT","Olive Oil","fabio" +"13339","Mauritania","MRT","Ricebran Oil","fabio" +"13340","Mauritania","MRT","Maize Germ Oil","fabio" +"13341","Mauritania","MRT","Oilcrops Oil, Other","fabio" +"13342","Mauritania","MRT","Soyabean Cake","fabio" +"13343","Mauritania","MRT","Groundnut Cake","fabio" +"13344","Mauritania","MRT","Sunflowerseed Cake","fabio" +"13345","Mauritania","MRT","Rape and Mustard Cake","fabio" +"13346","Mauritania","MRT","Cottonseed Cake","fabio" +"13347","Mauritania","MRT","Palmkernel Cake","fabio" +"13348","Mauritania","MRT","Copra Cake","fabio" +"13349","Mauritania","MRT","Sesameseed Cake","fabio" +"13350","Mauritania","MRT","Oilseed Cakes, Other","fabio" +"13351","Mauritania","MRT","Wine","fabio" +"13352","Mauritania","MRT","Beer","fabio" +"13353","Mauritania","MRT","Beverages, Fermented","fabio" +"13354","Mauritania","MRT","Beverages, Alcoholic","fabio" +"13355","Mauritania","MRT","Alcohol, Non-Food","fabio" +"13356","Mauritania","MRT","Cotton lint","fabio" +"13357","Mauritania","MRT","Cattle","fabio" +"13358","Mauritania","MRT","Buffaloes","fabio" +"13359","Mauritania","MRT","Sheep","fabio" +"13360","Mauritania","MRT","Goats","fabio" +"13361","Mauritania","MRT","Pigs","fabio" +"13362","Mauritania","MRT","Poultry Birds","fabio" +"13363","Mauritania","MRT","Horses","fabio" +"13364","Mauritania","MRT","Asses","fabio" +"13365","Mauritania","MRT","Mules","fabio" +"13366","Mauritania","MRT","Camels","fabio" +"13367","Mauritania","MRT","Camelids, other","fabio" +"13368","Mauritania","MRT","Rabbits and hares","fabio" +"13369","Mauritania","MRT","Rodents, other","fabio" +"13370","Mauritania","MRT","Live animals, other","fabio" +"13371","Mauritania","MRT","Milk - Excluding Butter","fabio" +"13372","Mauritania","MRT","Butter, Ghee","fabio" +"13373","Mauritania","MRT","Eggs","fabio" +"13374","Mauritania","MRT","Wool (Clean Eq.)","fabio" +"13375","Mauritania","MRT","Bovine Meat","fabio" +"13376","Mauritania","MRT","Mutton & Goat Meat","fabio" +"13377","Mauritania","MRT","Pigmeat","fabio" +"13378","Mauritania","MRT","Poultry Meat","fabio" +"13379","Mauritania","MRT","Meat, Other","fabio" +"13380","Mauritania","MRT","Offals, Edible","fabio" +"13381","Mauritania","MRT","Fats, Animals, Raw","fabio" +"13382","Mauritania","MRT","Hides and skins","fabio" +"13383","Mauritania","MRT","Meat Meal","fabio" +"13384","Mauritania","MRT","Pet food","fabio" +"13385","Mauritania","MRT","Honey","fabio" +"13386","Mauritania","MRT","Silk","fabio" +"13387","Mauritania","MRT","Fish, Seafood","fabio" +"13388","Mauritania","MRT","Wood fuel","fabio" +"13389","Mauritania","MRT","Industrial roundwood, coniferous","fabio" +"13390","Mauritania","MRT","Industrial roundwood, non-coniferous","fabio" +"13391","Mauritius","MUS","Rice (Milled Equivalent)","fabio" +"13392","Mauritius","MUS","Wheat and products","fabio" +"13393","Mauritius","MUS","Barley and products","fabio" +"13394","Mauritius","MUS","Maize and products","fabio" +"13395","Mauritius","MUS","Rye and products","fabio" +"13396","Mauritius","MUS","Oats","fabio" +"13397","Mauritius","MUS","Millet and products","fabio" +"13398","Mauritius","MUS","Sorghum and products","fabio" +"13399","Mauritius","MUS","Cereals, Other","fabio" +"13400","Mauritius","MUS","Potatoes and products","fabio" +"13401","Mauritius","MUS","Cassava and products","fabio" +"13402","Mauritius","MUS","Sweet potatoes","fabio" +"13403","Mauritius","MUS","Roots, Other","fabio" +"13404","Mauritius","MUS","Yams","fabio" +"13405","Mauritius","MUS","Sugar cane","fabio" +"13406","Mauritius","MUS","Sugar beet","fabio" +"13407","Mauritius","MUS","Beans","fabio" +"13408","Mauritius","MUS","Peas","fabio" +"13409","Mauritius","MUS","Pulses, Other and products","fabio" +"13410","Mauritius","MUS","Nuts and products","fabio" +"13411","Mauritius","MUS","Soyabeans","fabio" +"13412","Mauritius","MUS","Groundnuts (Shelled Eq)","fabio" +"13413","Mauritius","MUS","Sunflower seed","fabio" +"13414","Mauritius","MUS","Rape and Mustardseed","fabio" +"13415","Mauritius","MUS","Seed cotton","fabio" +"13416","Mauritius","MUS","Coconuts - Incl Copra","fabio" +"13417","Mauritius","MUS","Sesame seed","fabio" +"13418","Mauritius","MUS","Oil, palm fruit","fabio" +"13419","Mauritius","MUS","Olives (including preserved)","fabio" +"13420","Mauritius","MUS","Oilcrops, Other","fabio" +"13421","Mauritius","MUS","Tomatoes and products","fabio" +"13422","Mauritius","MUS","Onions","fabio" +"13423","Mauritius","MUS","Vegetables, Other","fabio" +"13424","Mauritius","MUS","Oranges, Mandarines","fabio" +"13425","Mauritius","MUS","Lemons, Limes and products","fabio" +"13426","Mauritius","MUS","Grapefruit and products","fabio" +"13427","Mauritius","MUS","Citrus, Other","fabio" +"13428","Mauritius","MUS","Bananas","fabio" +"13429","Mauritius","MUS","Plantains","fabio" +"13430","Mauritius","MUS","Apples and products","fabio" +"13431","Mauritius","MUS","Pineapples and products","fabio" +"13432","Mauritius","MUS","Dates","fabio" +"13433","Mauritius","MUS","Grapes and products (excl wine)","fabio" +"13434","Mauritius","MUS","Fruits, Other","fabio" +"13435","Mauritius","MUS","Coffee and products","fabio" +"13436","Mauritius","MUS","Cocoa Beans and products","fabio" +"13437","Mauritius","MUS","Tea (including mate)","fabio" +"13438","Mauritius","MUS","Hops","fabio" +"13439","Mauritius","MUS","Pepper","fabio" +"13440","Mauritius","MUS","Pimento","fabio" +"13441","Mauritius","MUS","Cloves","fabio" +"13442","Mauritius","MUS","Spices, Other","fabio" +"13443","Mauritius","MUS","Jute","fabio" +"13444","Mauritius","MUS","Jute-Like Fibres","fabio" +"13445","Mauritius","MUS","Soft-Fibres, Other","fabio" +"13446","Mauritius","MUS","Sisal","fabio" +"13447","Mauritius","MUS","Abaca","fabio" +"13448","Mauritius","MUS","Hard Fibres, Other","fabio" +"13449","Mauritius","MUS","Tobacco","fabio" +"13450","Mauritius","MUS","Rubber","fabio" +"13451","Mauritius","MUS","Fodder crops","fabio" +"13452","Mauritius","MUS","Grazing","fabio" +"13453","Mauritius","MUS","Cottonseed","fabio" +"13454","Mauritius","MUS","Palm kernels","fabio" +"13455","Mauritius","MUS","Sugar non-centrifugal","fabio" +"13456","Mauritius","MUS","Molasses","fabio" +"13457","Mauritius","MUS","Sugar, Refined Equiv","fabio" +"13458","Mauritius","MUS","Sweeteners, Other","fabio" +"13459","Mauritius","MUS","Soyabean Oil","fabio" +"13460","Mauritius","MUS","Groundnut Oil","fabio" +"13461","Mauritius","MUS","Sunflowerseed Oil","fabio" +"13462","Mauritius","MUS","Rape and Mustard Oil","fabio" +"13463","Mauritius","MUS","Cottonseed Oil","fabio" +"13464","Mauritius","MUS","Palmkernel Oil","fabio" +"13465","Mauritius","MUS","Palm Oil","fabio" +"13466","Mauritius","MUS","Coconut Oil","fabio" +"13467","Mauritius","MUS","Sesameseed Oil","fabio" +"13468","Mauritius","MUS","Olive Oil","fabio" +"13469","Mauritius","MUS","Ricebran Oil","fabio" +"13470","Mauritius","MUS","Maize Germ Oil","fabio" +"13471","Mauritius","MUS","Oilcrops Oil, Other","fabio" +"13472","Mauritius","MUS","Soyabean Cake","fabio" +"13473","Mauritius","MUS","Groundnut Cake","fabio" +"13474","Mauritius","MUS","Sunflowerseed Cake","fabio" +"13475","Mauritius","MUS","Rape and Mustard Cake","fabio" +"13476","Mauritius","MUS","Cottonseed Cake","fabio" +"13477","Mauritius","MUS","Palmkernel Cake","fabio" +"13478","Mauritius","MUS","Copra Cake","fabio" +"13479","Mauritius","MUS","Sesameseed Cake","fabio" +"13480","Mauritius","MUS","Oilseed Cakes, Other","fabio" +"13481","Mauritius","MUS","Wine","fabio" +"13482","Mauritius","MUS","Beer","fabio" +"13483","Mauritius","MUS","Beverages, Fermented","fabio" +"13484","Mauritius","MUS","Beverages, Alcoholic","fabio" +"13485","Mauritius","MUS","Alcohol, Non-Food","fabio" +"13486","Mauritius","MUS","Cotton lint","fabio" +"13487","Mauritius","MUS","Cattle","fabio" +"13488","Mauritius","MUS","Buffaloes","fabio" +"13489","Mauritius","MUS","Sheep","fabio" +"13490","Mauritius","MUS","Goats","fabio" +"13491","Mauritius","MUS","Pigs","fabio" +"13492","Mauritius","MUS","Poultry Birds","fabio" +"13493","Mauritius","MUS","Horses","fabio" +"13494","Mauritius","MUS","Asses","fabio" +"13495","Mauritius","MUS","Mules","fabio" +"13496","Mauritius","MUS","Camels","fabio" +"13497","Mauritius","MUS","Camelids, other","fabio" +"13498","Mauritius","MUS","Rabbits and hares","fabio" +"13499","Mauritius","MUS","Rodents, other","fabio" +"13500","Mauritius","MUS","Live animals, other","fabio" +"13501","Mauritius","MUS","Milk - Excluding Butter","fabio" +"13502","Mauritius","MUS","Butter, Ghee","fabio" +"13503","Mauritius","MUS","Eggs","fabio" +"13504","Mauritius","MUS","Wool (Clean Eq.)","fabio" +"13505","Mauritius","MUS","Bovine Meat","fabio" +"13506","Mauritius","MUS","Mutton & Goat Meat","fabio" +"13507","Mauritius","MUS","Pigmeat","fabio" +"13508","Mauritius","MUS","Poultry Meat","fabio" +"13509","Mauritius","MUS","Meat, Other","fabio" +"13510","Mauritius","MUS","Offals, Edible","fabio" +"13511","Mauritius","MUS","Fats, Animals, Raw","fabio" +"13512","Mauritius","MUS","Hides and skins","fabio" +"13513","Mauritius","MUS","Meat Meal","fabio" +"13514","Mauritius","MUS","Pet food","fabio" +"13515","Mauritius","MUS","Honey","fabio" +"13516","Mauritius","MUS","Silk","fabio" +"13517","Mauritius","MUS","Fish, Seafood","fabio" +"13518","Mauritius","MUS","Wood fuel","fabio" +"13519","Mauritius","MUS","Industrial roundwood, coniferous","fabio" +"13520","Mauritius","MUS","Industrial roundwood, non-coniferous","fabio" +"13521","Mexico","MEX","Rice (Milled Equivalent)","fabio" +"13522","Mexico","MEX","Wheat and products","fabio" +"13523","Mexico","MEX","Barley and products","fabio" +"13524","Mexico","MEX","Maize and products","fabio" +"13525","Mexico","MEX","Rye and products","fabio" +"13526","Mexico","MEX","Oats","fabio" +"13527","Mexico","MEX","Millet and products","fabio" +"13528","Mexico","MEX","Sorghum and products","fabio" +"13529","Mexico","MEX","Cereals, Other","fabio" +"13530","Mexico","MEX","Potatoes and products","fabio" +"13531","Mexico","MEX","Cassava and products","fabio" +"13532","Mexico","MEX","Sweet potatoes","fabio" +"13533","Mexico","MEX","Roots, Other","fabio" +"13534","Mexico","MEX","Yams","fabio" +"13535","Mexico","MEX","Sugar cane","fabio" +"13536","Mexico","MEX","Sugar beet","fabio" +"13537","Mexico","MEX","Beans","fabio" +"13538","Mexico","MEX","Peas","fabio" +"13539","Mexico","MEX","Pulses, Other and products","fabio" +"13540","Mexico","MEX","Nuts and products","fabio" +"13541","Mexico","MEX","Soyabeans","fabio" +"13542","Mexico","MEX","Groundnuts (Shelled Eq)","fabio" +"13543","Mexico","MEX","Sunflower seed","fabio" +"13544","Mexico","MEX","Rape and Mustardseed","fabio" +"13545","Mexico","MEX","Seed cotton","fabio" +"13546","Mexico","MEX","Coconuts - Incl Copra","fabio" +"13547","Mexico","MEX","Sesame seed","fabio" +"13548","Mexico","MEX","Oil, palm fruit","fabio" +"13549","Mexico","MEX","Olives (including preserved)","fabio" +"13550","Mexico","MEX","Oilcrops, Other","fabio" +"13551","Mexico","MEX","Tomatoes and products","fabio" +"13552","Mexico","MEX","Onions","fabio" +"13553","Mexico","MEX","Vegetables, Other","fabio" +"13554","Mexico","MEX","Oranges, Mandarines","fabio" +"13555","Mexico","MEX","Lemons, Limes and products","fabio" +"13556","Mexico","MEX","Grapefruit and products","fabio" +"13557","Mexico","MEX","Citrus, Other","fabio" +"13558","Mexico","MEX","Bananas","fabio" +"13559","Mexico","MEX","Plantains","fabio" +"13560","Mexico","MEX","Apples and products","fabio" +"13561","Mexico","MEX","Pineapples and products","fabio" +"13562","Mexico","MEX","Dates","fabio" +"13563","Mexico","MEX","Grapes and products (excl wine)","fabio" +"13564","Mexico","MEX","Fruits, Other","fabio" +"13565","Mexico","MEX","Coffee and products","fabio" +"13566","Mexico","MEX","Cocoa Beans and products","fabio" +"13567","Mexico","MEX","Tea (including mate)","fabio" +"13568","Mexico","MEX","Hops","fabio" +"13569","Mexico","MEX","Pepper","fabio" +"13570","Mexico","MEX","Pimento","fabio" +"13571","Mexico","MEX","Cloves","fabio" +"13572","Mexico","MEX","Spices, Other","fabio" +"13573","Mexico","MEX","Jute","fabio" +"13574","Mexico","MEX","Jute-Like Fibres","fabio" +"13575","Mexico","MEX","Soft-Fibres, Other","fabio" +"13576","Mexico","MEX","Sisal","fabio" +"13577","Mexico","MEX","Abaca","fabio" +"13578","Mexico","MEX","Hard Fibres, Other","fabio" +"13579","Mexico","MEX","Tobacco","fabio" +"13580","Mexico","MEX","Rubber","fabio" +"13581","Mexico","MEX","Fodder crops","fabio" +"13582","Mexico","MEX","Grazing","fabio" +"13583","Mexico","MEX","Cottonseed","fabio" +"13584","Mexico","MEX","Palm kernels","fabio" +"13585","Mexico","MEX","Sugar non-centrifugal","fabio" +"13586","Mexico","MEX","Molasses","fabio" +"13587","Mexico","MEX","Sugar, Refined Equiv","fabio" +"13588","Mexico","MEX","Sweeteners, Other","fabio" +"13589","Mexico","MEX","Soyabean Oil","fabio" +"13590","Mexico","MEX","Groundnut Oil","fabio" +"13591","Mexico","MEX","Sunflowerseed Oil","fabio" +"13592","Mexico","MEX","Rape and Mustard Oil","fabio" +"13593","Mexico","MEX","Cottonseed Oil","fabio" +"13594","Mexico","MEX","Palmkernel Oil","fabio" +"13595","Mexico","MEX","Palm Oil","fabio" +"13596","Mexico","MEX","Coconut Oil","fabio" +"13597","Mexico","MEX","Sesameseed Oil","fabio" +"13598","Mexico","MEX","Olive Oil","fabio" +"13599","Mexico","MEX","Ricebran Oil","fabio" +"13600","Mexico","MEX","Maize Germ Oil","fabio" +"13601","Mexico","MEX","Oilcrops Oil, Other","fabio" +"13602","Mexico","MEX","Soyabean Cake","fabio" +"13603","Mexico","MEX","Groundnut Cake","fabio" +"13604","Mexico","MEX","Sunflowerseed Cake","fabio" +"13605","Mexico","MEX","Rape and Mustard Cake","fabio" +"13606","Mexico","MEX","Cottonseed Cake","fabio" +"13607","Mexico","MEX","Palmkernel Cake","fabio" +"13608","Mexico","MEX","Copra Cake","fabio" +"13609","Mexico","MEX","Sesameseed Cake","fabio" +"13610","Mexico","MEX","Oilseed Cakes, Other","fabio" +"13611","Mexico","MEX","Wine","fabio" +"13612","Mexico","MEX","Beer","fabio" +"13613","Mexico","MEX","Beverages, Fermented","fabio" +"13614","Mexico","MEX","Beverages, Alcoholic","fabio" +"13615","Mexico","MEX","Alcohol, Non-Food","fabio" +"13616","Mexico","MEX","Cotton lint","fabio" +"13617","Mexico","MEX","Cattle","fabio" +"13618","Mexico","MEX","Buffaloes","fabio" +"13619","Mexico","MEX","Sheep","fabio" +"13620","Mexico","MEX","Goats","fabio" +"13621","Mexico","MEX","Pigs","fabio" +"13622","Mexico","MEX","Poultry Birds","fabio" +"13623","Mexico","MEX","Horses","fabio" +"13624","Mexico","MEX","Asses","fabio" +"13625","Mexico","MEX","Mules","fabio" +"13626","Mexico","MEX","Camels","fabio" +"13627","Mexico","MEX","Camelids, other","fabio" +"13628","Mexico","MEX","Rabbits and hares","fabio" +"13629","Mexico","MEX","Rodents, other","fabio" +"13630","Mexico","MEX","Live animals, other","fabio" +"13631","Mexico","MEX","Milk - Excluding Butter","fabio" +"13632","Mexico","MEX","Butter, Ghee","fabio" +"13633","Mexico","MEX","Eggs","fabio" +"13634","Mexico","MEX","Wool (Clean Eq.)","fabio" +"13635","Mexico","MEX","Bovine Meat","fabio" +"13636","Mexico","MEX","Mutton & Goat Meat","fabio" +"13637","Mexico","MEX","Pigmeat","fabio" +"13638","Mexico","MEX","Poultry Meat","fabio" +"13639","Mexico","MEX","Meat, Other","fabio" +"13640","Mexico","MEX","Offals, Edible","fabio" +"13641","Mexico","MEX","Fats, Animals, Raw","fabio" +"13642","Mexico","MEX","Hides and skins","fabio" +"13643","Mexico","MEX","Meat Meal","fabio" +"13644","Mexico","MEX","Pet food","fabio" +"13645","Mexico","MEX","Honey","fabio" +"13646","Mexico","MEX","Silk","fabio" +"13647","Mexico","MEX","Fish, Seafood","fabio" +"13648","Mexico","MEX","Wood fuel","fabio" +"13649","Mexico","MEX","Industrial roundwood, coniferous","fabio" +"13650","Mexico","MEX","Industrial roundwood, non-coniferous","fabio" +"13651","Mongolia","MNG","Rice (Milled Equivalent)","fabio" +"13652","Mongolia","MNG","Wheat and products","fabio" +"13653","Mongolia","MNG","Barley and products","fabio" +"13654","Mongolia","MNG","Maize and products","fabio" +"13655","Mongolia","MNG","Rye and products","fabio" +"13656","Mongolia","MNG","Oats","fabio" +"13657","Mongolia","MNG","Millet and products","fabio" +"13658","Mongolia","MNG","Sorghum and products","fabio" +"13659","Mongolia","MNG","Cereals, Other","fabio" +"13660","Mongolia","MNG","Potatoes and products","fabio" +"13661","Mongolia","MNG","Cassava and products","fabio" +"13662","Mongolia","MNG","Sweet potatoes","fabio" +"13663","Mongolia","MNG","Roots, Other","fabio" +"13664","Mongolia","MNG","Yams","fabio" +"13665","Mongolia","MNG","Sugar cane","fabio" +"13666","Mongolia","MNG","Sugar beet","fabio" +"13667","Mongolia","MNG","Beans","fabio" +"13668","Mongolia","MNG","Peas","fabio" +"13669","Mongolia","MNG","Pulses, Other and products","fabio" +"13670","Mongolia","MNG","Nuts and products","fabio" +"13671","Mongolia","MNG","Soyabeans","fabio" +"13672","Mongolia","MNG","Groundnuts (Shelled Eq)","fabio" +"13673","Mongolia","MNG","Sunflower seed","fabio" +"13674","Mongolia","MNG","Rape and Mustardseed","fabio" +"13675","Mongolia","MNG","Seed cotton","fabio" +"13676","Mongolia","MNG","Coconuts - Incl Copra","fabio" +"13677","Mongolia","MNG","Sesame seed","fabio" +"13678","Mongolia","MNG","Oil, palm fruit","fabio" +"13679","Mongolia","MNG","Olives (including preserved)","fabio" +"13680","Mongolia","MNG","Oilcrops, Other","fabio" +"13681","Mongolia","MNG","Tomatoes and products","fabio" +"13682","Mongolia","MNG","Onions","fabio" +"13683","Mongolia","MNG","Vegetables, Other","fabio" +"13684","Mongolia","MNG","Oranges, Mandarines","fabio" +"13685","Mongolia","MNG","Lemons, Limes and products","fabio" +"13686","Mongolia","MNG","Grapefruit and products","fabio" +"13687","Mongolia","MNG","Citrus, Other","fabio" +"13688","Mongolia","MNG","Bananas","fabio" +"13689","Mongolia","MNG","Plantains","fabio" +"13690","Mongolia","MNG","Apples and products","fabio" +"13691","Mongolia","MNG","Pineapples and products","fabio" +"13692","Mongolia","MNG","Dates","fabio" +"13693","Mongolia","MNG","Grapes and products (excl wine)","fabio" +"13694","Mongolia","MNG","Fruits, Other","fabio" +"13695","Mongolia","MNG","Coffee and products","fabio" +"13696","Mongolia","MNG","Cocoa Beans and products","fabio" +"13697","Mongolia","MNG","Tea (including mate)","fabio" +"13698","Mongolia","MNG","Hops","fabio" +"13699","Mongolia","MNG","Pepper","fabio" +"13700","Mongolia","MNG","Pimento","fabio" +"13701","Mongolia","MNG","Cloves","fabio" +"13702","Mongolia","MNG","Spices, Other","fabio" +"13703","Mongolia","MNG","Jute","fabio" +"13704","Mongolia","MNG","Jute-Like Fibres","fabio" +"13705","Mongolia","MNG","Soft-Fibres, Other","fabio" +"13706","Mongolia","MNG","Sisal","fabio" +"13707","Mongolia","MNG","Abaca","fabio" +"13708","Mongolia","MNG","Hard Fibres, Other","fabio" +"13709","Mongolia","MNG","Tobacco","fabio" +"13710","Mongolia","MNG","Rubber","fabio" +"13711","Mongolia","MNG","Fodder crops","fabio" +"13712","Mongolia","MNG","Grazing","fabio" +"13713","Mongolia","MNG","Cottonseed","fabio" +"13714","Mongolia","MNG","Palm kernels","fabio" +"13715","Mongolia","MNG","Sugar non-centrifugal","fabio" +"13716","Mongolia","MNG","Molasses","fabio" +"13717","Mongolia","MNG","Sugar, Refined Equiv","fabio" +"13718","Mongolia","MNG","Sweeteners, Other","fabio" +"13719","Mongolia","MNG","Soyabean Oil","fabio" +"13720","Mongolia","MNG","Groundnut Oil","fabio" +"13721","Mongolia","MNG","Sunflowerseed Oil","fabio" +"13722","Mongolia","MNG","Rape and Mustard Oil","fabio" +"13723","Mongolia","MNG","Cottonseed Oil","fabio" +"13724","Mongolia","MNG","Palmkernel Oil","fabio" +"13725","Mongolia","MNG","Palm Oil","fabio" +"13726","Mongolia","MNG","Coconut Oil","fabio" +"13727","Mongolia","MNG","Sesameseed Oil","fabio" +"13728","Mongolia","MNG","Olive Oil","fabio" +"13729","Mongolia","MNG","Ricebran Oil","fabio" +"13730","Mongolia","MNG","Maize Germ Oil","fabio" +"13731","Mongolia","MNG","Oilcrops Oil, Other","fabio" +"13732","Mongolia","MNG","Soyabean Cake","fabio" +"13733","Mongolia","MNG","Groundnut Cake","fabio" +"13734","Mongolia","MNG","Sunflowerseed Cake","fabio" +"13735","Mongolia","MNG","Rape and Mustard Cake","fabio" +"13736","Mongolia","MNG","Cottonseed Cake","fabio" +"13737","Mongolia","MNG","Palmkernel Cake","fabio" +"13738","Mongolia","MNG","Copra Cake","fabio" +"13739","Mongolia","MNG","Sesameseed Cake","fabio" +"13740","Mongolia","MNG","Oilseed Cakes, Other","fabio" +"13741","Mongolia","MNG","Wine","fabio" +"13742","Mongolia","MNG","Beer","fabio" +"13743","Mongolia","MNG","Beverages, Fermented","fabio" +"13744","Mongolia","MNG","Beverages, Alcoholic","fabio" +"13745","Mongolia","MNG","Alcohol, Non-Food","fabio" +"13746","Mongolia","MNG","Cotton lint","fabio" +"13747","Mongolia","MNG","Cattle","fabio" +"13748","Mongolia","MNG","Buffaloes","fabio" +"13749","Mongolia","MNG","Sheep","fabio" +"13750","Mongolia","MNG","Goats","fabio" +"13751","Mongolia","MNG","Pigs","fabio" +"13752","Mongolia","MNG","Poultry Birds","fabio" +"13753","Mongolia","MNG","Horses","fabio" +"13754","Mongolia","MNG","Asses","fabio" +"13755","Mongolia","MNG","Mules","fabio" +"13756","Mongolia","MNG","Camels","fabio" +"13757","Mongolia","MNG","Camelids, other","fabio" +"13758","Mongolia","MNG","Rabbits and hares","fabio" +"13759","Mongolia","MNG","Rodents, other","fabio" +"13760","Mongolia","MNG","Live animals, other","fabio" +"13761","Mongolia","MNG","Milk - Excluding Butter","fabio" +"13762","Mongolia","MNG","Butter, Ghee","fabio" +"13763","Mongolia","MNG","Eggs","fabio" +"13764","Mongolia","MNG","Wool (Clean Eq.)","fabio" +"13765","Mongolia","MNG","Bovine Meat","fabio" +"13766","Mongolia","MNG","Mutton & Goat Meat","fabio" +"13767","Mongolia","MNG","Pigmeat","fabio" +"13768","Mongolia","MNG","Poultry Meat","fabio" +"13769","Mongolia","MNG","Meat, Other","fabio" +"13770","Mongolia","MNG","Offals, Edible","fabio" +"13771","Mongolia","MNG","Fats, Animals, Raw","fabio" +"13772","Mongolia","MNG","Hides and skins","fabio" +"13773","Mongolia","MNG","Meat Meal","fabio" +"13774","Mongolia","MNG","Pet food","fabio" +"13775","Mongolia","MNG","Honey","fabio" +"13776","Mongolia","MNG","Silk","fabio" +"13777","Mongolia","MNG","Fish, Seafood","fabio" +"13778","Mongolia","MNG","Wood fuel","fabio" +"13779","Mongolia","MNG","Industrial roundwood, coniferous","fabio" +"13780","Mongolia","MNG","Industrial roundwood, non-coniferous","fabio" +"13781","Morocco","MAR","Rice (Milled Equivalent)","fabio" +"13782","Morocco","MAR","Wheat and products","fabio" +"13783","Morocco","MAR","Barley and products","fabio" +"13784","Morocco","MAR","Maize and products","fabio" +"13785","Morocco","MAR","Rye and products","fabio" +"13786","Morocco","MAR","Oats","fabio" +"13787","Morocco","MAR","Millet and products","fabio" +"13788","Morocco","MAR","Sorghum and products","fabio" +"13789","Morocco","MAR","Cereals, Other","fabio" +"13790","Morocco","MAR","Potatoes and products","fabio" +"13791","Morocco","MAR","Cassava and products","fabio" +"13792","Morocco","MAR","Sweet potatoes","fabio" +"13793","Morocco","MAR","Roots, Other","fabio" +"13794","Morocco","MAR","Yams","fabio" +"13795","Morocco","MAR","Sugar cane","fabio" +"13796","Morocco","MAR","Sugar beet","fabio" +"13797","Morocco","MAR","Beans","fabio" +"13798","Morocco","MAR","Peas","fabio" +"13799","Morocco","MAR","Pulses, Other and products","fabio" +"13800","Morocco","MAR","Nuts and products","fabio" +"13801","Morocco","MAR","Soyabeans","fabio" +"13802","Morocco","MAR","Groundnuts (Shelled Eq)","fabio" +"13803","Morocco","MAR","Sunflower seed","fabio" +"13804","Morocco","MAR","Rape and Mustardseed","fabio" +"13805","Morocco","MAR","Seed cotton","fabio" +"13806","Morocco","MAR","Coconuts - Incl Copra","fabio" +"13807","Morocco","MAR","Sesame seed","fabio" +"13808","Morocco","MAR","Oil, palm fruit","fabio" +"13809","Morocco","MAR","Olives (including preserved)","fabio" +"13810","Morocco","MAR","Oilcrops, Other","fabio" +"13811","Morocco","MAR","Tomatoes and products","fabio" +"13812","Morocco","MAR","Onions","fabio" +"13813","Morocco","MAR","Vegetables, Other","fabio" +"13814","Morocco","MAR","Oranges, Mandarines","fabio" +"13815","Morocco","MAR","Lemons, Limes and products","fabio" +"13816","Morocco","MAR","Grapefruit and products","fabio" +"13817","Morocco","MAR","Citrus, Other","fabio" +"13818","Morocco","MAR","Bananas","fabio" +"13819","Morocco","MAR","Plantains","fabio" +"13820","Morocco","MAR","Apples and products","fabio" +"13821","Morocco","MAR","Pineapples and products","fabio" +"13822","Morocco","MAR","Dates","fabio" +"13823","Morocco","MAR","Grapes and products (excl wine)","fabio" +"13824","Morocco","MAR","Fruits, Other","fabio" +"13825","Morocco","MAR","Coffee and products","fabio" +"13826","Morocco","MAR","Cocoa Beans and products","fabio" +"13827","Morocco","MAR","Tea (including mate)","fabio" +"13828","Morocco","MAR","Hops","fabio" +"13829","Morocco","MAR","Pepper","fabio" +"13830","Morocco","MAR","Pimento","fabio" +"13831","Morocco","MAR","Cloves","fabio" +"13832","Morocco","MAR","Spices, Other","fabio" +"13833","Morocco","MAR","Jute","fabio" +"13834","Morocco","MAR","Jute-Like Fibres","fabio" +"13835","Morocco","MAR","Soft-Fibres, Other","fabio" +"13836","Morocco","MAR","Sisal","fabio" +"13837","Morocco","MAR","Abaca","fabio" +"13838","Morocco","MAR","Hard Fibres, Other","fabio" +"13839","Morocco","MAR","Tobacco","fabio" +"13840","Morocco","MAR","Rubber","fabio" +"13841","Morocco","MAR","Fodder crops","fabio" +"13842","Morocco","MAR","Grazing","fabio" +"13843","Morocco","MAR","Cottonseed","fabio" +"13844","Morocco","MAR","Palm kernels","fabio" +"13845","Morocco","MAR","Sugar non-centrifugal","fabio" +"13846","Morocco","MAR","Molasses","fabio" +"13847","Morocco","MAR","Sugar, Refined Equiv","fabio" +"13848","Morocco","MAR","Sweeteners, Other","fabio" +"13849","Morocco","MAR","Soyabean Oil","fabio" +"13850","Morocco","MAR","Groundnut Oil","fabio" +"13851","Morocco","MAR","Sunflowerseed Oil","fabio" +"13852","Morocco","MAR","Rape and Mustard Oil","fabio" +"13853","Morocco","MAR","Cottonseed Oil","fabio" +"13854","Morocco","MAR","Palmkernel Oil","fabio" +"13855","Morocco","MAR","Palm Oil","fabio" +"13856","Morocco","MAR","Coconut Oil","fabio" +"13857","Morocco","MAR","Sesameseed Oil","fabio" +"13858","Morocco","MAR","Olive Oil","fabio" +"13859","Morocco","MAR","Ricebran Oil","fabio" +"13860","Morocco","MAR","Maize Germ Oil","fabio" +"13861","Morocco","MAR","Oilcrops Oil, Other","fabio" +"13862","Morocco","MAR","Soyabean Cake","fabio" +"13863","Morocco","MAR","Groundnut Cake","fabio" +"13864","Morocco","MAR","Sunflowerseed Cake","fabio" +"13865","Morocco","MAR","Rape and Mustard Cake","fabio" +"13866","Morocco","MAR","Cottonseed Cake","fabio" +"13867","Morocco","MAR","Palmkernel Cake","fabio" +"13868","Morocco","MAR","Copra Cake","fabio" +"13869","Morocco","MAR","Sesameseed Cake","fabio" +"13870","Morocco","MAR","Oilseed Cakes, Other","fabio" +"13871","Morocco","MAR","Wine","fabio" +"13872","Morocco","MAR","Beer","fabio" +"13873","Morocco","MAR","Beverages, Fermented","fabio" +"13874","Morocco","MAR","Beverages, Alcoholic","fabio" +"13875","Morocco","MAR","Alcohol, Non-Food","fabio" +"13876","Morocco","MAR","Cotton lint","fabio" +"13877","Morocco","MAR","Cattle","fabio" +"13878","Morocco","MAR","Buffaloes","fabio" +"13879","Morocco","MAR","Sheep","fabio" +"13880","Morocco","MAR","Goats","fabio" +"13881","Morocco","MAR","Pigs","fabio" +"13882","Morocco","MAR","Poultry Birds","fabio" +"13883","Morocco","MAR","Horses","fabio" +"13884","Morocco","MAR","Asses","fabio" +"13885","Morocco","MAR","Mules","fabio" +"13886","Morocco","MAR","Camels","fabio" +"13887","Morocco","MAR","Camelids, other","fabio" +"13888","Morocco","MAR","Rabbits and hares","fabio" +"13889","Morocco","MAR","Rodents, other","fabio" +"13890","Morocco","MAR","Live animals, other","fabio" +"13891","Morocco","MAR","Milk - Excluding Butter","fabio" +"13892","Morocco","MAR","Butter, Ghee","fabio" +"13893","Morocco","MAR","Eggs","fabio" +"13894","Morocco","MAR","Wool (Clean Eq.)","fabio" +"13895","Morocco","MAR","Bovine Meat","fabio" +"13896","Morocco","MAR","Mutton & Goat Meat","fabio" +"13897","Morocco","MAR","Pigmeat","fabio" +"13898","Morocco","MAR","Poultry Meat","fabio" +"13899","Morocco","MAR","Meat, Other","fabio" +"13900","Morocco","MAR","Offals, Edible","fabio" +"13901","Morocco","MAR","Fats, Animals, Raw","fabio" +"13902","Morocco","MAR","Hides and skins","fabio" +"13903","Morocco","MAR","Meat Meal","fabio" +"13904","Morocco","MAR","Pet food","fabio" +"13905","Morocco","MAR","Honey","fabio" +"13906","Morocco","MAR","Silk","fabio" +"13907","Morocco","MAR","Fish, Seafood","fabio" +"13908","Morocco","MAR","Wood fuel","fabio" +"13909","Morocco","MAR","Industrial roundwood, coniferous","fabio" +"13910","Morocco","MAR","Industrial roundwood, non-coniferous","fabio" +"13911","Mozambique","MOZ","Rice (Milled Equivalent)","fabio" +"13912","Mozambique","MOZ","Wheat and products","fabio" +"13913","Mozambique","MOZ","Barley and products","fabio" +"13914","Mozambique","MOZ","Maize and products","fabio" +"13915","Mozambique","MOZ","Rye and products","fabio" +"13916","Mozambique","MOZ","Oats","fabio" +"13917","Mozambique","MOZ","Millet and products","fabio" +"13918","Mozambique","MOZ","Sorghum and products","fabio" +"13919","Mozambique","MOZ","Cereals, Other","fabio" +"13920","Mozambique","MOZ","Potatoes and products","fabio" +"13921","Mozambique","MOZ","Cassava and products","fabio" +"13922","Mozambique","MOZ","Sweet potatoes","fabio" +"13923","Mozambique","MOZ","Roots, Other","fabio" +"13924","Mozambique","MOZ","Yams","fabio" +"13925","Mozambique","MOZ","Sugar cane","fabio" +"13926","Mozambique","MOZ","Sugar beet","fabio" +"13927","Mozambique","MOZ","Beans","fabio" +"13928","Mozambique","MOZ","Peas","fabio" +"13929","Mozambique","MOZ","Pulses, Other and products","fabio" +"13930","Mozambique","MOZ","Nuts and products","fabio" +"13931","Mozambique","MOZ","Soyabeans","fabio" +"13932","Mozambique","MOZ","Groundnuts (Shelled Eq)","fabio" +"13933","Mozambique","MOZ","Sunflower seed","fabio" +"13934","Mozambique","MOZ","Rape and Mustardseed","fabio" +"13935","Mozambique","MOZ","Seed cotton","fabio" +"13936","Mozambique","MOZ","Coconuts - Incl Copra","fabio" +"13937","Mozambique","MOZ","Sesame seed","fabio" +"13938","Mozambique","MOZ","Oil, palm fruit","fabio" +"13939","Mozambique","MOZ","Olives (including preserved)","fabio" +"13940","Mozambique","MOZ","Oilcrops, Other","fabio" +"13941","Mozambique","MOZ","Tomatoes and products","fabio" +"13942","Mozambique","MOZ","Onions","fabio" +"13943","Mozambique","MOZ","Vegetables, Other","fabio" +"13944","Mozambique","MOZ","Oranges, Mandarines","fabio" +"13945","Mozambique","MOZ","Lemons, Limes and products","fabio" +"13946","Mozambique","MOZ","Grapefruit and products","fabio" +"13947","Mozambique","MOZ","Citrus, Other","fabio" +"13948","Mozambique","MOZ","Bananas","fabio" +"13949","Mozambique","MOZ","Plantains","fabio" +"13950","Mozambique","MOZ","Apples and products","fabio" +"13951","Mozambique","MOZ","Pineapples and products","fabio" +"13952","Mozambique","MOZ","Dates","fabio" +"13953","Mozambique","MOZ","Grapes and products (excl wine)","fabio" +"13954","Mozambique","MOZ","Fruits, Other","fabio" +"13955","Mozambique","MOZ","Coffee and products","fabio" +"13956","Mozambique","MOZ","Cocoa Beans and products","fabio" +"13957","Mozambique","MOZ","Tea (including mate)","fabio" +"13958","Mozambique","MOZ","Hops","fabio" +"13959","Mozambique","MOZ","Pepper","fabio" +"13960","Mozambique","MOZ","Pimento","fabio" +"13961","Mozambique","MOZ","Cloves","fabio" +"13962","Mozambique","MOZ","Spices, Other","fabio" +"13963","Mozambique","MOZ","Jute","fabio" +"13964","Mozambique","MOZ","Jute-Like Fibres","fabio" +"13965","Mozambique","MOZ","Soft-Fibres, Other","fabio" +"13966","Mozambique","MOZ","Sisal","fabio" +"13967","Mozambique","MOZ","Abaca","fabio" +"13968","Mozambique","MOZ","Hard Fibres, Other","fabio" +"13969","Mozambique","MOZ","Tobacco","fabio" +"13970","Mozambique","MOZ","Rubber","fabio" +"13971","Mozambique","MOZ","Fodder crops","fabio" +"13972","Mozambique","MOZ","Grazing","fabio" +"13973","Mozambique","MOZ","Cottonseed","fabio" +"13974","Mozambique","MOZ","Palm kernels","fabio" +"13975","Mozambique","MOZ","Sugar non-centrifugal","fabio" +"13976","Mozambique","MOZ","Molasses","fabio" +"13977","Mozambique","MOZ","Sugar, Refined Equiv","fabio" +"13978","Mozambique","MOZ","Sweeteners, Other","fabio" +"13979","Mozambique","MOZ","Soyabean Oil","fabio" +"13980","Mozambique","MOZ","Groundnut Oil","fabio" +"13981","Mozambique","MOZ","Sunflowerseed Oil","fabio" +"13982","Mozambique","MOZ","Rape and Mustard Oil","fabio" +"13983","Mozambique","MOZ","Cottonseed Oil","fabio" +"13984","Mozambique","MOZ","Palmkernel Oil","fabio" +"13985","Mozambique","MOZ","Palm Oil","fabio" +"13986","Mozambique","MOZ","Coconut Oil","fabio" +"13987","Mozambique","MOZ","Sesameseed Oil","fabio" +"13988","Mozambique","MOZ","Olive Oil","fabio" +"13989","Mozambique","MOZ","Ricebran Oil","fabio" +"13990","Mozambique","MOZ","Maize Germ Oil","fabio" +"13991","Mozambique","MOZ","Oilcrops Oil, Other","fabio" +"13992","Mozambique","MOZ","Soyabean Cake","fabio" +"13993","Mozambique","MOZ","Groundnut Cake","fabio" +"13994","Mozambique","MOZ","Sunflowerseed Cake","fabio" +"13995","Mozambique","MOZ","Rape and Mustard Cake","fabio" +"13996","Mozambique","MOZ","Cottonseed Cake","fabio" +"13997","Mozambique","MOZ","Palmkernel Cake","fabio" +"13998","Mozambique","MOZ","Copra Cake","fabio" +"13999","Mozambique","MOZ","Sesameseed Cake","fabio" +"14000","Mozambique","MOZ","Oilseed Cakes, Other","fabio" +"14001","Mozambique","MOZ","Wine","fabio" +"14002","Mozambique","MOZ","Beer","fabio" +"14003","Mozambique","MOZ","Beverages, Fermented","fabio" +"14004","Mozambique","MOZ","Beverages, Alcoholic","fabio" +"14005","Mozambique","MOZ","Alcohol, Non-Food","fabio" +"14006","Mozambique","MOZ","Cotton lint","fabio" +"14007","Mozambique","MOZ","Cattle","fabio" +"14008","Mozambique","MOZ","Buffaloes","fabio" +"14009","Mozambique","MOZ","Sheep","fabio" +"14010","Mozambique","MOZ","Goats","fabio" +"14011","Mozambique","MOZ","Pigs","fabio" +"14012","Mozambique","MOZ","Poultry Birds","fabio" +"14013","Mozambique","MOZ","Horses","fabio" +"14014","Mozambique","MOZ","Asses","fabio" +"14015","Mozambique","MOZ","Mules","fabio" +"14016","Mozambique","MOZ","Camels","fabio" +"14017","Mozambique","MOZ","Camelids, other","fabio" +"14018","Mozambique","MOZ","Rabbits and hares","fabio" +"14019","Mozambique","MOZ","Rodents, other","fabio" +"14020","Mozambique","MOZ","Live animals, other","fabio" +"14021","Mozambique","MOZ","Milk - Excluding Butter","fabio" +"14022","Mozambique","MOZ","Butter, Ghee","fabio" +"14023","Mozambique","MOZ","Eggs","fabio" +"14024","Mozambique","MOZ","Wool (Clean Eq.)","fabio" +"14025","Mozambique","MOZ","Bovine Meat","fabio" +"14026","Mozambique","MOZ","Mutton & Goat Meat","fabio" +"14027","Mozambique","MOZ","Pigmeat","fabio" +"14028","Mozambique","MOZ","Poultry Meat","fabio" +"14029","Mozambique","MOZ","Meat, Other","fabio" +"14030","Mozambique","MOZ","Offals, Edible","fabio" +"14031","Mozambique","MOZ","Fats, Animals, Raw","fabio" +"14032","Mozambique","MOZ","Hides and skins","fabio" +"14033","Mozambique","MOZ","Meat Meal","fabio" +"14034","Mozambique","MOZ","Pet food","fabio" +"14035","Mozambique","MOZ","Honey","fabio" +"14036","Mozambique","MOZ","Silk","fabio" +"14037","Mozambique","MOZ","Fish, Seafood","fabio" +"14038","Mozambique","MOZ","Wood fuel","fabio" +"14039","Mozambique","MOZ","Industrial roundwood, coniferous","fabio" +"14040","Mozambique","MOZ","Industrial roundwood, non-coniferous","fabio" +"14041","Republic of Moldova","MDA","Rice (Milled Equivalent)","fabio" +"14042","Republic of Moldova","MDA","Wheat and products","fabio" +"14043","Republic of Moldova","MDA","Barley and products","fabio" +"14044","Republic of Moldova","MDA","Maize and products","fabio" +"14045","Republic of Moldova","MDA","Rye and products","fabio" +"14046","Republic of Moldova","MDA","Oats","fabio" +"14047","Republic of Moldova","MDA","Millet and products","fabio" +"14048","Republic of Moldova","MDA","Sorghum and products","fabio" +"14049","Republic of Moldova","MDA","Cereals, Other","fabio" +"14050","Republic of Moldova","MDA","Potatoes and products","fabio" +"14051","Republic of Moldova","MDA","Cassava and products","fabio" +"14052","Republic of Moldova","MDA","Sweet potatoes","fabio" +"14053","Republic of Moldova","MDA","Roots, Other","fabio" +"14054","Republic of Moldova","MDA","Yams","fabio" +"14055","Republic of Moldova","MDA","Sugar cane","fabio" +"14056","Republic of Moldova","MDA","Sugar beet","fabio" +"14057","Republic of Moldova","MDA","Beans","fabio" +"14058","Republic of Moldova","MDA","Peas","fabio" +"14059","Republic of Moldova","MDA","Pulses, Other and products","fabio" +"14060","Republic of Moldova","MDA","Nuts and products","fabio" +"14061","Republic of Moldova","MDA","Soyabeans","fabio" +"14062","Republic of Moldova","MDA","Groundnuts (Shelled Eq)","fabio" +"14063","Republic of Moldova","MDA","Sunflower seed","fabio" +"14064","Republic of Moldova","MDA","Rape and Mustardseed","fabio" +"14065","Republic of Moldova","MDA","Seed cotton","fabio" +"14066","Republic of Moldova","MDA","Coconuts - Incl Copra","fabio" +"14067","Republic of Moldova","MDA","Sesame seed","fabio" +"14068","Republic of Moldova","MDA","Oil, palm fruit","fabio" +"14069","Republic of Moldova","MDA","Olives (including preserved)","fabio" +"14070","Republic of Moldova","MDA","Oilcrops, Other","fabio" +"14071","Republic of Moldova","MDA","Tomatoes and products","fabio" +"14072","Republic of Moldova","MDA","Onions","fabio" +"14073","Republic of Moldova","MDA","Vegetables, Other","fabio" +"14074","Republic of Moldova","MDA","Oranges, Mandarines","fabio" +"14075","Republic of Moldova","MDA","Lemons, Limes and products","fabio" +"14076","Republic of Moldova","MDA","Grapefruit and products","fabio" +"14077","Republic of Moldova","MDA","Citrus, Other","fabio" +"14078","Republic of Moldova","MDA","Bananas","fabio" +"14079","Republic of Moldova","MDA","Plantains","fabio" +"14080","Republic of Moldova","MDA","Apples and products","fabio" +"14081","Republic of Moldova","MDA","Pineapples and products","fabio" +"14082","Republic of Moldova","MDA","Dates","fabio" +"14083","Republic of Moldova","MDA","Grapes and products (excl wine)","fabio" +"14084","Republic of Moldova","MDA","Fruits, Other","fabio" +"14085","Republic of Moldova","MDA","Coffee and products","fabio" +"14086","Republic of Moldova","MDA","Cocoa Beans and products","fabio" +"14087","Republic of Moldova","MDA","Tea (including mate)","fabio" +"14088","Republic of Moldova","MDA","Hops","fabio" +"14089","Republic of Moldova","MDA","Pepper","fabio" +"14090","Republic of Moldova","MDA","Pimento","fabio" +"14091","Republic of Moldova","MDA","Cloves","fabio" +"14092","Republic of Moldova","MDA","Spices, Other","fabio" +"14093","Republic of Moldova","MDA","Jute","fabio" +"14094","Republic of Moldova","MDA","Jute-Like Fibres","fabio" +"14095","Republic of Moldova","MDA","Soft-Fibres, Other","fabio" +"14096","Republic of Moldova","MDA","Sisal","fabio" +"14097","Republic of Moldova","MDA","Abaca","fabio" +"14098","Republic of Moldova","MDA","Hard Fibres, Other","fabio" +"14099","Republic of Moldova","MDA","Tobacco","fabio" +"14100","Republic of Moldova","MDA","Rubber","fabio" +"14101","Republic of Moldova","MDA","Fodder crops","fabio" +"14102","Republic of Moldova","MDA","Grazing","fabio" +"14103","Republic of Moldova","MDA","Cottonseed","fabio" +"14104","Republic of Moldova","MDA","Palm kernels","fabio" +"14105","Republic of Moldova","MDA","Sugar non-centrifugal","fabio" +"14106","Republic of Moldova","MDA","Molasses","fabio" +"14107","Republic of Moldova","MDA","Sugar, Refined Equiv","fabio" +"14108","Republic of Moldova","MDA","Sweeteners, Other","fabio" +"14109","Republic of Moldova","MDA","Soyabean Oil","fabio" +"14110","Republic of Moldova","MDA","Groundnut Oil","fabio" +"14111","Republic of Moldova","MDA","Sunflowerseed Oil","fabio" +"14112","Republic of Moldova","MDA","Rape and Mustard Oil","fabio" +"14113","Republic of Moldova","MDA","Cottonseed Oil","fabio" +"14114","Republic of Moldova","MDA","Palmkernel Oil","fabio" +"14115","Republic of Moldova","MDA","Palm Oil","fabio" +"14116","Republic of Moldova","MDA","Coconut Oil","fabio" +"14117","Republic of Moldova","MDA","Sesameseed Oil","fabio" +"14118","Republic of Moldova","MDA","Olive Oil","fabio" +"14119","Republic of Moldova","MDA","Ricebran Oil","fabio" +"14120","Republic of Moldova","MDA","Maize Germ Oil","fabio" +"14121","Republic of Moldova","MDA","Oilcrops Oil, Other","fabio" +"14122","Republic of Moldova","MDA","Soyabean Cake","fabio" +"14123","Republic of Moldova","MDA","Groundnut Cake","fabio" +"14124","Republic of Moldova","MDA","Sunflowerseed Cake","fabio" +"14125","Republic of Moldova","MDA","Rape and Mustard Cake","fabio" +"14126","Republic of Moldova","MDA","Cottonseed Cake","fabio" +"14127","Republic of Moldova","MDA","Palmkernel Cake","fabio" +"14128","Republic of Moldova","MDA","Copra Cake","fabio" +"14129","Republic of Moldova","MDA","Sesameseed Cake","fabio" +"14130","Republic of Moldova","MDA","Oilseed Cakes, Other","fabio" +"14131","Republic of Moldova","MDA","Wine","fabio" +"14132","Republic of Moldova","MDA","Beer","fabio" +"14133","Republic of Moldova","MDA","Beverages, Fermented","fabio" +"14134","Republic of Moldova","MDA","Beverages, Alcoholic","fabio" +"14135","Republic of Moldova","MDA","Alcohol, Non-Food","fabio" +"14136","Republic of Moldova","MDA","Cotton lint","fabio" +"14137","Republic of Moldova","MDA","Cattle","fabio" +"14138","Republic of Moldova","MDA","Buffaloes","fabio" +"14139","Republic of Moldova","MDA","Sheep","fabio" +"14140","Republic of Moldova","MDA","Goats","fabio" +"14141","Republic of Moldova","MDA","Pigs","fabio" +"14142","Republic of Moldova","MDA","Poultry Birds","fabio" +"14143","Republic of Moldova","MDA","Horses","fabio" +"14144","Republic of Moldova","MDA","Asses","fabio" +"14145","Republic of Moldova","MDA","Mules","fabio" +"14146","Republic of Moldova","MDA","Camels","fabio" +"14147","Republic of Moldova","MDA","Camelids, other","fabio" +"14148","Republic of Moldova","MDA","Rabbits and hares","fabio" +"14149","Republic of Moldova","MDA","Rodents, other","fabio" +"14150","Republic of Moldova","MDA","Live animals, other","fabio" +"14151","Republic of Moldova","MDA","Milk - Excluding Butter","fabio" +"14152","Republic of Moldova","MDA","Butter, Ghee","fabio" +"14153","Republic of Moldova","MDA","Eggs","fabio" +"14154","Republic of Moldova","MDA","Wool (Clean Eq.)","fabio" +"14155","Republic of Moldova","MDA","Bovine Meat","fabio" +"14156","Republic of Moldova","MDA","Mutton & Goat Meat","fabio" +"14157","Republic of Moldova","MDA","Pigmeat","fabio" +"14158","Republic of Moldova","MDA","Poultry Meat","fabio" +"14159","Republic of Moldova","MDA","Meat, Other","fabio" +"14160","Republic of Moldova","MDA","Offals, Edible","fabio" +"14161","Republic of Moldova","MDA","Fats, Animals, Raw","fabio" +"14162","Republic of Moldova","MDA","Hides and skins","fabio" +"14163","Republic of Moldova","MDA","Meat Meal","fabio" +"14164","Republic of Moldova","MDA","Pet food","fabio" +"14165","Republic of Moldova","MDA","Honey","fabio" +"14166","Republic of Moldova","MDA","Silk","fabio" +"14167","Republic of Moldova","MDA","Fish, Seafood","fabio" +"14168","Republic of Moldova","MDA","Wood fuel","fabio" +"14169","Republic of Moldova","MDA","Industrial roundwood, coniferous","fabio" +"14170","Republic of Moldova","MDA","Industrial roundwood, non-coniferous","fabio" +"14171","Namibia","NAM","Rice (Milled Equivalent)","fabio" +"14172","Namibia","NAM","Wheat and products","fabio" +"14173","Namibia","NAM","Barley and products","fabio" +"14174","Namibia","NAM","Maize and products","fabio" +"14175","Namibia","NAM","Rye and products","fabio" +"14176","Namibia","NAM","Oats","fabio" +"14177","Namibia","NAM","Millet and products","fabio" +"14178","Namibia","NAM","Sorghum and products","fabio" +"14179","Namibia","NAM","Cereals, Other","fabio" +"14180","Namibia","NAM","Potatoes and products","fabio" +"14181","Namibia","NAM","Cassava and products","fabio" +"14182","Namibia","NAM","Sweet potatoes","fabio" +"14183","Namibia","NAM","Roots, Other","fabio" +"14184","Namibia","NAM","Yams","fabio" +"14185","Namibia","NAM","Sugar cane","fabio" +"14186","Namibia","NAM","Sugar beet","fabio" +"14187","Namibia","NAM","Beans","fabio" +"14188","Namibia","NAM","Peas","fabio" +"14189","Namibia","NAM","Pulses, Other and products","fabio" +"14190","Namibia","NAM","Nuts and products","fabio" +"14191","Namibia","NAM","Soyabeans","fabio" +"14192","Namibia","NAM","Groundnuts (Shelled Eq)","fabio" +"14193","Namibia","NAM","Sunflower seed","fabio" +"14194","Namibia","NAM","Rape and Mustardseed","fabio" +"14195","Namibia","NAM","Seed cotton","fabio" +"14196","Namibia","NAM","Coconuts - Incl Copra","fabio" +"14197","Namibia","NAM","Sesame seed","fabio" +"14198","Namibia","NAM","Oil, palm fruit","fabio" +"14199","Namibia","NAM","Olives (including preserved)","fabio" +"14200","Namibia","NAM","Oilcrops, Other","fabio" +"14201","Namibia","NAM","Tomatoes and products","fabio" +"14202","Namibia","NAM","Onions","fabio" +"14203","Namibia","NAM","Vegetables, Other","fabio" +"14204","Namibia","NAM","Oranges, Mandarines","fabio" +"14205","Namibia","NAM","Lemons, Limes and products","fabio" +"14206","Namibia","NAM","Grapefruit and products","fabio" +"14207","Namibia","NAM","Citrus, Other","fabio" +"14208","Namibia","NAM","Bananas","fabio" +"14209","Namibia","NAM","Plantains","fabio" +"14210","Namibia","NAM","Apples and products","fabio" +"14211","Namibia","NAM","Pineapples and products","fabio" +"14212","Namibia","NAM","Dates","fabio" +"14213","Namibia","NAM","Grapes and products (excl wine)","fabio" +"14214","Namibia","NAM","Fruits, Other","fabio" +"14215","Namibia","NAM","Coffee and products","fabio" +"14216","Namibia","NAM","Cocoa Beans and products","fabio" +"14217","Namibia","NAM","Tea (including mate)","fabio" +"14218","Namibia","NAM","Hops","fabio" +"14219","Namibia","NAM","Pepper","fabio" +"14220","Namibia","NAM","Pimento","fabio" +"14221","Namibia","NAM","Cloves","fabio" +"14222","Namibia","NAM","Spices, Other","fabio" +"14223","Namibia","NAM","Jute","fabio" +"14224","Namibia","NAM","Jute-Like Fibres","fabio" +"14225","Namibia","NAM","Soft-Fibres, Other","fabio" +"14226","Namibia","NAM","Sisal","fabio" +"14227","Namibia","NAM","Abaca","fabio" +"14228","Namibia","NAM","Hard Fibres, Other","fabio" +"14229","Namibia","NAM","Tobacco","fabio" +"14230","Namibia","NAM","Rubber","fabio" +"14231","Namibia","NAM","Fodder crops","fabio" +"14232","Namibia","NAM","Grazing","fabio" +"14233","Namibia","NAM","Cottonseed","fabio" +"14234","Namibia","NAM","Palm kernels","fabio" +"14235","Namibia","NAM","Sugar non-centrifugal","fabio" +"14236","Namibia","NAM","Molasses","fabio" +"14237","Namibia","NAM","Sugar, Refined Equiv","fabio" +"14238","Namibia","NAM","Sweeteners, Other","fabio" +"14239","Namibia","NAM","Soyabean Oil","fabio" +"14240","Namibia","NAM","Groundnut Oil","fabio" +"14241","Namibia","NAM","Sunflowerseed Oil","fabio" +"14242","Namibia","NAM","Rape and Mustard Oil","fabio" +"14243","Namibia","NAM","Cottonseed Oil","fabio" +"14244","Namibia","NAM","Palmkernel Oil","fabio" +"14245","Namibia","NAM","Palm Oil","fabio" +"14246","Namibia","NAM","Coconut Oil","fabio" +"14247","Namibia","NAM","Sesameseed Oil","fabio" +"14248","Namibia","NAM","Olive Oil","fabio" +"14249","Namibia","NAM","Ricebran Oil","fabio" +"14250","Namibia","NAM","Maize Germ Oil","fabio" +"14251","Namibia","NAM","Oilcrops Oil, Other","fabio" +"14252","Namibia","NAM","Soyabean Cake","fabio" +"14253","Namibia","NAM","Groundnut Cake","fabio" +"14254","Namibia","NAM","Sunflowerseed Cake","fabio" +"14255","Namibia","NAM","Rape and Mustard Cake","fabio" +"14256","Namibia","NAM","Cottonseed Cake","fabio" +"14257","Namibia","NAM","Palmkernel Cake","fabio" +"14258","Namibia","NAM","Copra Cake","fabio" +"14259","Namibia","NAM","Sesameseed Cake","fabio" +"14260","Namibia","NAM","Oilseed Cakes, Other","fabio" +"14261","Namibia","NAM","Wine","fabio" +"14262","Namibia","NAM","Beer","fabio" +"14263","Namibia","NAM","Beverages, Fermented","fabio" +"14264","Namibia","NAM","Beverages, Alcoholic","fabio" +"14265","Namibia","NAM","Alcohol, Non-Food","fabio" +"14266","Namibia","NAM","Cotton lint","fabio" +"14267","Namibia","NAM","Cattle","fabio" +"14268","Namibia","NAM","Buffaloes","fabio" +"14269","Namibia","NAM","Sheep","fabio" +"14270","Namibia","NAM","Goats","fabio" +"14271","Namibia","NAM","Pigs","fabio" +"14272","Namibia","NAM","Poultry Birds","fabio" +"14273","Namibia","NAM","Horses","fabio" +"14274","Namibia","NAM","Asses","fabio" +"14275","Namibia","NAM","Mules","fabio" +"14276","Namibia","NAM","Camels","fabio" +"14277","Namibia","NAM","Camelids, other","fabio" +"14278","Namibia","NAM","Rabbits and hares","fabio" +"14279","Namibia","NAM","Rodents, other","fabio" +"14280","Namibia","NAM","Live animals, other","fabio" +"14281","Namibia","NAM","Milk - Excluding Butter","fabio" +"14282","Namibia","NAM","Butter, Ghee","fabio" +"14283","Namibia","NAM","Eggs","fabio" +"14284","Namibia","NAM","Wool (Clean Eq.)","fabio" +"14285","Namibia","NAM","Bovine Meat","fabio" +"14286","Namibia","NAM","Mutton & Goat Meat","fabio" +"14287","Namibia","NAM","Pigmeat","fabio" +"14288","Namibia","NAM","Poultry Meat","fabio" +"14289","Namibia","NAM","Meat, Other","fabio" +"14290","Namibia","NAM","Offals, Edible","fabio" +"14291","Namibia","NAM","Fats, Animals, Raw","fabio" +"14292","Namibia","NAM","Hides and skins","fabio" +"14293","Namibia","NAM","Meat Meal","fabio" +"14294","Namibia","NAM","Pet food","fabio" +"14295","Namibia","NAM","Honey","fabio" +"14296","Namibia","NAM","Silk","fabio" +"14297","Namibia","NAM","Fish, Seafood","fabio" +"14298","Namibia","NAM","Wood fuel","fabio" +"14299","Namibia","NAM","Industrial roundwood, coniferous","fabio" +"14300","Namibia","NAM","Industrial roundwood, non-coniferous","fabio" +"14301","Nepal","NPL","Rice (Milled Equivalent)","fabio" +"14302","Nepal","NPL","Wheat and products","fabio" +"14303","Nepal","NPL","Barley and products","fabio" +"14304","Nepal","NPL","Maize and products","fabio" +"14305","Nepal","NPL","Rye and products","fabio" +"14306","Nepal","NPL","Oats","fabio" +"14307","Nepal","NPL","Millet and products","fabio" +"14308","Nepal","NPL","Sorghum and products","fabio" +"14309","Nepal","NPL","Cereals, Other","fabio" +"14310","Nepal","NPL","Potatoes and products","fabio" +"14311","Nepal","NPL","Cassava and products","fabio" +"14312","Nepal","NPL","Sweet potatoes","fabio" +"14313","Nepal","NPL","Roots, Other","fabio" +"14314","Nepal","NPL","Yams","fabio" +"14315","Nepal","NPL","Sugar cane","fabio" +"14316","Nepal","NPL","Sugar beet","fabio" +"14317","Nepal","NPL","Beans","fabio" +"14318","Nepal","NPL","Peas","fabio" +"14319","Nepal","NPL","Pulses, Other and products","fabio" +"14320","Nepal","NPL","Nuts and products","fabio" +"14321","Nepal","NPL","Soyabeans","fabio" +"14322","Nepal","NPL","Groundnuts (Shelled Eq)","fabio" +"14323","Nepal","NPL","Sunflower seed","fabio" +"14324","Nepal","NPL","Rape and Mustardseed","fabio" +"14325","Nepal","NPL","Seed cotton","fabio" +"14326","Nepal","NPL","Coconuts - Incl Copra","fabio" +"14327","Nepal","NPL","Sesame seed","fabio" +"14328","Nepal","NPL","Oil, palm fruit","fabio" +"14329","Nepal","NPL","Olives (including preserved)","fabio" +"14330","Nepal","NPL","Oilcrops, Other","fabio" +"14331","Nepal","NPL","Tomatoes and products","fabio" +"14332","Nepal","NPL","Onions","fabio" +"14333","Nepal","NPL","Vegetables, Other","fabio" +"14334","Nepal","NPL","Oranges, Mandarines","fabio" +"14335","Nepal","NPL","Lemons, Limes and products","fabio" +"14336","Nepal","NPL","Grapefruit and products","fabio" +"14337","Nepal","NPL","Citrus, Other","fabio" +"14338","Nepal","NPL","Bananas","fabio" +"14339","Nepal","NPL","Plantains","fabio" +"14340","Nepal","NPL","Apples and products","fabio" +"14341","Nepal","NPL","Pineapples and products","fabio" +"14342","Nepal","NPL","Dates","fabio" +"14343","Nepal","NPL","Grapes and products (excl wine)","fabio" +"14344","Nepal","NPL","Fruits, Other","fabio" +"14345","Nepal","NPL","Coffee and products","fabio" +"14346","Nepal","NPL","Cocoa Beans and products","fabio" +"14347","Nepal","NPL","Tea (including mate)","fabio" +"14348","Nepal","NPL","Hops","fabio" +"14349","Nepal","NPL","Pepper","fabio" +"14350","Nepal","NPL","Pimento","fabio" +"14351","Nepal","NPL","Cloves","fabio" +"14352","Nepal","NPL","Spices, Other","fabio" +"14353","Nepal","NPL","Jute","fabio" +"14354","Nepal","NPL","Jute-Like Fibres","fabio" +"14355","Nepal","NPL","Soft-Fibres, Other","fabio" +"14356","Nepal","NPL","Sisal","fabio" +"14357","Nepal","NPL","Abaca","fabio" +"14358","Nepal","NPL","Hard Fibres, Other","fabio" +"14359","Nepal","NPL","Tobacco","fabio" +"14360","Nepal","NPL","Rubber","fabio" +"14361","Nepal","NPL","Fodder crops","fabio" +"14362","Nepal","NPL","Grazing","fabio" +"14363","Nepal","NPL","Cottonseed","fabio" +"14364","Nepal","NPL","Palm kernels","fabio" +"14365","Nepal","NPL","Sugar non-centrifugal","fabio" +"14366","Nepal","NPL","Molasses","fabio" +"14367","Nepal","NPL","Sugar, Refined Equiv","fabio" +"14368","Nepal","NPL","Sweeteners, Other","fabio" +"14369","Nepal","NPL","Soyabean Oil","fabio" +"14370","Nepal","NPL","Groundnut Oil","fabio" +"14371","Nepal","NPL","Sunflowerseed Oil","fabio" +"14372","Nepal","NPL","Rape and Mustard Oil","fabio" +"14373","Nepal","NPL","Cottonseed Oil","fabio" +"14374","Nepal","NPL","Palmkernel Oil","fabio" +"14375","Nepal","NPL","Palm Oil","fabio" +"14376","Nepal","NPL","Coconut Oil","fabio" +"14377","Nepal","NPL","Sesameseed Oil","fabio" +"14378","Nepal","NPL","Olive Oil","fabio" +"14379","Nepal","NPL","Ricebran Oil","fabio" +"14380","Nepal","NPL","Maize Germ Oil","fabio" +"14381","Nepal","NPL","Oilcrops Oil, Other","fabio" +"14382","Nepal","NPL","Soyabean Cake","fabio" +"14383","Nepal","NPL","Groundnut Cake","fabio" +"14384","Nepal","NPL","Sunflowerseed Cake","fabio" +"14385","Nepal","NPL","Rape and Mustard Cake","fabio" +"14386","Nepal","NPL","Cottonseed Cake","fabio" +"14387","Nepal","NPL","Palmkernel Cake","fabio" +"14388","Nepal","NPL","Copra Cake","fabio" +"14389","Nepal","NPL","Sesameseed Cake","fabio" +"14390","Nepal","NPL","Oilseed Cakes, Other","fabio" +"14391","Nepal","NPL","Wine","fabio" +"14392","Nepal","NPL","Beer","fabio" +"14393","Nepal","NPL","Beverages, Fermented","fabio" +"14394","Nepal","NPL","Beverages, Alcoholic","fabio" +"14395","Nepal","NPL","Alcohol, Non-Food","fabio" +"14396","Nepal","NPL","Cotton lint","fabio" +"14397","Nepal","NPL","Cattle","fabio" +"14398","Nepal","NPL","Buffaloes","fabio" +"14399","Nepal","NPL","Sheep","fabio" +"14400","Nepal","NPL","Goats","fabio" +"14401","Nepal","NPL","Pigs","fabio" +"14402","Nepal","NPL","Poultry Birds","fabio" +"14403","Nepal","NPL","Horses","fabio" +"14404","Nepal","NPL","Asses","fabio" +"14405","Nepal","NPL","Mules","fabio" +"14406","Nepal","NPL","Camels","fabio" +"14407","Nepal","NPL","Camelids, other","fabio" +"14408","Nepal","NPL","Rabbits and hares","fabio" +"14409","Nepal","NPL","Rodents, other","fabio" +"14410","Nepal","NPL","Live animals, other","fabio" +"14411","Nepal","NPL","Milk - Excluding Butter","fabio" +"14412","Nepal","NPL","Butter, Ghee","fabio" +"14413","Nepal","NPL","Eggs","fabio" +"14414","Nepal","NPL","Wool (Clean Eq.)","fabio" +"14415","Nepal","NPL","Bovine Meat","fabio" +"14416","Nepal","NPL","Mutton & Goat Meat","fabio" +"14417","Nepal","NPL","Pigmeat","fabio" +"14418","Nepal","NPL","Poultry Meat","fabio" +"14419","Nepal","NPL","Meat, Other","fabio" +"14420","Nepal","NPL","Offals, Edible","fabio" +"14421","Nepal","NPL","Fats, Animals, Raw","fabio" +"14422","Nepal","NPL","Hides and skins","fabio" +"14423","Nepal","NPL","Meat Meal","fabio" +"14424","Nepal","NPL","Pet food","fabio" +"14425","Nepal","NPL","Honey","fabio" +"14426","Nepal","NPL","Silk","fabio" +"14427","Nepal","NPL","Fish, Seafood","fabio" +"14428","Nepal","NPL","Wood fuel","fabio" +"14429","Nepal","NPL","Industrial roundwood, coniferous","fabio" +"14430","Nepal","NPL","Industrial roundwood, non-coniferous","fabio" +"14431","Netherlands","NLD","Rice (Milled Equivalent)","fabio" +"14432","Netherlands","NLD","Wheat and products","fabio" +"14433","Netherlands","NLD","Barley and products","fabio" +"14434","Netherlands","NLD","Maize and products","fabio" +"14435","Netherlands","NLD","Rye and products","fabio" +"14436","Netherlands","NLD","Oats","fabio" +"14437","Netherlands","NLD","Millet and products","fabio" +"14438","Netherlands","NLD","Sorghum and products","fabio" +"14439","Netherlands","NLD","Cereals, Other","fabio" +"14440","Netherlands","NLD","Potatoes and products","fabio" +"14441","Netherlands","NLD","Cassava and products","fabio" +"14442","Netherlands","NLD","Sweet potatoes","fabio" +"14443","Netherlands","NLD","Roots, Other","fabio" +"14444","Netherlands","NLD","Yams","fabio" +"14445","Netherlands","NLD","Sugar cane","fabio" +"14446","Netherlands","NLD","Sugar beet","fabio" +"14447","Netherlands","NLD","Beans","fabio" +"14448","Netherlands","NLD","Peas","fabio" +"14449","Netherlands","NLD","Pulses, Other and products","fabio" +"14450","Netherlands","NLD","Nuts and products","fabio" +"14451","Netherlands","NLD","Soyabeans","fabio" +"14452","Netherlands","NLD","Groundnuts (Shelled Eq)","fabio" +"14453","Netherlands","NLD","Sunflower seed","fabio" +"14454","Netherlands","NLD","Rape and Mustardseed","fabio" +"14455","Netherlands","NLD","Seed cotton","fabio" +"14456","Netherlands","NLD","Coconuts - Incl Copra","fabio" +"14457","Netherlands","NLD","Sesame seed","fabio" +"14458","Netherlands","NLD","Oil, palm fruit","fabio" +"14459","Netherlands","NLD","Olives (including preserved)","fabio" +"14460","Netherlands","NLD","Oilcrops, Other","fabio" +"14461","Netherlands","NLD","Tomatoes and products","fabio" +"14462","Netherlands","NLD","Onions","fabio" +"14463","Netherlands","NLD","Vegetables, Other","fabio" +"14464","Netherlands","NLD","Oranges, Mandarines","fabio" +"14465","Netherlands","NLD","Lemons, Limes and products","fabio" +"14466","Netherlands","NLD","Grapefruit and products","fabio" +"14467","Netherlands","NLD","Citrus, Other","fabio" +"14468","Netherlands","NLD","Bananas","fabio" +"14469","Netherlands","NLD","Plantains","fabio" +"14470","Netherlands","NLD","Apples and products","fabio" +"14471","Netherlands","NLD","Pineapples and products","fabio" +"14472","Netherlands","NLD","Dates","fabio" +"14473","Netherlands","NLD","Grapes and products (excl wine)","fabio" +"14474","Netherlands","NLD","Fruits, Other","fabio" +"14475","Netherlands","NLD","Coffee and products","fabio" +"14476","Netherlands","NLD","Cocoa Beans and products","fabio" +"14477","Netherlands","NLD","Tea (including mate)","fabio" +"14478","Netherlands","NLD","Hops","fabio" +"14479","Netherlands","NLD","Pepper","fabio" +"14480","Netherlands","NLD","Pimento","fabio" +"14481","Netherlands","NLD","Cloves","fabio" +"14482","Netherlands","NLD","Spices, Other","fabio" +"14483","Netherlands","NLD","Jute","fabio" +"14484","Netherlands","NLD","Jute-Like Fibres","fabio" +"14485","Netherlands","NLD","Soft-Fibres, Other","fabio" +"14486","Netherlands","NLD","Sisal","fabio" +"14487","Netherlands","NLD","Abaca","fabio" +"14488","Netherlands","NLD","Hard Fibres, Other","fabio" +"14489","Netherlands","NLD","Tobacco","fabio" +"14490","Netherlands","NLD","Rubber","fabio" +"14491","Netherlands","NLD","Fodder crops","fabio" +"14492","Netherlands","NLD","Grazing","fabio" +"14493","Netherlands","NLD","Cottonseed","fabio" +"14494","Netherlands","NLD","Palm kernels","fabio" +"14495","Netherlands","NLD","Sugar non-centrifugal","fabio" +"14496","Netherlands","NLD","Molasses","fabio" +"14497","Netherlands","NLD","Sugar, Refined Equiv","fabio" +"14498","Netherlands","NLD","Sweeteners, Other","fabio" +"14499","Netherlands","NLD","Soyabean Oil","fabio" +"14500","Netherlands","NLD","Groundnut Oil","fabio" +"14501","Netherlands","NLD","Sunflowerseed Oil","fabio" +"14502","Netherlands","NLD","Rape and Mustard Oil","fabio" +"14503","Netherlands","NLD","Cottonseed Oil","fabio" +"14504","Netherlands","NLD","Palmkernel Oil","fabio" +"14505","Netherlands","NLD","Palm Oil","fabio" +"14506","Netherlands","NLD","Coconut Oil","fabio" +"14507","Netherlands","NLD","Sesameseed Oil","fabio" +"14508","Netherlands","NLD","Olive Oil","fabio" +"14509","Netherlands","NLD","Ricebran Oil","fabio" +"14510","Netherlands","NLD","Maize Germ Oil","fabio" +"14511","Netherlands","NLD","Oilcrops Oil, Other","fabio" +"14512","Netherlands","NLD","Soyabean Cake","fabio" +"14513","Netherlands","NLD","Groundnut Cake","fabio" +"14514","Netherlands","NLD","Sunflowerseed Cake","fabio" +"14515","Netherlands","NLD","Rape and Mustard Cake","fabio" +"14516","Netherlands","NLD","Cottonseed Cake","fabio" +"14517","Netherlands","NLD","Palmkernel Cake","fabio" +"14518","Netherlands","NLD","Copra Cake","fabio" +"14519","Netherlands","NLD","Sesameseed Cake","fabio" +"14520","Netherlands","NLD","Oilseed Cakes, Other","fabio" +"14521","Netherlands","NLD","Wine","fabio" +"14522","Netherlands","NLD","Beer","fabio" +"14523","Netherlands","NLD","Beverages, Fermented","fabio" +"14524","Netherlands","NLD","Beverages, Alcoholic","fabio" +"14525","Netherlands","NLD","Alcohol, Non-Food","fabio" +"14526","Netherlands","NLD","Cotton lint","fabio" +"14527","Netherlands","NLD","Cattle","fabio" +"14528","Netherlands","NLD","Buffaloes","fabio" +"14529","Netherlands","NLD","Sheep","fabio" +"14530","Netherlands","NLD","Goats","fabio" +"14531","Netherlands","NLD","Pigs","fabio" +"14532","Netherlands","NLD","Poultry Birds","fabio" +"14533","Netherlands","NLD","Horses","fabio" +"14534","Netherlands","NLD","Asses","fabio" +"14535","Netherlands","NLD","Mules","fabio" +"14536","Netherlands","NLD","Camels","fabio" +"14537","Netherlands","NLD","Camelids, other","fabio" +"14538","Netherlands","NLD","Rabbits and hares","fabio" +"14539","Netherlands","NLD","Rodents, other","fabio" +"14540","Netherlands","NLD","Live animals, other","fabio" +"14541","Netherlands","NLD","Milk - Excluding Butter","fabio" +"14542","Netherlands","NLD","Butter, Ghee","fabio" +"14543","Netherlands","NLD","Eggs","fabio" +"14544","Netherlands","NLD","Wool (Clean Eq.)","fabio" +"14545","Netherlands","NLD","Bovine Meat","fabio" +"14546","Netherlands","NLD","Mutton & Goat Meat","fabio" +"14547","Netherlands","NLD","Pigmeat","fabio" +"14548","Netherlands","NLD","Poultry Meat","fabio" +"14549","Netherlands","NLD","Meat, Other","fabio" +"14550","Netherlands","NLD","Offals, Edible","fabio" +"14551","Netherlands","NLD","Fats, Animals, Raw","fabio" +"14552","Netherlands","NLD","Hides and skins","fabio" +"14553","Netherlands","NLD","Meat Meal","fabio" +"14554","Netherlands","NLD","Pet food","fabio" +"14555","Netherlands","NLD","Honey","fabio" +"14556","Netherlands","NLD","Silk","fabio" +"14557","Netherlands","NLD","Fish, Seafood","fabio" +"14558","Netherlands","NLD","Wood fuel","fabio" +"14559","Netherlands","NLD","Industrial roundwood, coniferous","fabio" +"14560","Netherlands","NLD","Industrial roundwood, non-coniferous","fabio" +"14561","Netherlands Antilles","ANT","Rice (Milled Equivalent)","fabio" +"14562","Netherlands Antilles","ANT","Wheat and products","fabio" +"14563","Netherlands Antilles","ANT","Barley and products","fabio" +"14564","Netherlands Antilles","ANT","Maize and products","fabio" +"14565","Netherlands Antilles","ANT","Rye and products","fabio" +"14566","Netherlands Antilles","ANT","Oats","fabio" +"14567","Netherlands Antilles","ANT","Millet and products","fabio" +"14568","Netherlands Antilles","ANT","Sorghum and products","fabio" +"14569","Netherlands Antilles","ANT","Cereals, Other","fabio" +"14570","Netherlands Antilles","ANT","Potatoes and products","fabio" +"14571","Netherlands Antilles","ANT","Cassava and products","fabio" +"14572","Netherlands Antilles","ANT","Sweet potatoes","fabio" +"14573","Netherlands Antilles","ANT","Roots, Other","fabio" +"14574","Netherlands Antilles","ANT","Yams","fabio" +"14575","Netherlands Antilles","ANT","Sugar cane","fabio" +"14576","Netherlands Antilles","ANT","Sugar beet","fabio" +"14577","Netherlands Antilles","ANT","Beans","fabio" +"14578","Netherlands Antilles","ANT","Peas","fabio" +"14579","Netherlands Antilles","ANT","Pulses, Other and products","fabio" +"14580","Netherlands Antilles","ANT","Nuts and products","fabio" +"14581","Netherlands Antilles","ANT","Soyabeans","fabio" +"14582","Netherlands Antilles","ANT","Groundnuts (Shelled Eq)","fabio" +"14583","Netherlands Antilles","ANT","Sunflower seed","fabio" +"14584","Netherlands Antilles","ANT","Rape and Mustardseed","fabio" +"14585","Netherlands Antilles","ANT","Seed cotton","fabio" +"14586","Netherlands Antilles","ANT","Coconuts - Incl Copra","fabio" +"14587","Netherlands Antilles","ANT","Sesame seed","fabio" +"14588","Netherlands Antilles","ANT","Oil, palm fruit","fabio" +"14589","Netherlands Antilles","ANT","Olives (including preserved)","fabio" +"14590","Netherlands Antilles","ANT","Oilcrops, Other","fabio" +"14591","Netherlands Antilles","ANT","Tomatoes and products","fabio" +"14592","Netherlands Antilles","ANT","Onions","fabio" +"14593","Netherlands Antilles","ANT","Vegetables, Other","fabio" +"14594","Netherlands Antilles","ANT","Oranges, Mandarines","fabio" +"14595","Netherlands Antilles","ANT","Lemons, Limes and products","fabio" +"14596","Netherlands Antilles","ANT","Grapefruit and products","fabio" +"14597","Netherlands Antilles","ANT","Citrus, Other","fabio" +"14598","Netherlands Antilles","ANT","Bananas","fabio" +"14599","Netherlands Antilles","ANT","Plantains","fabio" +"14600","Netherlands Antilles","ANT","Apples and products","fabio" +"14601","Netherlands Antilles","ANT","Pineapples and products","fabio" +"14602","Netherlands Antilles","ANT","Dates","fabio" +"14603","Netherlands Antilles","ANT","Grapes and products (excl wine)","fabio" +"14604","Netherlands Antilles","ANT","Fruits, Other","fabio" +"14605","Netherlands Antilles","ANT","Coffee and products","fabio" +"14606","Netherlands Antilles","ANT","Cocoa Beans and products","fabio" +"14607","Netherlands Antilles","ANT","Tea (including mate)","fabio" +"14608","Netherlands Antilles","ANT","Hops","fabio" +"14609","Netherlands Antilles","ANT","Pepper","fabio" +"14610","Netherlands Antilles","ANT","Pimento","fabio" +"14611","Netherlands Antilles","ANT","Cloves","fabio" +"14612","Netherlands Antilles","ANT","Spices, Other","fabio" +"14613","Netherlands Antilles","ANT","Jute","fabio" +"14614","Netherlands Antilles","ANT","Jute-Like Fibres","fabio" +"14615","Netherlands Antilles","ANT","Soft-Fibres, Other","fabio" +"14616","Netherlands Antilles","ANT","Sisal","fabio" +"14617","Netherlands Antilles","ANT","Abaca","fabio" +"14618","Netherlands Antilles","ANT","Hard Fibres, Other","fabio" +"14619","Netherlands Antilles","ANT","Tobacco","fabio" +"14620","Netherlands Antilles","ANT","Rubber","fabio" +"14621","Netherlands Antilles","ANT","Fodder crops","fabio" +"14622","Netherlands Antilles","ANT","Grazing","fabio" +"14623","Netherlands Antilles","ANT","Cottonseed","fabio" +"14624","Netherlands Antilles","ANT","Palm kernels","fabio" +"14625","Netherlands Antilles","ANT","Sugar non-centrifugal","fabio" +"14626","Netherlands Antilles","ANT","Molasses","fabio" +"14627","Netherlands Antilles","ANT","Sugar, Refined Equiv","fabio" +"14628","Netherlands Antilles","ANT","Sweeteners, Other","fabio" +"14629","Netherlands Antilles","ANT","Soyabean Oil","fabio" +"14630","Netherlands Antilles","ANT","Groundnut Oil","fabio" +"14631","Netherlands Antilles","ANT","Sunflowerseed Oil","fabio" +"14632","Netherlands Antilles","ANT","Rape and Mustard Oil","fabio" +"14633","Netherlands Antilles","ANT","Cottonseed Oil","fabio" +"14634","Netherlands Antilles","ANT","Palmkernel Oil","fabio" +"14635","Netherlands Antilles","ANT","Palm Oil","fabio" +"14636","Netherlands Antilles","ANT","Coconut Oil","fabio" +"14637","Netherlands Antilles","ANT","Sesameseed Oil","fabio" +"14638","Netherlands Antilles","ANT","Olive Oil","fabio" +"14639","Netherlands Antilles","ANT","Ricebran Oil","fabio" +"14640","Netherlands Antilles","ANT","Maize Germ Oil","fabio" +"14641","Netherlands Antilles","ANT","Oilcrops Oil, Other","fabio" +"14642","Netherlands Antilles","ANT","Soyabean Cake","fabio" +"14643","Netherlands Antilles","ANT","Groundnut Cake","fabio" +"14644","Netherlands Antilles","ANT","Sunflowerseed Cake","fabio" +"14645","Netherlands Antilles","ANT","Rape and Mustard Cake","fabio" +"14646","Netherlands Antilles","ANT","Cottonseed Cake","fabio" +"14647","Netherlands Antilles","ANT","Palmkernel Cake","fabio" +"14648","Netherlands Antilles","ANT","Copra Cake","fabio" +"14649","Netherlands Antilles","ANT","Sesameseed Cake","fabio" +"14650","Netherlands Antilles","ANT","Oilseed Cakes, Other","fabio" +"14651","Netherlands Antilles","ANT","Wine","fabio" +"14652","Netherlands Antilles","ANT","Beer","fabio" +"14653","Netherlands Antilles","ANT","Beverages, Fermented","fabio" +"14654","Netherlands Antilles","ANT","Beverages, Alcoholic","fabio" +"14655","Netherlands Antilles","ANT","Alcohol, Non-Food","fabio" +"14656","Netherlands Antilles","ANT","Cotton lint","fabio" +"14657","Netherlands Antilles","ANT","Cattle","fabio" +"14658","Netherlands Antilles","ANT","Buffaloes","fabio" +"14659","Netherlands Antilles","ANT","Sheep","fabio" +"14660","Netherlands Antilles","ANT","Goats","fabio" +"14661","Netherlands Antilles","ANT","Pigs","fabio" +"14662","Netherlands Antilles","ANT","Poultry Birds","fabio" +"14663","Netherlands Antilles","ANT","Horses","fabio" +"14664","Netherlands Antilles","ANT","Asses","fabio" +"14665","Netherlands Antilles","ANT","Mules","fabio" +"14666","Netherlands Antilles","ANT","Camels","fabio" +"14667","Netherlands Antilles","ANT","Camelids, other","fabio" +"14668","Netherlands Antilles","ANT","Rabbits and hares","fabio" +"14669","Netherlands Antilles","ANT","Rodents, other","fabio" +"14670","Netherlands Antilles","ANT","Live animals, other","fabio" +"14671","Netherlands Antilles","ANT","Milk - Excluding Butter","fabio" +"14672","Netherlands Antilles","ANT","Butter, Ghee","fabio" +"14673","Netherlands Antilles","ANT","Eggs","fabio" +"14674","Netherlands Antilles","ANT","Wool (Clean Eq.)","fabio" +"14675","Netherlands Antilles","ANT","Bovine Meat","fabio" +"14676","Netherlands Antilles","ANT","Mutton & Goat Meat","fabio" +"14677","Netherlands Antilles","ANT","Pigmeat","fabio" +"14678","Netherlands Antilles","ANT","Poultry Meat","fabio" +"14679","Netherlands Antilles","ANT","Meat, Other","fabio" +"14680","Netherlands Antilles","ANT","Offals, Edible","fabio" +"14681","Netherlands Antilles","ANT","Fats, Animals, Raw","fabio" +"14682","Netherlands Antilles","ANT","Hides and skins","fabio" +"14683","Netherlands Antilles","ANT","Meat Meal","fabio" +"14684","Netherlands Antilles","ANT","Pet food","fabio" +"14685","Netherlands Antilles","ANT","Honey","fabio" +"14686","Netherlands Antilles","ANT","Silk","fabio" +"14687","Netherlands Antilles","ANT","Fish, Seafood","fabio" +"14688","Netherlands Antilles","ANT","Wood fuel","fabio" +"14689","Netherlands Antilles","ANT","Industrial roundwood, coniferous","fabio" +"14690","Netherlands Antilles","ANT","Industrial roundwood, non-coniferous","fabio" +"14691","New Caledonia","NCL","Rice (Milled Equivalent)","fabio" +"14692","New Caledonia","NCL","Wheat and products","fabio" +"14693","New Caledonia","NCL","Barley and products","fabio" +"14694","New Caledonia","NCL","Maize and products","fabio" +"14695","New Caledonia","NCL","Rye and products","fabio" +"14696","New Caledonia","NCL","Oats","fabio" +"14697","New Caledonia","NCL","Millet and products","fabio" +"14698","New Caledonia","NCL","Sorghum and products","fabio" +"14699","New Caledonia","NCL","Cereals, Other","fabio" +"14700","New Caledonia","NCL","Potatoes and products","fabio" +"14701","New Caledonia","NCL","Cassava and products","fabio" +"14702","New Caledonia","NCL","Sweet potatoes","fabio" +"14703","New Caledonia","NCL","Roots, Other","fabio" +"14704","New Caledonia","NCL","Yams","fabio" +"14705","New Caledonia","NCL","Sugar cane","fabio" +"14706","New Caledonia","NCL","Sugar beet","fabio" +"14707","New Caledonia","NCL","Beans","fabio" +"14708","New Caledonia","NCL","Peas","fabio" +"14709","New Caledonia","NCL","Pulses, Other and products","fabio" +"14710","New Caledonia","NCL","Nuts and products","fabio" +"14711","New Caledonia","NCL","Soyabeans","fabio" +"14712","New Caledonia","NCL","Groundnuts (Shelled Eq)","fabio" +"14713","New Caledonia","NCL","Sunflower seed","fabio" +"14714","New Caledonia","NCL","Rape and Mustardseed","fabio" +"14715","New Caledonia","NCL","Seed cotton","fabio" +"14716","New Caledonia","NCL","Coconuts - Incl Copra","fabio" +"14717","New Caledonia","NCL","Sesame seed","fabio" +"14718","New Caledonia","NCL","Oil, palm fruit","fabio" +"14719","New Caledonia","NCL","Olives (including preserved)","fabio" +"14720","New Caledonia","NCL","Oilcrops, Other","fabio" +"14721","New Caledonia","NCL","Tomatoes and products","fabio" +"14722","New Caledonia","NCL","Onions","fabio" +"14723","New Caledonia","NCL","Vegetables, Other","fabio" +"14724","New Caledonia","NCL","Oranges, Mandarines","fabio" +"14725","New Caledonia","NCL","Lemons, Limes and products","fabio" +"14726","New Caledonia","NCL","Grapefruit and products","fabio" +"14727","New Caledonia","NCL","Citrus, Other","fabio" +"14728","New Caledonia","NCL","Bananas","fabio" +"14729","New Caledonia","NCL","Plantains","fabio" +"14730","New Caledonia","NCL","Apples and products","fabio" +"14731","New Caledonia","NCL","Pineapples and products","fabio" +"14732","New Caledonia","NCL","Dates","fabio" +"14733","New Caledonia","NCL","Grapes and products (excl wine)","fabio" +"14734","New Caledonia","NCL","Fruits, Other","fabio" +"14735","New Caledonia","NCL","Coffee and products","fabio" +"14736","New Caledonia","NCL","Cocoa Beans and products","fabio" +"14737","New Caledonia","NCL","Tea (including mate)","fabio" +"14738","New Caledonia","NCL","Hops","fabio" +"14739","New Caledonia","NCL","Pepper","fabio" +"14740","New Caledonia","NCL","Pimento","fabio" +"14741","New Caledonia","NCL","Cloves","fabio" +"14742","New Caledonia","NCL","Spices, Other","fabio" +"14743","New Caledonia","NCL","Jute","fabio" +"14744","New Caledonia","NCL","Jute-Like Fibres","fabio" +"14745","New Caledonia","NCL","Soft-Fibres, Other","fabio" +"14746","New Caledonia","NCL","Sisal","fabio" +"14747","New Caledonia","NCL","Abaca","fabio" +"14748","New Caledonia","NCL","Hard Fibres, Other","fabio" +"14749","New Caledonia","NCL","Tobacco","fabio" +"14750","New Caledonia","NCL","Rubber","fabio" +"14751","New Caledonia","NCL","Fodder crops","fabio" +"14752","New Caledonia","NCL","Grazing","fabio" +"14753","New Caledonia","NCL","Cottonseed","fabio" +"14754","New Caledonia","NCL","Palm kernels","fabio" +"14755","New Caledonia","NCL","Sugar non-centrifugal","fabio" +"14756","New Caledonia","NCL","Molasses","fabio" +"14757","New Caledonia","NCL","Sugar, Refined Equiv","fabio" +"14758","New Caledonia","NCL","Sweeteners, Other","fabio" +"14759","New Caledonia","NCL","Soyabean Oil","fabio" +"14760","New Caledonia","NCL","Groundnut Oil","fabio" +"14761","New Caledonia","NCL","Sunflowerseed Oil","fabio" +"14762","New Caledonia","NCL","Rape and Mustard Oil","fabio" +"14763","New Caledonia","NCL","Cottonseed Oil","fabio" +"14764","New Caledonia","NCL","Palmkernel Oil","fabio" +"14765","New Caledonia","NCL","Palm Oil","fabio" +"14766","New Caledonia","NCL","Coconut Oil","fabio" +"14767","New Caledonia","NCL","Sesameseed Oil","fabio" +"14768","New Caledonia","NCL","Olive Oil","fabio" +"14769","New Caledonia","NCL","Ricebran Oil","fabio" +"14770","New Caledonia","NCL","Maize Germ Oil","fabio" +"14771","New Caledonia","NCL","Oilcrops Oil, Other","fabio" +"14772","New Caledonia","NCL","Soyabean Cake","fabio" +"14773","New Caledonia","NCL","Groundnut Cake","fabio" +"14774","New Caledonia","NCL","Sunflowerseed Cake","fabio" +"14775","New Caledonia","NCL","Rape and Mustard Cake","fabio" +"14776","New Caledonia","NCL","Cottonseed Cake","fabio" +"14777","New Caledonia","NCL","Palmkernel Cake","fabio" +"14778","New Caledonia","NCL","Copra Cake","fabio" +"14779","New Caledonia","NCL","Sesameseed Cake","fabio" +"14780","New Caledonia","NCL","Oilseed Cakes, Other","fabio" +"14781","New Caledonia","NCL","Wine","fabio" +"14782","New Caledonia","NCL","Beer","fabio" +"14783","New Caledonia","NCL","Beverages, Fermented","fabio" +"14784","New Caledonia","NCL","Beverages, Alcoholic","fabio" +"14785","New Caledonia","NCL","Alcohol, Non-Food","fabio" +"14786","New Caledonia","NCL","Cotton lint","fabio" +"14787","New Caledonia","NCL","Cattle","fabio" +"14788","New Caledonia","NCL","Buffaloes","fabio" +"14789","New Caledonia","NCL","Sheep","fabio" +"14790","New Caledonia","NCL","Goats","fabio" +"14791","New Caledonia","NCL","Pigs","fabio" +"14792","New Caledonia","NCL","Poultry Birds","fabio" +"14793","New Caledonia","NCL","Horses","fabio" +"14794","New Caledonia","NCL","Asses","fabio" +"14795","New Caledonia","NCL","Mules","fabio" +"14796","New Caledonia","NCL","Camels","fabio" +"14797","New Caledonia","NCL","Camelids, other","fabio" +"14798","New Caledonia","NCL","Rabbits and hares","fabio" +"14799","New Caledonia","NCL","Rodents, other","fabio" +"14800","New Caledonia","NCL","Live animals, other","fabio" +"14801","New Caledonia","NCL","Milk - Excluding Butter","fabio" +"14802","New Caledonia","NCL","Butter, Ghee","fabio" +"14803","New Caledonia","NCL","Eggs","fabio" +"14804","New Caledonia","NCL","Wool (Clean Eq.)","fabio" +"14805","New Caledonia","NCL","Bovine Meat","fabio" +"14806","New Caledonia","NCL","Mutton & Goat Meat","fabio" +"14807","New Caledonia","NCL","Pigmeat","fabio" +"14808","New Caledonia","NCL","Poultry Meat","fabio" +"14809","New Caledonia","NCL","Meat, Other","fabio" +"14810","New Caledonia","NCL","Offals, Edible","fabio" +"14811","New Caledonia","NCL","Fats, Animals, Raw","fabio" +"14812","New Caledonia","NCL","Hides and skins","fabio" +"14813","New Caledonia","NCL","Meat Meal","fabio" +"14814","New Caledonia","NCL","Pet food","fabio" +"14815","New Caledonia","NCL","Honey","fabio" +"14816","New Caledonia","NCL","Silk","fabio" +"14817","New Caledonia","NCL","Fish, Seafood","fabio" +"14818","New Caledonia","NCL","Wood fuel","fabio" +"14819","New Caledonia","NCL","Industrial roundwood, coniferous","fabio" +"14820","New Caledonia","NCL","Industrial roundwood, non-coniferous","fabio" +"14821","The former Yugoslav Republic of Macedonia","MKD","Rice (Milled Equivalent)","fabio" +"14822","The former Yugoslav Republic of Macedonia","MKD","Wheat and products","fabio" +"14823","The former Yugoslav Republic of Macedonia","MKD","Barley and products","fabio" +"14824","The former Yugoslav Republic of Macedonia","MKD","Maize and products","fabio" +"14825","The former Yugoslav Republic of Macedonia","MKD","Rye and products","fabio" +"14826","The former Yugoslav Republic of Macedonia","MKD","Oats","fabio" +"14827","The former Yugoslav Republic of Macedonia","MKD","Millet and products","fabio" +"14828","The former Yugoslav Republic of Macedonia","MKD","Sorghum and products","fabio" +"14829","The former Yugoslav Republic of Macedonia","MKD","Cereals, Other","fabio" +"14830","The former Yugoslav Republic of Macedonia","MKD","Potatoes and products","fabio" +"14831","The former Yugoslav Republic of Macedonia","MKD","Cassava and products","fabio" +"14832","The former Yugoslav Republic of Macedonia","MKD","Sweet potatoes","fabio" +"14833","The former Yugoslav Republic of Macedonia","MKD","Roots, Other","fabio" +"14834","The former Yugoslav Republic of Macedonia","MKD","Yams","fabio" +"14835","The former Yugoslav Republic of Macedonia","MKD","Sugar cane","fabio" +"14836","The former Yugoslav Republic of Macedonia","MKD","Sugar beet","fabio" +"14837","The former Yugoslav Republic of Macedonia","MKD","Beans","fabio" +"14838","The former Yugoslav Republic of Macedonia","MKD","Peas","fabio" +"14839","The former Yugoslav Republic of Macedonia","MKD","Pulses, Other and products","fabio" +"14840","The former Yugoslav Republic of Macedonia","MKD","Nuts and products","fabio" +"14841","The former Yugoslav Republic of Macedonia","MKD","Soyabeans","fabio" +"14842","The former Yugoslav Republic of Macedonia","MKD","Groundnuts (Shelled Eq)","fabio" +"14843","The former Yugoslav Republic of Macedonia","MKD","Sunflower seed","fabio" +"14844","The former Yugoslav Republic of Macedonia","MKD","Rape and Mustardseed","fabio" +"14845","The former Yugoslav Republic of Macedonia","MKD","Seed cotton","fabio" +"14846","The former Yugoslav Republic of Macedonia","MKD","Coconuts - Incl Copra","fabio" +"14847","The former Yugoslav Republic of Macedonia","MKD","Sesame seed","fabio" +"14848","The former Yugoslav Republic of Macedonia","MKD","Oil, palm fruit","fabio" +"14849","The former Yugoslav Republic of Macedonia","MKD","Olives (including preserved)","fabio" +"14850","The former Yugoslav Republic of Macedonia","MKD","Oilcrops, Other","fabio" +"14851","The former Yugoslav Republic of Macedonia","MKD","Tomatoes and products","fabio" +"14852","The former Yugoslav Republic of Macedonia","MKD","Onions","fabio" +"14853","The former Yugoslav Republic of Macedonia","MKD","Vegetables, Other","fabio" +"14854","The former Yugoslav Republic of Macedonia","MKD","Oranges, Mandarines","fabio" +"14855","The former Yugoslav Republic of Macedonia","MKD","Lemons, Limes and products","fabio" +"14856","The former Yugoslav Republic of Macedonia","MKD","Grapefruit and products","fabio" +"14857","The former Yugoslav Republic of Macedonia","MKD","Citrus, Other","fabio" +"14858","The former Yugoslav Republic of Macedonia","MKD","Bananas","fabio" +"14859","The former Yugoslav Republic of Macedonia","MKD","Plantains","fabio" +"14860","The former Yugoslav Republic of Macedonia","MKD","Apples and products","fabio" +"14861","The former Yugoslav Republic of Macedonia","MKD","Pineapples and products","fabio" +"14862","The former Yugoslav Republic of Macedonia","MKD","Dates","fabio" +"14863","The former Yugoslav Republic of Macedonia","MKD","Grapes and products (excl wine)","fabio" +"14864","The former Yugoslav Republic of Macedonia","MKD","Fruits, Other","fabio" +"14865","The former Yugoslav Republic of Macedonia","MKD","Coffee and products","fabio" +"14866","The former Yugoslav Republic of Macedonia","MKD","Cocoa Beans and products","fabio" +"14867","The former Yugoslav Republic of Macedonia","MKD","Tea (including mate)","fabio" +"14868","The former Yugoslav Republic of Macedonia","MKD","Hops","fabio" +"14869","The former Yugoslav Republic of Macedonia","MKD","Pepper","fabio" +"14870","The former Yugoslav Republic of Macedonia","MKD","Pimento","fabio" +"14871","The former Yugoslav Republic of Macedonia","MKD","Cloves","fabio" +"14872","The former Yugoslav Republic of Macedonia","MKD","Spices, Other","fabio" +"14873","The former Yugoslav Republic of Macedonia","MKD","Jute","fabio" +"14874","The former Yugoslav Republic of Macedonia","MKD","Jute-Like Fibres","fabio" +"14875","The former Yugoslav Republic of Macedonia","MKD","Soft-Fibres, Other","fabio" +"14876","The former Yugoslav Republic of Macedonia","MKD","Sisal","fabio" +"14877","The former Yugoslav Republic of Macedonia","MKD","Abaca","fabio" +"14878","The former Yugoslav Republic of Macedonia","MKD","Hard Fibres, Other","fabio" +"14879","The former Yugoslav Republic of Macedonia","MKD","Tobacco","fabio" +"14880","The former Yugoslav Republic of Macedonia","MKD","Rubber","fabio" +"14881","The former Yugoslav Republic of Macedonia","MKD","Fodder crops","fabio" +"14882","The former Yugoslav Republic of Macedonia","MKD","Grazing","fabio" +"14883","The former Yugoslav Republic of Macedonia","MKD","Cottonseed","fabio" +"14884","The former Yugoslav Republic of Macedonia","MKD","Palm kernels","fabio" +"14885","The former Yugoslav Republic of Macedonia","MKD","Sugar non-centrifugal","fabio" +"14886","The former Yugoslav Republic of Macedonia","MKD","Molasses","fabio" +"14887","The former Yugoslav Republic of Macedonia","MKD","Sugar, Refined Equiv","fabio" +"14888","The former Yugoslav Republic of Macedonia","MKD","Sweeteners, Other","fabio" +"14889","The former Yugoslav Republic of Macedonia","MKD","Soyabean Oil","fabio" +"14890","The former Yugoslav Republic of Macedonia","MKD","Groundnut Oil","fabio" +"14891","The former Yugoslav Republic of Macedonia","MKD","Sunflowerseed Oil","fabio" +"14892","The former Yugoslav Republic of Macedonia","MKD","Rape and Mustard Oil","fabio" +"14893","The former Yugoslav Republic of Macedonia","MKD","Cottonseed Oil","fabio" +"14894","The former Yugoslav Republic of Macedonia","MKD","Palmkernel Oil","fabio" +"14895","The former Yugoslav Republic of Macedonia","MKD","Palm Oil","fabio" +"14896","The former Yugoslav Republic of Macedonia","MKD","Coconut Oil","fabio" +"14897","The former Yugoslav Republic of Macedonia","MKD","Sesameseed Oil","fabio" +"14898","The former Yugoslav Republic of Macedonia","MKD","Olive Oil","fabio" +"14899","The former Yugoslav Republic of Macedonia","MKD","Ricebran Oil","fabio" +"14900","The former Yugoslav Republic of Macedonia","MKD","Maize Germ Oil","fabio" +"14901","The former Yugoslav Republic of Macedonia","MKD","Oilcrops Oil, Other","fabio" +"14902","The former Yugoslav Republic of Macedonia","MKD","Soyabean Cake","fabio" +"14903","The former Yugoslav Republic of Macedonia","MKD","Groundnut Cake","fabio" +"14904","The former Yugoslav Republic of Macedonia","MKD","Sunflowerseed Cake","fabio" +"14905","The former Yugoslav Republic of Macedonia","MKD","Rape and Mustard Cake","fabio" +"14906","The former Yugoslav Republic of Macedonia","MKD","Cottonseed Cake","fabio" +"14907","The former Yugoslav Republic of Macedonia","MKD","Palmkernel Cake","fabio" +"14908","The former Yugoslav Republic of Macedonia","MKD","Copra Cake","fabio" +"14909","The former Yugoslav Republic of Macedonia","MKD","Sesameseed Cake","fabio" +"14910","The former Yugoslav Republic of Macedonia","MKD","Oilseed Cakes, Other","fabio" +"14911","The former Yugoslav Republic of Macedonia","MKD","Wine","fabio" +"14912","The former Yugoslav Republic of Macedonia","MKD","Beer","fabio" +"14913","The former Yugoslav Republic of Macedonia","MKD","Beverages, Fermented","fabio" +"14914","The former Yugoslav Republic of Macedonia","MKD","Beverages, Alcoholic","fabio" +"14915","The former Yugoslav Republic of Macedonia","MKD","Alcohol, Non-Food","fabio" +"14916","The former Yugoslav Republic of Macedonia","MKD","Cotton lint","fabio" +"14917","The former Yugoslav Republic of Macedonia","MKD","Cattle","fabio" +"14918","The former Yugoslav Republic of Macedonia","MKD","Buffaloes","fabio" +"14919","The former Yugoslav Republic of Macedonia","MKD","Sheep","fabio" +"14920","The former Yugoslav Republic of Macedonia","MKD","Goats","fabio" +"14921","The former Yugoslav Republic of Macedonia","MKD","Pigs","fabio" +"14922","The former Yugoslav Republic of Macedonia","MKD","Poultry Birds","fabio" +"14923","The former Yugoslav Republic of Macedonia","MKD","Horses","fabio" +"14924","The former Yugoslav Republic of Macedonia","MKD","Asses","fabio" +"14925","The former Yugoslav Republic of Macedonia","MKD","Mules","fabio" +"14926","The former Yugoslav Republic of Macedonia","MKD","Camels","fabio" +"14927","The former Yugoslav Republic of Macedonia","MKD","Camelids, other","fabio" +"14928","The former Yugoslav Republic of Macedonia","MKD","Rabbits and hares","fabio" +"14929","The former Yugoslav Republic of Macedonia","MKD","Rodents, other","fabio" +"14930","The former Yugoslav Republic of Macedonia","MKD","Live animals, other","fabio" +"14931","The former Yugoslav Republic of Macedonia","MKD","Milk - Excluding Butter","fabio" +"14932","The former Yugoslav Republic of Macedonia","MKD","Butter, Ghee","fabio" +"14933","The former Yugoslav Republic of Macedonia","MKD","Eggs","fabio" +"14934","The former Yugoslav Republic of Macedonia","MKD","Wool (Clean Eq.)","fabio" +"14935","The former Yugoslav Republic of Macedonia","MKD","Bovine Meat","fabio" +"14936","The former Yugoslav Republic of Macedonia","MKD","Mutton & Goat Meat","fabio" +"14937","The former Yugoslav Republic of Macedonia","MKD","Pigmeat","fabio" +"14938","The former Yugoslav Republic of Macedonia","MKD","Poultry Meat","fabio" +"14939","The former Yugoslav Republic of Macedonia","MKD","Meat, Other","fabio" +"14940","The former Yugoslav Republic of Macedonia","MKD","Offals, Edible","fabio" +"14941","The former Yugoslav Republic of Macedonia","MKD","Fats, Animals, Raw","fabio" +"14942","The former Yugoslav Republic of Macedonia","MKD","Hides and skins","fabio" +"14943","The former Yugoslav Republic of Macedonia","MKD","Meat Meal","fabio" +"14944","The former Yugoslav Republic of Macedonia","MKD","Pet food","fabio" +"14945","The former Yugoslav Republic of Macedonia","MKD","Honey","fabio" +"14946","The former Yugoslav Republic of Macedonia","MKD","Silk","fabio" +"14947","The former Yugoslav Republic of Macedonia","MKD","Fish, Seafood","fabio" +"14948","The former Yugoslav Republic of Macedonia","MKD","Wood fuel","fabio" +"14949","The former Yugoslav Republic of Macedonia","MKD","Industrial roundwood, coniferous","fabio" +"14950","The former Yugoslav Republic of Macedonia","MKD","Industrial roundwood, non-coniferous","fabio" +"14951","Vanuatu","VUT","Rice (Milled Equivalent)","fabio" +"14952","Vanuatu","VUT","Wheat and products","fabio" +"14953","Vanuatu","VUT","Barley and products","fabio" +"14954","Vanuatu","VUT","Maize and products","fabio" +"14955","Vanuatu","VUT","Rye and products","fabio" +"14956","Vanuatu","VUT","Oats","fabio" +"14957","Vanuatu","VUT","Millet and products","fabio" +"14958","Vanuatu","VUT","Sorghum and products","fabio" +"14959","Vanuatu","VUT","Cereals, Other","fabio" +"14960","Vanuatu","VUT","Potatoes and products","fabio" +"14961","Vanuatu","VUT","Cassava and products","fabio" +"14962","Vanuatu","VUT","Sweet potatoes","fabio" +"14963","Vanuatu","VUT","Roots, Other","fabio" +"14964","Vanuatu","VUT","Yams","fabio" +"14965","Vanuatu","VUT","Sugar cane","fabio" +"14966","Vanuatu","VUT","Sugar beet","fabio" +"14967","Vanuatu","VUT","Beans","fabio" +"14968","Vanuatu","VUT","Peas","fabio" +"14969","Vanuatu","VUT","Pulses, Other and products","fabio" +"14970","Vanuatu","VUT","Nuts and products","fabio" +"14971","Vanuatu","VUT","Soyabeans","fabio" +"14972","Vanuatu","VUT","Groundnuts (Shelled Eq)","fabio" +"14973","Vanuatu","VUT","Sunflower seed","fabio" +"14974","Vanuatu","VUT","Rape and Mustardseed","fabio" +"14975","Vanuatu","VUT","Seed cotton","fabio" +"14976","Vanuatu","VUT","Coconuts - Incl Copra","fabio" +"14977","Vanuatu","VUT","Sesame seed","fabio" +"14978","Vanuatu","VUT","Oil, palm fruit","fabio" +"14979","Vanuatu","VUT","Olives (including preserved)","fabio" +"14980","Vanuatu","VUT","Oilcrops, Other","fabio" +"14981","Vanuatu","VUT","Tomatoes and products","fabio" +"14982","Vanuatu","VUT","Onions","fabio" +"14983","Vanuatu","VUT","Vegetables, Other","fabio" +"14984","Vanuatu","VUT","Oranges, Mandarines","fabio" +"14985","Vanuatu","VUT","Lemons, Limes and products","fabio" +"14986","Vanuatu","VUT","Grapefruit and products","fabio" +"14987","Vanuatu","VUT","Citrus, Other","fabio" +"14988","Vanuatu","VUT","Bananas","fabio" +"14989","Vanuatu","VUT","Plantains","fabio" +"14990","Vanuatu","VUT","Apples and products","fabio" +"14991","Vanuatu","VUT","Pineapples and products","fabio" +"14992","Vanuatu","VUT","Dates","fabio" +"14993","Vanuatu","VUT","Grapes and products (excl wine)","fabio" +"14994","Vanuatu","VUT","Fruits, Other","fabio" +"14995","Vanuatu","VUT","Coffee and products","fabio" +"14996","Vanuatu","VUT","Cocoa Beans and products","fabio" +"14997","Vanuatu","VUT","Tea (including mate)","fabio" +"14998","Vanuatu","VUT","Hops","fabio" +"14999","Vanuatu","VUT","Pepper","fabio" +"15000","Vanuatu","VUT","Pimento","fabio" +"15001","Vanuatu","VUT","Cloves","fabio" +"15002","Vanuatu","VUT","Spices, Other","fabio" +"15003","Vanuatu","VUT","Jute","fabio" +"15004","Vanuatu","VUT","Jute-Like Fibres","fabio" +"15005","Vanuatu","VUT","Soft-Fibres, Other","fabio" +"15006","Vanuatu","VUT","Sisal","fabio" +"15007","Vanuatu","VUT","Abaca","fabio" +"15008","Vanuatu","VUT","Hard Fibres, Other","fabio" +"15009","Vanuatu","VUT","Tobacco","fabio" +"15010","Vanuatu","VUT","Rubber","fabio" +"15011","Vanuatu","VUT","Fodder crops","fabio" +"15012","Vanuatu","VUT","Grazing","fabio" +"15013","Vanuatu","VUT","Cottonseed","fabio" +"15014","Vanuatu","VUT","Palm kernels","fabio" +"15015","Vanuatu","VUT","Sugar non-centrifugal","fabio" +"15016","Vanuatu","VUT","Molasses","fabio" +"15017","Vanuatu","VUT","Sugar, Refined Equiv","fabio" +"15018","Vanuatu","VUT","Sweeteners, Other","fabio" +"15019","Vanuatu","VUT","Soyabean Oil","fabio" +"15020","Vanuatu","VUT","Groundnut Oil","fabio" +"15021","Vanuatu","VUT","Sunflowerseed Oil","fabio" +"15022","Vanuatu","VUT","Rape and Mustard Oil","fabio" +"15023","Vanuatu","VUT","Cottonseed Oil","fabio" +"15024","Vanuatu","VUT","Palmkernel Oil","fabio" +"15025","Vanuatu","VUT","Palm Oil","fabio" +"15026","Vanuatu","VUT","Coconut Oil","fabio" +"15027","Vanuatu","VUT","Sesameseed Oil","fabio" +"15028","Vanuatu","VUT","Olive Oil","fabio" +"15029","Vanuatu","VUT","Ricebran Oil","fabio" +"15030","Vanuatu","VUT","Maize Germ Oil","fabio" +"15031","Vanuatu","VUT","Oilcrops Oil, Other","fabio" +"15032","Vanuatu","VUT","Soyabean Cake","fabio" +"15033","Vanuatu","VUT","Groundnut Cake","fabio" +"15034","Vanuatu","VUT","Sunflowerseed Cake","fabio" +"15035","Vanuatu","VUT","Rape and Mustard Cake","fabio" +"15036","Vanuatu","VUT","Cottonseed Cake","fabio" +"15037","Vanuatu","VUT","Palmkernel Cake","fabio" +"15038","Vanuatu","VUT","Copra Cake","fabio" +"15039","Vanuatu","VUT","Sesameseed Cake","fabio" +"15040","Vanuatu","VUT","Oilseed Cakes, Other","fabio" +"15041","Vanuatu","VUT","Wine","fabio" +"15042","Vanuatu","VUT","Beer","fabio" +"15043","Vanuatu","VUT","Beverages, Fermented","fabio" +"15044","Vanuatu","VUT","Beverages, Alcoholic","fabio" +"15045","Vanuatu","VUT","Alcohol, Non-Food","fabio" +"15046","Vanuatu","VUT","Cotton lint","fabio" +"15047","Vanuatu","VUT","Cattle","fabio" +"15048","Vanuatu","VUT","Buffaloes","fabio" +"15049","Vanuatu","VUT","Sheep","fabio" +"15050","Vanuatu","VUT","Goats","fabio" +"15051","Vanuatu","VUT","Pigs","fabio" +"15052","Vanuatu","VUT","Poultry Birds","fabio" +"15053","Vanuatu","VUT","Horses","fabio" +"15054","Vanuatu","VUT","Asses","fabio" +"15055","Vanuatu","VUT","Mules","fabio" +"15056","Vanuatu","VUT","Camels","fabio" +"15057","Vanuatu","VUT","Camelids, other","fabio" +"15058","Vanuatu","VUT","Rabbits and hares","fabio" +"15059","Vanuatu","VUT","Rodents, other","fabio" +"15060","Vanuatu","VUT","Live animals, other","fabio" +"15061","Vanuatu","VUT","Milk - Excluding Butter","fabio" +"15062","Vanuatu","VUT","Butter, Ghee","fabio" +"15063","Vanuatu","VUT","Eggs","fabio" +"15064","Vanuatu","VUT","Wool (Clean Eq.)","fabio" +"15065","Vanuatu","VUT","Bovine Meat","fabio" +"15066","Vanuatu","VUT","Mutton & Goat Meat","fabio" +"15067","Vanuatu","VUT","Pigmeat","fabio" +"15068","Vanuatu","VUT","Poultry Meat","fabio" +"15069","Vanuatu","VUT","Meat, Other","fabio" +"15070","Vanuatu","VUT","Offals, Edible","fabio" +"15071","Vanuatu","VUT","Fats, Animals, Raw","fabio" +"15072","Vanuatu","VUT","Hides and skins","fabio" +"15073","Vanuatu","VUT","Meat Meal","fabio" +"15074","Vanuatu","VUT","Pet food","fabio" +"15075","Vanuatu","VUT","Honey","fabio" +"15076","Vanuatu","VUT","Silk","fabio" +"15077","Vanuatu","VUT","Fish, Seafood","fabio" +"15078","Vanuatu","VUT","Wood fuel","fabio" +"15079","Vanuatu","VUT","Industrial roundwood, coniferous","fabio" +"15080","Vanuatu","VUT","Industrial roundwood, non-coniferous","fabio" +"15081","New Zealand","NZL","Rice (Milled Equivalent)","fabio" +"15082","New Zealand","NZL","Wheat and products","fabio" +"15083","New Zealand","NZL","Barley and products","fabio" +"15084","New Zealand","NZL","Maize and products","fabio" +"15085","New Zealand","NZL","Rye and products","fabio" +"15086","New Zealand","NZL","Oats","fabio" +"15087","New Zealand","NZL","Millet and products","fabio" +"15088","New Zealand","NZL","Sorghum and products","fabio" +"15089","New Zealand","NZL","Cereals, Other","fabio" +"15090","New Zealand","NZL","Potatoes and products","fabio" +"15091","New Zealand","NZL","Cassava and products","fabio" +"15092","New Zealand","NZL","Sweet potatoes","fabio" +"15093","New Zealand","NZL","Roots, Other","fabio" +"15094","New Zealand","NZL","Yams","fabio" +"15095","New Zealand","NZL","Sugar cane","fabio" +"15096","New Zealand","NZL","Sugar beet","fabio" +"15097","New Zealand","NZL","Beans","fabio" +"15098","New Zealand","NZL","Peas","fabio" +"15099","New Zealand","NZL","Pulses, Other and products","fabio" +"15100","New Zealand","NZL","Nuts and products","fabio" +"15101","New Zealand","NZL","Soyabeans","fabio" +"15102","New Zealand","NZL","Groundnuts (Shelled Eq)","fabio" +"15103","New Zealand","NZL","Sunflower seed","fabio" +"15104","New Zealand","NZL","Rape and Mustardseed","fabio" +"15105","New Zealand","NZL","Seed cotton","fabio" +"15106","New Zealand","NZL","Coconuts - Incl Copra","fabio" +"15107","New Zealand","NZL","Sesame seed","fabio" +"15108","New Zealand","NZL","Oil, palm fruit","fabio" +"15109","New Zealand","NZL","Olives (including preserved)","fabio" +"15110","New Zealand","NZL","Oilcrops, Other","fabio" +"15111","New Zealand","NZL","Tomatoes and products","fabio" +"15112","New Zealand","NZL","Onions","fabio" +"15113","New Zealand","NZL","Vegetables, Other","fabio" +"15114","New Zealand","NZL","Oranges, Mandarines","fabio" +"15115","New Zealand","NZL","Lemons, Limes and products","fabio" +"15116","New Zealand","NZL","Grapefruit and products","fabio" +"15117","New Zealand","NZL","Citrus, Other","fabio" +"15118","New Zealand","NZL","Bananas","fabio" +"15119","New Zealand","NZL","Plantains","fabio" +"15120","New Zealand","NZL","Apples and products","fabio" +"15121","New Zealand","NZL","Pineapples and products","fabio" +"15122","New Zealand","NZL","Dates","fabio" +"15123","New Zealand","NZL","Grapes and products (excl wine)","fabio" +"15124","New Zealand","NZL","Fruits, Other","fabio" +"15125","New Zealand","NZL","Coffee and products","fabio" +"15126","New Zealand","NZL","Cocoa Beans and products","fabio" +"15127","New Zealand","NZL","Tea (including mate)","fabio" +"15128","New Zealand","NZL","Hops","fabio" +"15129","New Zealand","NZL","Pepper","fabio" +"15130","New Zealand","NZL","Pimento","fabio" +"15131","New Zealand","NZL","Cloves","fabio" +"15132","New Zealand","NZL","Spices, Other","fabio" +"15133","New Zealand","NZL","Jute","fabio" +"15134","New Zealand","NZL","Jute-Like Fibres","fabio" +"15135","New Zealand","NZL","Soft-Fibres, Other","fabio" +"15136","New Zealand","NZL","Sisal","fabio" +"15137","New Zealand","NZL","Abaca","fabio" +"15138","New Zealand","NZL","Hard Fibres, Other","fabio" +"15139","New Zealand","NZL","Tobacco","fabio" +"15140","New Zealand","NZL","Rubber","fabio" +"15141","New Zealand","NZL","Fodder crops","fabio" +"15142","New Zealand","NZL","Grazing","fabio" +"15143","New Zealand","NZL","Cottonseed","fabio" +"15144","New Zealand","NZL","Palm kernels","fabio" +"15145","New Zealand","NZL","Sugar non-centrifugal","fabio" +"15146","New Zealand","NZL","Molasses","fabio" +"15147","New Zealand","NZL","Sugar, Refined Equiv","fabio" +"15148","New Zealand","NZL","Sweeteners, Other","fabio" +"15149","New Zealand","NZL","Soyabean Oil","fabio" +"15150","New Zealand","NZL","Groundnut Oil","fabio" +"15151","New Zealand","NZL","Sunflowerseed Oil","fabio" +"15152","New Zealand","NZL","Rape and Mustard Oil","fabio" +"15153","New Zealand","NZL","Cottonseed Oil","fabio" +"15154","New Zealand","NZL","Palmkernel Oil","fabio" +"15155","New Zealand","NZL","Palm Oil","fabio" +"15156","New Zealand","NZL","Coconut Oil","fabio" +"15157","New Zealand","NZL","Sesameseed Oil","fabio" +"15158","New Zealand","NZL","Olive Oil","fabio" +"15159","New Zealand","NZL","Ricebran Oil","fabio" +"15160","New Zealand","NZL","Maize Germ Oil","fabio" +"15161","New Zealand","NZL","Oilcrops Oil, Other","fabio" +"15162","New Zealand","NZL","Soyabean Cake","fabio" +"15163","New Zealand","NZL","Groundnut Cake","fabio" +"15164","New Zealand","NZL","Sunflowerseed Cake","fabio" +"15165","New Zealand","NZL","Rape and Mustard Cake","fabio" +"15166","New Zealand","NZL","Cottonseed Cake","fabio" +"15167","New Zealand","NZL","Palmkernel Cake","fabio" +"15168","New Zealand","NZL","Copra Cake","fabio" +"15169","New Zealand","NZL","Sesameseed Cake","fabio" +"15170","New Zealand","NZL","Oilseed Cakes, Other","fabio" +"15171","New Zealand","NZL","Wine","fabio" +"15172","New Zealand","NZL","Beer","fabio" +"15173","New Zealand","NZL","Beverages, Fermented","fabio" +"15174","New Zealand","NZL","Beverages, Alcoholic","fabio" +"15175","New Zealand","NZL","Alcohol, Non-Food","fabio" +"15176","New Zealand","NZL","Cotton lint","fabio" +"15177","New Zealand","NZL","Cattle","fabio" +"15178","New Zealand","NZL","Buffaloes","fabio" +"15179","New Zealand","NZL","Sheep","fabio" +"15180","New Zealand","NZL","Goats","fabio" +"15181","New Zealand","NZL","Pigs","fabio" +"15182","New Zealand","NZL","Poultry Birds","fabio" +"15183","New Zealand","NZL","Horses","fabio" +"15184","New Zealand","NZL","Asses","fabio" +"15185","New Zealand","NZL","Mules","fabio" +"15186","New Zealand","NZL","Camels","fabio" +"15187","New Zealand","NZL","Camelids, other","fabio" +"15188","New Zealand","NZL","Rabbits and hares","fabio" +"15189","New Zealand","NZL","Rodents, other","fabio" +"15190","New Zealand","NZL","Live animals, other","fabio" +"15191","New Zealand","NZL","Milk - Excluding Butter","fabio" +"15192","New Zealand","NZL","Butter, Ghee","fabio" +"15193","New Zealand","NZL","Eggs","fabio" +"15194","New Zealand","NZL","Wool (Clean Eq.)","fabio" +"15195","New Zealand","NZL","Bovine Meat","fabio" +"15196","New Zealand","NZL","Mutton & Goat Meat","fabio" +"15197","New Zealand","NZL","Pigmeat","fabio" +"15198","New Zealand","NZL","Poultry Meat","fabio" +"15199","New Zealand","NZL","Meat, Other","fabio" +"15200","New Zealand","NZL","Offals, Edible","fabio" +"15201","New Zealand","NZL","Fats, Animals, Raw","fabio" +"15202","New Zealand","NZL","Hides and skins","fabio" +"15203","New Zealand","NZL","Meat Meal","fabio" +"15204","New Zealand","NZL","Pet food","fabio" +"15205","New Zealand","NZL","Honey","fabio" +"15206","New Zealand","NZL","Silk","fabio" +"15207","New Zealand","NZL","Fish, Seafood","fabio" +"15208","New Zealand","NZL","Wood fuel","fabio" +"15209","New Zealand","NZL","Industrial roundwood, coniferous","fabio" +"15210","New Zealand","NZL","Industrial roundwood, non-coniferous","fabio" +"15211","Nicaragua","NIC","Rice (Milled Equivalent)","fabio" +"15212","Nicaragua","NIC","Wheat and products","fabio" +"15213","Nicaragua","NIC","Barley and products","fabio" +"15214","Nicaragua","NIC","Maize and products","fabio" +"15215","Nicaragua","NIC","Rye and products","fabio" +"15216","Nicaragua","NIC","Oats","fabio" +"15217","Nicaragua","NIC","Millet and products","fabio" +"15218","Nicaragua","NIC","Sorghum and products","fabio" +"15219","Nicaragua","NIC","Cereals, Other","fabio" +"15220","Nicaragua","NIC","Potatoes and products","fabio" +"15221","Nicaragua","NIC","Cassava and products","fabio" +"15222","Nicaragua","NIC","Sweet potatoes","fabio" +"15223","Nicaragua","NIC","Roots, Other","fabio" +"15224","Nicaragua","NIC","Yams","fabio" +"15225","Nicaragua","NIC","Sugar cane","fabio" +"15226","Nicaragua","NIC","Sugar beet","fabio" +"15227","Nicaragua","NIC","Beans","fabio" +"15228","Nicaragua","NIC","Peas","fabio" +"15229","Nicaragua","NIC","Pulses, Other and products","fabio" +"15230","Nicaragua","NIC","Nuts and products","fabio" +"15231","Nicaragua","NIC","Soyabeans","fabio" +"15232","Nicaragua","NIC","Groundnuts (Shelled Eq)","fabio" +"15233","Nicaragua","NIC","Sunflower seed","fabio" +"15234","Nicaragua","NIC","Rape and Mustardseed","fabio" +"15235","Nicaragua","NIC","Seed cotton","fabio" +"15236","Nicaragua","NIC","Coconuts - Incl Copra","fabio" +"15237","Nicaragua","NIC","Sesame seed","fabio" +"15238","Nicaragua","NIC","Oil, palm fruit","fabio" +"15239","Nicaragua","NIC","Olives (including preserved)","fabio" +"15240","Nicaragua","NIC","Oilcrops, Other","fabio" +"15241","Nicaragua","NIC","Tomatoes and products","fabio" +"15242","Nicaragua","NIC","Onions","fabio" +"15243","Nicaragua","NIC","Vegetables, Other","fabio" +"15244","Nicaragua","NIC","Oranges, Mandarines","fabio" +"15245","Nicaragua","NIC","Lemons, Limes and products","fabio" +"15246","Nicaragua","NIC","Grapefruit and products","fabio" +"15247","Nicaragua","NIC","Citrus, Other","fabio" +"15248","Nicaragua","NIC","Bananas","fabio" +"15249","Nicaragua","NIC","Plantains","fabio" +"15250","Nicaragua","NIC","Apples and products","fabio" +"15251","Nicaragua","NIC","Pineapples and products","fabio" +"15252","Nicaragua","NIC","Dates","fabio" +"15253","Nicaragua","NIC","Grapes and products (excl wine)","fabio" +"15254","Nicaragua","NIC","Fruits, Other","fabio" +"15255","Nicaragua","NIC","Coffee and products","fabio" +"15256","Nicaragua","NIC","Cocoa Beans and products","fabio" +"15257","Nicaragua","NIC","Tea (including mate)","fabio" +"15258","Nicaragua","NIC","Hops","fabio" +"15259","Nicaragua","NIC","Pepper","fabio" +"15260","Nicaragua","NIC","Pimento","fabio" +"15261","Nicaragua","NIC","Cloves","fabio" +"15262","Nicaragua","NIC","Spices, Other","fabio" +"15263","Nicaragua","NIC","Jute","fabio" +"15264","Nicaragua","NIC","Jute-Like Fibres","fabio" +"15265","Nicaragua","NIC","Soft-Fibres, Other","fabio" +"15266","Nicaragua","NIC","Sisal","fabio" +"15267","Nicaragua","NIC","Abaca","fabio" +"15268","Nicaragua","NIC","Hard Fibres, Other","fabio" +"15269","Nicaragua","NIC","Tobacco","fabio" +"15270","Nicaragua","NIC","Rubber","fabio" +"15271","Nicaragua","NIC","Fodder crops","fabio" +"15272","Nicaragua","NIC","Grazing","fabio" +"15273","Nicaragua","NIC","Cottonseed","fabio" +"15274","Nicaragua","NIC","Palm kernels","fabio" +"15275","Nicaragua","NIC","Sugar non-centrifugal","fabio" +"15276","Nicaragua","NIC","Molasses","fabio" +"15277","Nicaragua","NIC","Sugar, Refined Equiv","fabio" +"15278","Nicaragua","NIC","Sweeteners, Other","fabio" +"15279","Nicaragua","NIC","Soyabean Oil","fabio" +"15280","Nicaragua","NIC","Groundnut Oil","fabio" +"15281","Nicaragua","NIC","Sunflowerseed Oil","fabio" +"15282","Nicaragua","NIC","Rape and Mustard Oil","fabio" +"15283","Nicaragua","NIC","Cottonseed Oil","fabio" +"15284","Nicaragua","NIC","Palmkernel Oil","fabio" +"15285","Nicaragua","NIC","Palm Oil","fabio" +"15286","Nicaragua","NIC","Coconut Oil","fabio" +"15287","Nicaragua","NIC","Sesameseed Oil","fabio" +"15288","Nicaragua","NIC","Olive Oil","fabio" +"15289","Nicaragua","NIC","Ricebran Oil","fabio" +"15290","Nicaragua","NIC","Maize Germ Oil","fabio" +"15291","Nicaragua","NIC","Oilcrops Oil, Other","fabio" +"15292","Nicaragua","NIC","Soyabean Cake","fabio" +"15293","Nicaragua","NIC","Groundnut Cake","fabio" +"15294","Nicaragua","NIC","Sunflowerseed Cake","fabio" +"15295","Nicaragua","NIC","Rape and Mustard Cake","fabio" +"15296","Nicaragua","NIC","Cottonseed Cake","fabio" +"15297","Nicaragua","NIC","Palmkernel Cake","fabio" +"15298","Nicaragua","NIC","Copra Cake","fabio" +"15299","Nicaragua","NIC","Sesameseed Cake","fabio" +"15300","Nicaragua","NIC","Oilseed Cakes, Other","fabio" +"15301","Nicaragua","NIC","Wine","fabio" +"15302","Nicaragua","NIC","Beer","fabio" +"15303","Nicaragua","NIC","Beverages, Fermented","fabio" +"15304","Nicaragua","NIC","Beverages, Alcoholic","fabio" +"15305","Nicaragua","NIC","Alcohol, Non-Food","fabio" +"15306","Nicaragua","NIC","Cotton lint","fabio" +"15307","Nicaragua","NIC","Cattle","fabio" +"15308","Nicaragua","NIC","Buffaloes","fabio" +"15309","Nicaragua","NIC","Sheep","fabio" +"15310","Nicaragua","NIC","Goats","fabio" +"15311","Nicaragua","NIC","Pigs","fabio" +"15312","Nicaragua","NIC","Poultry Birds","fabio" +"15313","Nicaragua","NIC","Horses","fabio" +"15314","Nicaragua","NIC","Asses","fabio" +"15315","Nicaragua","NIC","Mules","fabio" +"15316","Nicaragua","NIC","Camels","fabio" +"15317","Nicaragua","NIC","Camelids, other","fabio" +"15318","Nicaragua","NIC","Rabbits and hares","fabio" +"15319","Nicaragua","NIC","Rodents, other","fabio" +"15320","Nicaragua","NIC","Live animals, other","fabio" +"15321","Nicaragua","NIC","Milk - Excluding Butter","fabio" +"15322","Nicaragua","NIC","Butter, Ghee","fabio" +"15323","Nicaragua","NIC","Eggs","fabio" +"15324","Nicaragua","NIC","Wool (Clean Eq.)","fabio" +"15325","Nicaragua","NIC","Bovine Meat","fabio" +"15326","Nicaragua","NIC","Mutton & Goat Meat","fabio" +"15327","Nicaragua","NIC","Pigmeat","fabio" +"15328","Nicaragua","NIC","Poultry Meat","fabio" +"15329","Nicaragua","NIC","Meat, Other","fabio" +"15330","Nicaragua","NIC","Offals, Edible","fabio" +"15331","Nicaragua","NIC","Fats, Animals, Raw","fabio" +"15332","Nicaragua","NIC","Hides and skins","fabio" +"15333","Nicaragua","NIC","Meat Meal","fabio" +"15334","Nicaragua","NIC","Pet food","fabio" +"15335","Nicaragua","NIC","Honey","fabio" +"15336","Nicaragua","NIC","Silk","fabio" +"15337","Nicaragua","NIC","Fish, Seafood","fabio" +"15338","Nicaragua","NIC","Wood fuel","fabio" +"15339","Nicaragua","NIC","Industrial roundwood, coniferous","fabio" +"15340","Nicaragua","NIC","Industrial roundwood, non-coniferous","fabio" +"15341","Niger","NER","Rice (Milled Equivalent)","fabio" +"15342","Niger","NER","Wheat and products","fabio" +"15343","Niger","NER","Barley and products","fabio" +"15344","Niger","NER","Maize and products","fabio" +"15345","Niger","NER","Rye and products","fabio" +"15346","Niger","NER","Oats","fabio" +"15347","Niger","NER","Millet and products","fabio" +"15348","Niger","NER","Sorghum and products","fabio" +"15349","Niger","NER","Cereals, Other","fabio" +"15350","Niger","NER","Potatoes and products","fabio" +"15351","Niger","NER","Cassava and products","fabio" +"15352","Niger","NER","Sweet potatoes","fabio" +"15353","Niger","NER","Roots, Other","fabio" +"15354","Niger","NER","Yams","fabio" +"15355","Niger","NER","Sugar cane","fabio" +"15356","Niger","NER","Sugar beet","fabio" +"15357","Niger","NER","Beans","fabio" +"15358","Niger","NER","Peas","fabio" +"15359","Niger","NER","Pulses, Other and products","fabio" +"15360","Niger","NER","Nuts and products","fabio" +"15361","Niger","NER","Soyabeans","fabio" +"15362","Niger","NER","Groundnuts (Shelled Eq)","fabio" +"15363","Niger","NER","Sunflower seed","fabio" +"15364","Niger","NER","Rape and Mustardseed","fabio" +"15365","Niger","NER","Seed cotton","fabio" +"15366","Niger","NER","Coconuts - Incl Copra","fabio" +"15367","Niger","NER","Sesame seed","fabio" +"15368","Niger","NER","Oil, palm fruit","fabio" +"15369","Niger","NER","Olives (including preserved)","fabio" +"15370","Niger","NER","Oilcrops, Other","fabio" +"15371","Niger","NER","Tomatoes and products","fabio" +"15372","Niger","NER","Onions","fabio" +"15373","Niger","NER","Vegetables, Other","fabio" +"15374","Niger","NER","Oranges, Mandarines","fabio" +"15375","Niger","NER","Lemons, Limes and products","fabio" +"15376","Niger","NER","Grapefruit and products","fabio" +"15377","Niger","NER","Citrus, Other","fabio" +"15378","Niger","NER","Bananas","fabio" +"15379","Niger","NER","Plantains","fabio" +"15380","Niger","NER","Apples and products","fabio" +"15381","Niger","NER","Pineapples and products","fabio" +"15382","Niger","NER","Dates","fabio" +"15383","Niger","NER","Grapes and products (excl wine)","fabio" +"15384","Niger","NER","Fruits, Other","fabio" +"15385","Niger","NER","Coffee and products","fabio" +"15386","Niger","NER","Cocoa Beans and products","fabio" +"15387","Niger","NER","Tea (including mate)","fabio" +"15388","Niger","NER","Hops","fabio" +"15389","Niger","NER","Pepper","fabio" +"15390","Niger","NER","Pimento","fabio" +"15391","Niger","NER","Cloves","fabio" +"15392","Niger","NER","Spices, Other","fabio" +"15393","Niger","NER","Jute","fabio" +"15394","Niger","NER","Jute-Like Fibres","fabio" +"15395","Niger","NER","Soft-Fibres, Other","fabio" +"15396","Niger","NER","Sisal","fabio" +"15397","Niger","NER","Abaca","fabio" +"15398","Niger","NER","Hard Fibres, Other","fabio" +"15399","Niger","NER","Tobacco","fabio" +"15400","Niger","NER","Rubber","fabio" +"15401","Niger","NER","Fodder crops","fabio" +"15402","Niger","NER","Grazing","fabio" +"15403","Niger","NER","Cottonseed","fabio" +"15404","Niger","NER","Palm kernels","fabio" +"15405","Niger","NER","Sugar non-centrifugal","fabio" +"15406","Niger","NER","Molasses","fabio" +"15407","Niger","NER","Sugar, Refined Equiv","fabio" +"15408","Niger","NER","Sweeteners, Other","fabio" +"15409","Niger","NER","Soyabean Oil","fabio" +"15410","Niger","NER","Groundnut Oil","fabio" +"15411","Niger","NER","Sunflowerseed Oil","fabio" +"15412","Niger","NER","Rape and Mustard Oil","fabio" +"15413","Niger","NER","Cottonseed Oil","fabio" +"15414","Niger","NER","Palmkernel Oil","fabio" +"15415","Niger","NER","Palm Oil","fabio" +"15416","Niger","NER","Coconut Oil","fabio" +"15417","Niger","NER","Sesameseed Oil","fabio" +"15418","Niger","NER","Olive Oil","fabio" +"15419","Niger","NER","Ricebran Oil","fabio" +"15420","Niger","NER","Maize Germ Oil","fabio" +"15421","Niger","NER","Oilcrops Oil, Other","fabio" +"15422","Niger","NER","Soyabean Cake","fabio" +"15423","Niger","NER","Groundnut Cake","fabio" +"15424","Niger","NER","Sunflowerseed Cake","fabio" +"15425","Niger","NER","Rape and Mustard Cake","fabio" +"15426","Niger","NER","Cottonseed Cake","fabio" +"15427","Niger","NER","Palmkernel Cake","fabio" +"15428","Niger","NER","Copra Cake","fabio" +"15429","Niger","NER","Sesameseed Cake","fabio" +"15430","Niger","NER","Oilseed Cakes, Other","fabio" +"15431","Niger","NER","Wine","fabio" +"15432","Niger","NER","Beer","fabio" +"15433","Niger","NER","Beverages, Fermented","fabio" +"15434","Niger","NER","Beverages, Alcoholic","fabio" +"15435","Niger","NER","Alcohol, Non-Food","fabio" +"15436","Niger","NER","Cotton lint","fabio" +"15437","Niger","NER","Cattle","fabio" +"15438","Niger","NER","Buffaloes","fabio" +"15439","Niger","NER","Sheep","fabio" +"15440","Niger","NER","Goats","fabio" +"15441","Niger","NER","Pigs","fabio" +"15442","Niger","NER","Poultry Birds","fabio" +"15443","Niger","NER","Horses","fabio" +"15444","Niger","NER","Asses","fabio" +"15445","Niger","NER","Mules","fabio" +"15446","Niger","NER","Camels","fabio" +"15447","Niger","NER","Camelids, other","fabio" +"15448","Niger","NER","Rabbits and hares","fabio" +"15449","Niger","NER","Rodents, other","fabio" +"15450","Niger","NER","Live animals, other","fabio" +"15451","Niger","NER","Milk - Excluding Butter","fabio" +"15452","Niger","NER","Butter, Ghee","fabio" +"15453","Niger","NER","Eggs","fabio" +"15454","Niger","NER","Wool (Clean Eq.)","fabio" +"15455","Niger","NER","Bovine Meat","fabio" +"15456","Niger","NER","Mutton & Goat Meat","fabio" +"15457","Niger","NER","Pigmeat","fabio" +"15458","Niger","NER","Poultry Meat","fabio" +"15459","Niger","NER","Meat, Other","fabio" +"15460","Niger","NER","Offals, Edible","fabio" +"15461","Niger","NER","Fats, Animals, Raw","fabio" +"15462","Niger","NER","Hides and skins","fabio" +"15463","Niger","NER","Meat Meal","fabio" +"15464","Niger","NER","Pet food","fabio" +"15465","Niger","NER","Honey","fabio" +"15466","Niger","NER","Silk","fabio" +"15467","Niger","NER","Fish, Seafood","fabio" +"15468","Niger","NER","Wood fuel","fabio" +"15469","Niger","NER","Industrial roundwood, coniferous","fabio" +"15470","Niger","NER","Industrial roundwood, non-coniferous","fabio" +"15471","Nigeria","NGA","Rice (Milled Equivalent)","fabio" +"15472","Nigeria","NGA","Wheat and products","fabio" +"15473","Nigeria","NGA","Barley and products","fabio" +"15474","Nigeria","NGA","Maize and products","fabio" +"15475","Nigeria","NGA","Rye and products","fabio" +"15476","Nigeria","NGA","Oats","fabio" +"15477","Nigeria","NGA","Millet and products","fabio" +"15478","Nigeria","NGA","Sorghum and products","fabio" +"15479","Nigeria","NGA","Cereals, Other","fabio" +"15480","Nigeria","NGA","Potatoes and products","fabio" +"15481","Nigeria","NGA","Cassava and products","fabio" +"15482","Nigeria","NGA","Sweet potatoes","fabio" +"15483","Nigeria","NGA","Roots, Other","fabio" +"15484","Nigeria","NGA","Yams","fabio" +"15485","Nigeria","NGA","Sugar cane","fabio" +"15486","Nigeria","NGA","Sugar beet","fabio" +"15487","Nigeria","NGA","Beans","fabio" +"15488","Nigeria","NGA","Peas","fabio" +"15489","Nigeria","NGA","Pulses, Other and products","fabio" +"15490","Nigeria","NGA","Nuts and products","fabio" +"15491","Nigeria","NGA","Soyabeans","fabio" +"15492","Nigeria","NGA","Groundnuts (Shelled Eq)","fabio" +"15493","Nigeria","NGA","Sunflower seed","fabio" +"15494","Nigeria","NGA","Rape and Mustardseed","fabio" +"15495","Nigeria","NGA","Seed cotton","fabio" +"15496","Nigeria","NGA","Coconuts - Incl Copra","fabio" +"15497","Nigeria","NGA","Sesame seed","fabio" +"15498","Nigeria","NGA","Oil, palm fruit","fabio" +"15499","Nigeria","NGA","Olives (including preserved)","fabio" +"15500","Nigeria","NGA","Oilcrops, Other","fabio" +"15501","Nigeria","NGA","Tomatoes and products","fabio" +"15502","Nigeria","NGA","Onions","fabio" +"15503","Nigeria","NGA","Vegetables, Other","fabio" +"15504","Nigeria","NGA","Oranges, Mandarines","fabio" +"15505","Nigeria","NGA","Lemons, Limes and products","fabio" +"15506","Nigeria","NGA","Grapefruit and products","fabio" +"15507","Nigeria","NGA","Citrus, Other","fabio" +"15508","Nigeria","NGA","Bananas","fabio" +"15509","Nigeria","NGA","Plantains","fabio" +"15510","Nigeria","NGA","Apples and products","fabio" +"15511","Nigeria","NGA","Pineapples and products","fabio" +"15512","Nigeria","NGA","Dates","fabio" +"15513","Nigeria","NGA","Grapes and products (excl wine)","fabio" +"15514","Nigeria","NGA","Fruits, Other","fabio" +"15515","Nigeria","NGA","Coffee and products","fabio" +"15516","Nigeria","NGA","Cocoa Beans and products","fabio" +"15517","Nigeria","NGA","Tea (including mate)","fabio" +"15518","Nigeria","NGA","Hops","fabio" +"15519","Nigeria","NGA","Pepper","fabio" +"15520","Nigeria","NGA","Pimento","fabio" +"15521","Nigeria","NGA","Cloves","fabio" +"15522","Nigeria","NGA","Spices, Other","fabio" +"15523","Nigeria","NGA","Jute","fabio" +"15524","Nigeria","NGA","Jute-Like Fibres","fabio" +"15525","Nigeria","NGA","Soft-Fibres, Other","fabio" +"15526","Nigeria","NGA","Sisal","fabio" +"15527","Nigeria","NGA","Abaca","fabio" +"15528","Nigeria","NGA","Hard Fibres, Other","fabio" +"15529","Nigeria","NGA","Tobacco","fabio" +"15530","Nigeria","NGA","Rubber","fabio" +"15531","Nigeria","NGA","Fodder crops","fabio" +"15532","Nigeria","NGA","Grazing","fabio" +"15533","Nigeria","NGA","Cottonseed","fabio" +"15534","Nigeria","NGA","Palm kernels","fabio" +"15535","Nigeria","NGA","Sugar non-centrifugal","fabio" +"15536","Nigeria","NGA","Molasses","fabio" +"15537","Nigeria","NGA","Sugar, Refined Equiv","fabio" +"15538","Nigeria","NGA","Sweeteners, Other","fabio" +"15539","Nigeria","NGA","Soyabean Oil","fabio" +"15540","Nigeria","NGA","Groundnut Oil","fabio" +"15541","Nigeria","NGA","Sunflowerseed Oil","fabio" +"15542","Nigeria","NGA","Rape and Mustard Oil","fabio" +"15543","Nigeria","NGA","Cottonseed Oil","fabio" +"15544","Nigeria","NGA","Palmkernel Oil","fabio" +"15545","Nigeria","NGA","Palm Oil","fabio" +"15546","Nigeria","NGA","Coconut Oil","fabio" +"15547","Nigeria","NGA","Sesameseed Oil","fabio" +"15548","Nigeria","NGA","Olive Oil","fabio" +"15549","Nigeria","NGA","Ricebran Oil","fabio" +"15550","Nigeria","NGA","Maize Germ Oil","fabio" +"15551","Nigeria","NGA","Oilcrops Oil, Other","fabio" +"15552","Nigeria","NGA","Soyabean Cake","fabio" +"15553","Nigeria","NGA","Groundnut Cake","fabio" +"15554","Nigeria","NGA","Sunflowerseed Cake","fabio" +"15555","Nigeria","NGA","Rape and Mustard Cake","fabio" +"15556","Nigeria","NGA","Cottonseed Cake","fabio" +"15557","Nigeria","NGA","Palmkernel Cake","fabio" +"15558","Nigeria","NGA","Copra Cake","fabio" +"15559","Nigeria","NGA","Sesameseed Cake","fabio" +"15560","Nigeria","NGA","Oilseed Cakes, Other","fabio" +"15561","Nigeria","NGA","Wine","fabio" +"15562","Nigeria","NGA","Beer","fabio" +"15563","Nigeria","NGA","Beverages, Fermented","fabio" +"15564","Nigeria","NGA","Beverages, Alcoholic","fabio" +"15565","Nigeria","NGA","Alcohol, Non-Food","fabio" +"15566","Nigeria","NGA","Cotton lint","fabio" +"15567","Nigeria","NGA","Cattle","fabio" +"15568","Nigeria","NGA","Buffaloes","fabio" +"15569","Nigeria","NGA","Sheep","fabio" +"15570","Nigeria","NGA","Goats","fabio" +"15571","Nigeria","NGA","Pigs","fabio" +"15572","Nigeria","NGA","Poultry Birds","fabio" +"15573","Nigeria","NGA","Horses","fabio" +"15574","Nigeria","NGA","Asses","fabio" +"15575","Nigeria","NGA","Mules","fabio" +"15576","Nigeria","NGA","Camels","fabio" +"15577","Nigeria","NGA","Camelids, other","fabio" +"15578","Nigeria","NGA","Rabbits and hares","fabio" +"15579","Nigeria","NGA","Rodents, other","fabio" +"15580","Nigeria","NGA","Live animals, other","fabio" +"15581","Nigeria","NGA","Milk - Excluding Butter","fabio" +"15582","Nigeria","NGA","Butter, Ghee","fabio" +"15583","Nigeria","NGA","Eggs","fabio" +"15584","Nigeria","NGA","Wool (Clean Eq.)","fabio" +"15585","Nigeria","NGA","Bovine Meat","fabio" +"15586","Nigeria","NGA","Mutton & Goat Meat","fabio" +"15587","Nigeria","NGA","Pigmeat","fabio" +"15588","Nigeria","NGA","Poultry Meat","fabio" +"15589","Nigeria","NGA","Meat, Other","fabio" +"15590","Nigeria","NGA","Offals, Edible","fabio" +"15591","Nigeria","NGA","Fats, Animals, Raw","fabio" +"15592","Nigeria","NGA","Hides and skins","fabio" +"15593","Nigeria","NGA","Meat Meal","fabio" +"15594","Nigeria","NGA","Pet food","fabio" +"15595","Nigeria","NGA","Honey","fabio" +"15596","Nigeria","NGA","Silk","fabio" +"15597","Nigeria","NGA","Fish, Seafood","fabio" +"15598","Nigeria","NGA","Wood fuel","fabio" +"15599","Nigeria","NGA","Industrial roundwood, coniferous","fabio" +"15600","Nigeria","NGA","Industrial roundwood, non-coniferous","fabio" +"15601","Norway","NOR","Rice (Milled Equivalent)","fabio" +"15602","Norway","NOR","Wheat and products","fabio" +"15603","Norway","NOR","Barley and products","fabio" +"15604","Norway","NOR","Maize and products","fabio" +"15605","Norway","NOR","Rye and products","fabio" +"15606","Norway","NOR","Oats","fabio" +"15607","Norway","NOR","Millet and products","fabio" +"15608","Norway","NOR","Sorghum and products","fabio" +"15609","Norway","NOR","Cereals, Other","fabio" +"15610","Norway","NOR","Potatoes and products","fabio" +"15611","Norway","NOR","Cassava and products","fabio" +"15612","Norway","NOR","Sweet potatoes","fabio" +"15613","Norway","NOR","Roots, Other","fabio" +"15614","Norway","NOR","Yams","fabio" +"15615","Norway","NOR","Sugar cane","fabio" +"15616","Norway","NOR","Sugar beet","fabio" +"15617","Norway","NOR","Beans","fabio" +"15618","Norway","NOR","Peas","fabio" +"15619","Norway","NOR","Pulses, Other and products","fabio" +"15620","Norway","NOR","Nuts and products","fabio" +"15621","Norway","NOR","Soyabeans","fabio" +"15622","Norway","NOR","Groundnuts (Shelled Eq)","fabio" +"15623","Norway","NOR","Sunflower seed","fabio" +"15624","Norway","NOR","Rape and Mustardseed","fabio" +"15625","Norway","NOR","Seed cotton","fabio" +"15626","Norway","NOR","Coconuts - Incl Copra","fabio" +"15627","Norway","NOR","Sesame seed","fabio" +"15628","Norway","NOR","Oil, palm fruit","fabio" +"15629","Norway","NOR","Olives (including preserved)","fabio" +"15630","Norway","NOR","Oilcrops, Other","fabio" +"15631","Norway","NOR","Tomatoes and products","fabio" +"15632","Norway","NOR","Onions","fabio" +"15633","Norway","NOR","Vegetables, Other","fabio" +"15634","Norway","NOR","Oranges, Mandarines","fabio" +"15635","Norway","NOR","Lemons, Limes and products","fabio" +"15636","Norway","NOR","Grapefruit and products","fabio" +"15637","Norway","NOR","Citrus, Other","fabio" +"15638","Norway","NOR","Bananas","fabio" +"15639","Norway","NOR","Plantains","fabio" +"15640","Norway","NOR","Apples and products","fabio" +"15641","Norway","NOR","Pineapples and products","fabio" +"15642","Norway","NOR","Dates","fabio" +"15643","Norway","NOR","Grapes and products (excl wine)","fabio" +"15644","Norway","NOR","Fruits, Other","fabio" +"15645","Norway","NOR","Coffee and products","fabio" +"15646","Norway","NOR","Cocoa Beans and products","fabio" +"15647","Norway","NOR","Tea (including mate)","fabio" +"15648","Norway","NOR","Hops","fabio" +"15649","Norway","NOR","Pepper","fabio" +"15650","Norway","NOR","Pimento","fabio" +"15651","Norway","NOR","Cloves","fabio" +"15652","Norway","NOR","Spices, Other","fabio" +"15653","Norway","NOR","Jute","fabio" +"15654","Norway","NOR","Jute-Like Fibres","fabio" +"15655","Norway","NOR","Soft-Fibres, Other","fabio" +"15656","Norway","NOR","Sisal","fabio" +"15657","Norway","NOR","Abaca","fabio" +"15658","Norway","NOR","Hard Fibres, Other","fabio" +"15659","Norway","NOR","Tobacco","fabio" +"15660","Norway","NOR","Rubber","fabio" +"15661","Norway","NOR","Fodder crops","fabio" +"15662","Norway","NOR","Grazing","fabio" +"15663","Norway","NOR","Cottonseed","fabio" +"15664","Norway","NOR","Palm kernels","fabio" +"15665","Norway","NOR","Sugar non-centrifugal","fabio" +"15666","Norway","NOR","Molasses","fabio" +"15667","Norway","NOR","Sugar, Refined Equiv","fabio" +"15668","Norway","NOR","Sweeteners, Other","fabio" +"15669","Norway","NOR","Soyabean Oil","fabio" +"15670","Norway","NOR","Groundnut Oil","fabio" +"15671","Norway","NOR","Sunflowerseed Oil","fabio" +"15672","Norway","NOR","Rape and Mustard Oil","fabio" +"15673","Norway","NOR","Cottonseed Oil","fabio" +"15674","Norway","NOR","Palmkernel Oil","fabio" +"15675","Norway","NOR","Palm Oil","fabio" +"15676","Norway","NOR","Coconut Oil","fabio" +"15677","Norway","NOR","Sesameseed Oil","fabio" +"15678","Norway","NOR","Olive Oil","fabio" +"15679","Norway","NOR","Ricebran Oil","fabio" +"15680","Norway","NOR","Maize Germ Oil","fabio" +"15681","Norway","NOR","Oilcrops Oil, Other","fabio" +"15682","Norway","NOR","Soyabean Cake","fabio" +"15683","Norway","NOR","Groundnut Cake","fabio" +"15684","Norway","NOR","Sunflowerseed Cake","fabio" +"15685","Norway","NOR","Rape and Mustard Cake","fabio" +"15686","Norway","NOR","Cottonseed Cake","fabio" +"15687","Norway","NOR","Palmkernel Cake","fabio" +"15688","Norway","NOR","Copra Cake","fabio" +"15689","Norway","NOR","Sesameseed Cake","fabio" +"15690","Norway","NOR","Oilseed Cakes, Other","fabio" +"15691","Norway","NOR","Wine","fabio" +"15692","Norway","NOR","Beer","fabio" +"15693","Norway","NOR","Beverages, Fermented","fabio" +"15694","Norway","NOR","Beverages, Alcoholic","fabio" +"15695","Norway","NOR","Alcohol, Non-Food","fabio" +"15696","Norway","NOR","Cotton lint","fabio" +"15697","Norway","NOR","Cattle","fabio" +"15698","Norway","NOR","Buffaloes","fabio" +"15699","Norway","NOR","Sheep","fabio" +"15700","Norway","NOR","Goats","fabio" +"15701","Norway","NOR","Pigs","fabio" +"15702","Norway","NOR","Poultry Birds","fabio" +"15703","Norway","NOR","Horses","fabio" +"15704","Norway","NOR","Asses","fabio" +"15705","Norway","NOR","Mules","fabio" +"15706","Norway","NOR","Camels","fabio" +"15707","Norway","NOR","Camelids, other","fabio" +"15708","Norway","NOR","Rabbits and hares","fabio" +"15709","Norway","NOR","Rodents, other","fabio" +"15710","Norway","NOR","Live animals, other","fabio" +"15711","Norway","NOR","Milk - Excluding Butter","fabio" +"15712","Norway","NOR","Butter, Ghee","fabio" +"15713","Norway","NOR","Eggs","fabio" +"15714","Norway","NOR","Wool (Clean Eq.)","fabio" +"15715","Norway","NOR","Bovine Meat","fabio" +"15716","Norway","NOR","Mutton & Goat Meat","fabio" +"15717","Norway","NOR","Pigmeat","fabio" +"15718","Norway","NOR","Poultry Meat","fabio" +"15719","Norway","NOR","Meat, Other","fabio" +"15720","Norway","NOR","Offals, Edible","fabio" +"15721","Norway","NOR","Fats, Animals, Raw","fabio" +"15722","Norway","NOR","Hides and skins","fabio" +"15723","Norway","NOR","Meat Meal","fabio" +"15724","Norway","NOR","Pet food","fabio" +"15725","Norway","NOR","Honey","fabio" +"15726","Norway","NOR","Silk","fabio" +"15727","Norway","NOR","Fish, Seafood","fabio" +"15728","Norway","NOR","Wood fuel","fabio" +"15729","Norway","NOR","Industrial roundwood, coniferous","fabio" +"15730","Norway","NOR","Industrial roundwood, non-coniferous","fabio" +"15731","Pakistan","PAK","Rice (Milled Equivalent)","fabio" +"15732","Pakistan","PAK","Wheat and products","fabio" +"15733","Pakistan","PAK","Barley and products","fabio" +"15734","Pakistan","PAK","Maize and products","fabio" +"15735","Pakistan","PAK","Rye and products","fabio" +"15736","Pakistan","PAK","Oats","fabio" +"15737","Pakistan","PAK","Millet and products","fabio" +"15738","Pakistan","PAK","Sorghum and products","fabio" +"15739","Pakistan","PAK","Cereals, Other","fabio" +"15740","Pakistan","PAK","Potatoes and products","fabio" +"15741","Pakistan","PAK","Cassava and products","fabio" +"15742","Pakistan","PAK","Sweet potatoes","fabio" +"15743","Pakistan","PAK","Roots, Other","fabio" +"15744","Pakistan","PAK","Yams","fabio" +"15745","Pakistan","PAK","Sugar cane","fabio" +"15746","Pakistan","PAK","Sugar beet","fabio" +"15747","Pakistan","PAK","Beans","fabio" +"15748","Pakistan","PAK","Peas","fabio" +"15749","Pakistan","PAK","Pulses, Other and products","fabio" +"15750","Pakistan","PAK","Nuts and products","fabio" +"15751","Pakistan","PAK","Soyabeans","fabio" +"15752","Pakistan","PAK","Groundnuts (Shelled Eq)","fabio" +"15753","Pakistan","PAK","Sunflower seed","fabio" +"15754","Pakistan","PAK","Rape and Mustardseed","fabio" +"15755","Pakistan","PAK","Seed cotton","fabio" +"15756","Pakistan","PAK","Coconuts - Incl Copra","fabio" +"15757","Pakistan","PAK","Sesame seed","fabio" +"15758","Pakistan","PAK","Oil, palm fruit","fabio" +"15759","Pakistan","PAK","Olives (including preserved)","fabio" +"15760","Pakistan","PAK","Oilcrops, Other","fabio" +"15761","Pakistan","PAK","Tomatoes and products","fabio" +"15762","Pakistan","PAK","Onions","fabio" +"15763","Pakistan","PAK","Vegetables, Other","fabio" +"15764","Pakistan","PAK","Oranges, Mandarines","fabio" +"15765","Pakistan","PAK","Lemons, Limes and products","fabio" +"15766","Pakistan","PAK","Grapefruit and products","fabio" +"15767","Pakistan","PAK","Citrus, Other","fabio" +"15768","Pakistan","PAK","Bananas","fabio" +"15769","Pakistan","PAK","Plantains","fabio" +"15770","Pakistan","PAK","Apples and products","fabio" +"15771","Pakistan","PAK","Pineapples and products","fabio" +"15772","Pakistan","PAK","Dates","fabio" +"15773","Pakistan","PAK","Grapes and products (excl wine)","fabio" +"15774","Pakistan","PAK","Fruits, Other","fabio" +"15775","Pakistan","PAK","Coffee and products","fabio" +"15776","Pakistan","PAK","Cocoa Beans and products","fabio" +"15777","Pakistan","PAK","Tea (including mate)","fabio" +"15778","Pakistan","PAK","Hops","fabio" +"15779","Pakistan","PAK","Pepper","fabio" +"15780","Pakistan","PAK","Pimento","fabio" +"15781","Pakistan","PAK","Cloves","fabio" +"15782","Pakistan","PAK","Spices, Other","fabio" +"15783","Pakistan","PAK","Jute","fabio" +"15784","Pakistan","PAK","Jute-Like Fibres","fabio" +"15785","Pakistan","PAK","Soft-Fibres, Other","fabio" +"15786","Pakistan","PAK","Sisal","fabio" +"15787","Pakistan","PAK","Abaca","fabio" +"15788","Pakistan","PAK","Hard Fibres, Other","fabio" +"15789","Pakistan","PAK","Tobacco","fabio" +"15790","Pakistan","PAK","Rubber","fabio" +"15791","Pakistan","PAK","Fodder crops","fabio" +"15792","Pakistan","PAK","Grazing","fabio" +"15793","Pakistan","PAK","Cottonseed","fabio" +"15794","Pakistan","PAK","Palm kernels","fabio" +"15795","Pakistan","PAK","Sugar non-centrifugal","fabio" +"15796","Pakistan","PAK","Molasses","fabio" +"15797","Pakistan","PAK","Sugar, Refined Equiv","fabio" +"15798","Pakistan","PAK","Sweeteners, Other","fabio" +"15799","Pakistan","PAK","Soyabean Oil","fabio" +"15800","Pakistan","PAK","Groundnut Oil","fabio" +"15801","Pakistan","PAK","Sunflowerseed Oil","fabio" +"15802","Pakistan","PAK","Rape and Mustard Oil","fabio" +"15803","Pakistan","PAK","Cottonseed Oil","fabio" +"15804","Pakistan","PAK","Palmkernel Oil","fabio" +"15805","Pakistan","PAK","Palm Oil","fabio" +"15806","Pakistan","PAK","Coconut Oil","fabio" +"15807","Pakistan","PAK","Sesameseed Oil","fabio" +"15808","Pakistan","PAK","Olive Oil","fabio" +"15809","Pakistan","PAK","Ricebran Oil","fabio" +"15810","Pakistan","PAK","Maize Germ Oil","fabio" +"15811","Pakistan","PAK","Oilcrops Oil, Other","fabio" +"15812","Pakistan","PAK","Soyabean Cake","fabio" +"15813","Pakistan","PAK","Groundnut Cake","fabio" +"15814","Pakistan","PAK","Sunflowerseed Cake","fabio" +"15815","Pakistan","PAK","Rape and Mustard Cake","fabio" +"15816","Pakistan","PAK","Cottonseed Cake","fabio" +"15817","Pakistan","PAK","Palmkernel Cake","fabio" +"15818","Pakistan","PAK","Copra Cake","fabio" +"15819","Pakistan","PAK","Sesameseed Cake","fabio" +"15820","Pakistan","PAK","Oilseed Cakes, Other","fabio" +"15821","Pakistan","PAK","Wine","fabio" +"15822","Pakistan","PAK","Beer","fabio" +"15823","Pakistan","PAK","Beverages, Fermented","fabio" +"15824","Pakistan","PAK","Beverages, Alcoholic","fabio" +"15825","Pakistan","PAK","Alcohol, Non-Food","fabio" +"15826","Pakistan","PAK","Cotton lint","fabio" +"15827","Pakistan","PAK","Cattle","fabio" +"15828","Pakistan","PAK","Buffaloes","fabio" +"15829","Pakistan","PAK","Sheep","fabio" +"15830","Pakistan","PAK","Goats","fabio" +"15831","Pakistan","PAK","Pigs","fabio" +"15832","Pakistan","PAK","Poultry Birds","fabio" +"15833","Pakistan","PAK","Horses","fabio" +"15834","Pakistan","PAK","Asses","fabio" +"15835","Pakistan","PAK","Mules","fabio" +"15836","Pakistan","PAK","Camels","fabio" +"15837","Pakistan","PAK","Camelids, other","fabio" +"15838","Pakistan","PAK","Rabbits and hares","fabio" +"15839","Pakistan","PAK","Rodents, other","fabio" +"15840","Pakistan","PAK","Live animals, other","fabio" +"15841","Pakistan","PAK","Milk - Excluding Butter","fabio" +"15842","Pakistan","PAK","Butter, Ghee","fabio" +"15843","Pakistan","PAK","Eggs","fabio" +"15844","Pakistan","PAK","Wool (Clean Eq.)","fabio" +"15845","Pakistan","PAK","Bovine Meat","fabio" +"15846","Pakistan","PAK","Mutton & Goat Meat","fabio" +"15847","Pakistan","PAK","Pigmeat","fabio" +"15848","Pakistan","PAK","Poultry Meat","fabio" +"15849","Pakistan","PAK","Meat, Other","fabio" +"15850","Pakistan","PAK","Offals, Edible","fabio" +"15851","Pakistan","PAK","Fats, Animals, Raw","fabio" +"15852","Pakistan","PAK","Hides and skins","fabio" +"15853","Pakistan","PAK","Meat Meal","fabio" +"15854","Pakistan","PAK","Pet food","fabio" +"15855","Pakistan","PAK","Honey","fabio" +"15856","Pakistan","PAK","Silk","fabio" +"15857","Pakistan","PAK","Fish, Seafood","fabio" +"15858","Pakistan","PAK","Wood fuel","fabio" +"15859","Pakistan","PAK","Industrial roundwood, coniferous","fabio" +"15860","Pakistan","PAK","Industrial roundwood, non-coniferous","fabio" +"15861","Panama","PAN","Rice (Milled Equivalent)","fabio" +"15862","Panama","PAN","Wheat and products","fabio" +"15863","Panama","PAN","Barley and products","fabio" +"15864","Panama","PAN","Maize and products","fabio" +"15865","Panama","PAN","Rye and products","fabio" +"15866","Panama","PAN","Oats","fabio" +"15867","Panama","PAN","Millet and products","fabio" +"15868","Panama","PAN","Sorghum and products","fabio" +"15869","Panama","PAN","Cereals, Other","fabio" +"15870","Panama","PAN","Potatoes and products","fabio" +"15871","Panama","PAN","Cassava and products","fabio" +"15872","Panama","PAN","Sweet potatoes","fabio" +"15873","Panama","PAN","Roots, Other","fabio" +"15874","Panama","PAN","Yams","fabio" +"15875","Panama","PAN","Sugar cane","fabio" +"15876","Panama","PAN","Sugar beet","fabio" +"15877","Panama","PAN","Beans","fabio" +"15878","Panama","PAN","Peas","fabio" +"15879","Panama","PAN","Pulses, Other and products","fabio" +"15880","Panama","PAN","Nuts and products","fabio" +"15881","Panama","PAN","Soyabeans","fabio" +"15882","Panama","PAN","Groundnuts (Shelled Eq)","fabio" +"15883","Panama","PAN","Sunflower seed","fabio" +"15884","Panama","PAN","Rape and Mustardseed","fabio" +"15885","Panama","PAN","Seed cotton","fabio" +"15886","Panama","PAN","Coconuts - Incl Copra","fabio" +"15887","Panama","PAN","Sesame seed","fabio" +"15888","Panama","PAN","Oil, palm fruit","fabio" +"15889","Panama","PAN","Olives (including preserved)","fabio" +"15890","Panama","PAN","Oilcrops, Other","fabio" +"15891","Panama","PAN","Tomatoes and products","fabio" +"15892","Panama","PAN","Onions","fabio" +"15893","Panama","PAN","Vegetables, Other","fabio" +"15894","Panama","PAN","Oranges, Mandarines","fabio" +"15895","Panama","PAN","Lemons, Limes and products","fabio" +"15896","Panama","PAN","Grapefruit and products","fabio" +"15897","Panama","PAN","Citrus, Other","fabio" +"15898","Panama","PAN","Bananas","fabio" +"15899","Panama","PAN","Plantains","fabio" +"15900","Panama","PAN","Apples and products","fabio" +"15901","Panama","PAN","Pineapples and products","fabio" +"15902","Panama","PAN","Dates","fabio" +"15903","Panama","PAN","Grapes and products (excl wine)","fabio" +"15904","Panama","PAN","Fruits, Other","fabio" +"15905","Panama","PAN","Coffee and products","fabio" +"15906","Panama","PAN","Cocoa Beans and products","fabio" +"15907","Panama","PAN","Tea (including mate)","fabio" +"15908","Panama","PAN","Hops","fabio" +"15909","Panama","PAN","Pepper","fabio" +"15910","Panama","PAN","Pimento","fabio" +"15911","Panama","PAN","Cloves","fabio" +"15912","Panama","PAN","Spices, Other","fabio" +"15913","Panama","PAN","Jute","fabio" +"15914","Panama","PAN","Jute-Like Fibres","fabio" +"15915","Panama","PAN","Soft-Fibres, Other","fabio" +"15916","Panama","PAN","Sisal","fabio" +"15917","Panama","PAN","Abaca","fabio" +"15918","Panama","PAN","Hard Fibres, Other","fabio" +"15919","Panama","PAN","Tobacco","fabio" +"15920","Panama","PAN","Rubber","fabio" +"15921","Panama","PAN","Fodder crops","fabio" +"15922","Panama","PAN","Grazing","fabio" +"15923","Panama","PAN","Cottonseed","fabio" +"15924","Panama","PAN","Palm kernels","fabio" +"15925","Panama","PAN","Sugar non-centrifugal","fabio" +"15926","Panama","PAN","Molasses","fabio" +"15927","Panama","PAN","Sugar, Refined Equiv","fabio" +"15928","Panama","PAN","Sweeteners, Other","fabio" +"15929","Panama","PAN","Soyabean Oil","fabio" +"15930","Panama","PAN","Groundnut Oil","fabio" +"15931","Panama","PAN","Sunflowerseed Oil","fabio" +"15932","Panama","PAN","Rape and Mustard Oil","fabio" +"15933","Panama","PAN","Cottonseed Oil","fabio" +"15934","Panama","PAN","Palmkernel Oil","fabio" +"15935","Panama","PAN","Palm Oil","fabio" +"15936","Panama","PAN","Coconut Oil","fabio" +"15937","Panama","PAN","Sesameseed Oil","fabio" +"15938","Panama","PAN","Olive Oil","fabio" +"15939","Panama","PAN","Ricebran Oil","fabio" +"15940","Panama","PAN","Maize Germ Oil","fabio" +"15941","Panama","PAN","Oilcrops Oil, Other","fabio" +"15942","Panama","PAN","Soyabean Cake","fabio" +"15943","Panama","PAN","Groundnut Cake","fabio" +"15944","Panama","PAN","Sunflowerseed Cake","fabio" +"15945","Panama","PAN","Rape and Mustard Cake","fabio" +"15946","Panama","PAN","Cottonseed Cake","fabio" +"15947","Panama","PAN","Palmkernel Cake","fabio" +"15948","Panama","PAN","Copra Cake","fabio" +"15949","Panama","PAN","Sesameseed Cake","fabio" +"15950","Panama","PAN","Oilseed Cakes, Other","fabio" +"15951","Panama","PAN","Wine","fabio" +"15952","Panama","PAN","Beer","fabio" +"15953","Panama","PAN","Beverages, Fermented","fabio" +"15954","Panama","PAN","Beverages, Alcoholic","fabio" +"15955","Panama","PAN","Alcohol, Non-Food","fabio" +"15956","Panama","PAN","Cotton lint","fabio" +"15957","Panama","PAN","Cattle","fabio" +"15958","Panama","PAN","Buffaloes","fabio" +"15959","Panama","PAN","Sheep","fabio" +"15960","Panama","PAN","Goats","fabio" +"15961","Panama","PAN","Pigs","fabio" +"15962","Panama","PAN","Poultry Birds","fabio" +"15963","Panama","PAN","Horses","fabio" +"15964","Panama","PAN","Asses","fabio" +"15965","Panama","PAN","Mules","fabio" +"15966","Panama","PAN","Camels","fabio" +"15967","Panama","PAN","Camelids, other","fabio" +"15968","Panama","PAN","Rabbits and hares","fabio" +"15969","Panama","PAN","Rodents, other","fabio" +"15970","Panama","PAN","Live animals, other","fabio" +"15971","Panama","PAN","Milk - Excluding Butter","fabio" +"15972","Panama","PAN","Butter, Ghee","fabio" +"15973","Panama","PAN","Eggs","fabio" +"15974","Panama","PAN","Wool (Clean Eq.)","fabio" +"15975","Panama","PAN","Bovine Meat","fabio" +"15976","Panama","PAN","Mutton & Goat Meat","fabio" +"15977","Panama","PAN","Pigmeat","fabio" +"15978","Panama","PAN","Poultry Meat","fabio" +"15979","Panama","PAN","Meat, Other","fabio" +"15980","Panama","PAN","Offals, Edible","fabio" +"15981","Panama","PAN","Fats, Animals, Raw","fabio" +"15982","Panama","PAN","Hides and skins","fabio" +"15983","Panama","PAN","Meat Meal","fabio" +"15984","Panama","PAN","Pet food","fabio" +"15985","Panama","PAN","Honey","fabio" +"15986","Panama","PAN","Silk","fabio" +"15987","Panama","PAN","Fish, Seafood","fabio" +"15988","Panama","PAN","Wood fuel","fabio" +"15989","Panama","PAN","Industrial roundwood, coniferous","fabio" +"15990","Panama","PAN","Industrial roundwood, non-coniferous","fabio" +"15991","Czech Republic","CZE","Rice (Milled Equivalent)","fabio" +"15992","Czech Republic","CZE","Wheat and products","fabio" +"15993","Czech Republic","CZE","Barley and products","fabio" +"15994","Czech Republic","CZE","Maize and products","fabio" +"15995","Czech Republic","CZE","Rye and products","fabio" +"15996","Czech Republic","CZE","Oats","fabio" +"15997","Czech Republic","CZE","Millet and products","fabio" +"15998","Czech Republic","CZE","Sorghum and products","fabio" +"15999","Czech Republic","CZE","Cereals, Other","fabio" +"16000","Czech Republic","CZE","Potatoes and products","fabio" +"16001","Czech Republic","CZE","Cassava and products","fabio" +"16002","Czech Republic","CZE","Sweet potatoes","fabio" +"16003","Czech Republic","CZE","Roots, Other","fabio" +"16004","Czech Republic","CZE","Yams","fabio" +"16005","Czech Republic","CZE","Sugar cane","fabio" +"16006","Czech Republic","CZE","Sugar beet","fabio" +"16007","Czech Republic","CZE","Beans","fabio" +"16008","Czech Republic","CZE","Peas","fabio" +"16009","Czech Republic","CZE","Pulses, Other and products","fabio" +"16010","Czech Republic","CZE","Nuts and products","fabio" +"16011","Czech Republic","CZE","Soyabeans","fabio" +"16012","Czech Republic","CZE","Groundnuts (Shelled Eq)","fabio" +"16013","Czech Republic","CZE","Sunflower seed","fabio" +"16014","Czech Republic","CZE","Rape and Mustardseed","fabio" +"16015","Czech Republic","CZE","Seed cotton","fabio" +"16016","Czech Republic","CZE","Coconuts - Incl Copra","fabio" +"16017","Czech Republic","CZE","Sesame seed","fabio" +"16018","Czech Republic","CZE","Oil, palm fruit","fabio" +"16019","Czech Republic","CZE","Olives (including preserved)","fabio" +"16020","Czech Republic","CZE","Oilcrops, Other","fabio" +"16021","Czech Republic","CZE","Tomatoes and products","fabio" +"16022","Czech Republic","CZE","Onions","fabio" +"16023","Czech Republic","CZE","Vegetables, Other","fabio" +"16024","Czech Republic","CZE","Oranges, Mandarines","fabio" +"16025","Czech Republic","CZE","Lemons, Limes and products","fabio" +"16026","Czech Republic","CZE","Grapefruit and products","fabio" +"16027","Czech Republic","CZE","Citrus, Other","fabio" +"16028","Czech Republic","CZE","Bananas","fabio" +"16029","Czech Republic","CZE","Plantains","fabio" +"16030","Czech Republic","CZE","Apples and products","fabio" +"16031","Czech Republic","CZE","Pineapples and products","fabio" +"16032","Czech Republic","CZE","Dates","fabio" +"16033","Czech Republic","CZE","Grapes and products (excl wine)","fabio" +"16034","Czech Republic","CZE","Fruits, Other","fabio" +"16035","Czech Republic","CZE","Coffee and products","fabio" +"16036","Czech Republic","CZE","Cocoa Beans and products","fabio" +"16037","Czech Republic","CZE","Tea (including mate)","fabio" +"16038","Czech Republic","CZE","Hops","fabio" +"16039","Czech Republic","CZE","Pepper","fabio" +"16040","Czech Republic","CZE","Pimento","fabio" +"16041","Czech Republic","CZE","Cloves","fabio" +"16042","Czech Republic","CZE","Spices, Other","fabio" +"16043","Czech Republic","CZE","Jute","fabio" +"16044","Czech Republic","CZE","Jute-Like Fibres","fabio" +"16045","Czech Republic","CZE","Soft-Fibres, Other","fabio" +"16046","Czech Republic","CZE","Sisal","fabio" +"16047","Czech Republic","CZE","Abaca","fabio" +"16048","Czech Republic","CZE","Hard Fibres, Other","fabio" +"16049","Czech Republic","CZE","Tobacco","fabio" +"16050","Czech Republic","CZE","Rubber","fabio" +"16051","Czech Republic","CZE","Fodder crops","fabio" +"16052","Czech Republic","CZE","Grazing","fabio" +"16053","Czech Republic","CZE","Cottonseed","fabio" +"16054","Czech Republic","CZE","Palm kernels","fabio" +"16055","Czech Republic","CZE","Sugar non-centrifugal","fabio" +"16056","Czech Republic","CZE","Molasses","fabio" +"16057","Czech Republic","CZE","Sugar, Refined Equiv","fabio" +"16058","Czech Republic","CZE","Sweeteners, Other","fabio" +"16059","Czech Republic","CZE","Soyabean Oil","fabio" +"16060","Czech Republic","CZE","Groundnut Oil","fabio" +"16061","Czech Republic","CZE","Sunflowerseed Oil","fabio" +"16062","Czech Republic","CZE","Rape and Mustard Oil","fabio" +"16063","Czech Republic","CZE","Cottonseed Oil","fabio" +"16064","Czech Republic","CZE","Palmkernel Oil","fabio" +"16065","Czech Republic","CZE","Palm Oil","fabio" +"16066","Czech Republic","CZE","Coconut Oil","fabio" +"16067","Czech Republic","CZE","Sesameseed Oil","fabio" +"16068","Czech Republic","CZE","Olive Oil","fabio" +"16069","Czech Republic","CZE","Ricebran Oil","fabio" +"16070","Czech Republic","CZE","Maize Germ Oil","fabio" +"16071","Czech Republic","CZE","Oilcrops Oil, Other","fabio" +"16072","Czech Republic","CZE","Soyabean Cake","fabio" +"16073","Czech Republic","CZE","Groundnut Cake","fabio" +"16074","Czech Republic","CZE","Sunflowerseed Cake","fabio" +"16075","Czech Republic","CZE","Rape and Mustard Cake","fabio" +"16076","Czech Republic","CZE","Cottonseed Cake","fabio" +"16077","Czech Republic","CZE","Palmkernel Cake","fabio" +"16078","Czech Republic","CZE","Copra Cake","fabio" +"16079","Czech Republic","CZE","Sesameseed Cake","fabio" +"16080","Czech Republic","CZE","Oilseed Cakes, Other","fabio" +"16081","Czech Republic","CZE","Wine","fabio" +"16082","Czech Republic","CZE","Beer","fabio" +"16083","Czech Republic","CZE","Beverages, Fermented","fabio" +"16084","Czech Republic","CZE","Beverages, Alcoholic","fabio" +"16085","Czech Republic","CZE","Alcohol, Non-Food","fabio" +"16086","Czech Republic","CZE","Cotton lint","fabio" +"16087","Czech Republic","CZE","Cattle","fabio" +"16088","Czech Republic","CZE","Buffaloes","fabio" +"16089","Czech Republic","CZE","Sheep","fabio" +"16090","Czech Republic","CZE","Goats","fabio" +"16091","Czech Republic","CZE","Pigs","fabio" +"16092","Czech Republic","CZE","Poultry Birds","fabio" +"16093","Czech Republic","CZE","Horses","fabio" +"16094","Czech Republic","CZE","Asses","fabio" +"16095","Czech Republic","CZE","Mules","fabio" +"16096","Czech Republic","CZE","Camels","fabio" +"16097","Czech Republic","CZE","Camelids, other","fabio" +"16098","Czech Republic","CZE","Rabbits and hares","fabio" +"16099","Czech Republic","CZE","Rodents, other","fabio" +"16100","Czech Republic","CZE","Live animals, other","fabio" +"16101","Czech Republic","CZE","Milk - Excluding Butter","fabio" +"16102","Czech Republic","CZE","Butter, Ghee","fabio" +"16103","Czech Republic","CZE","Eggs","fabio" +"16104","Czech Republic","CZE","Wool (Clean Eq.)","fabio" +"16105","Czech Republic","CZE","Bovine Meat","fabio" +"16106","Czech Republic","CZE","Mutton & Goat Meat","fabio" +"16107","Czech Republic","CZE","Pigmeat","fabio" +"16108","Czech Republic","CZE","Poultry Meat","fabio" +"16109","Czech Republic","CZE","Meat, Other","fabio" +"16110","Czech Republic","CZE","Offals, Edible","fabio" +"16111","Czech Republic","CZE","Fats, Animals, Raw","fabio" +"16112","Czech Republic","CZE","Hides and skins","fabio" +"16113","Czech Republic","CZE","Meat Meal","fabio" +"16114","Czech Republic","CZE","Pet food","fabio" +"16115","Czech Republic","CZE","Honey","fabio" +"16116","Czech Republic","CZE","Silk","fabio" +"16117","Czech Republic","CZE","Fish, Seafood","fabio" +"16118","Czech Republic","CZE","Wood fuel","fabio" +"16119","Czech Republic","CZE","Industrial roundwood, coniferous","fabio" +"16120","Czech Republic","CZE","Industrial roundwood, non-coniferous","fabio" +"16121","Papua New Guinea","PNG","Rice (Milled Equivalent)","fabio" +"16122","Papua New Guinea","PNG","Wheat and products","fabio" +"16123","Papua New Guinea","PNG","Barley and products","fabio" +"16124","Papua New Guinea","PNG","Maize and products","fabio" +"16125","Papua New Guinea","PNG","Rye and products","fabio" +"16126","Papua New Guinea","PNG","Oats","fabio" +"16127","Papua New Guinea","PNG","Millet and products","fabio" +"16128","Papua New Guinea","PNG","Sorghum and products","fabio" +"16129","Papua New Guinea","PNG","Cereals, Other","fabio" +"16130","Papua New Guinea","PNG","Potatoes and products","fabio" +"16131","Papua New Guinea","PNG","Cassava and products","fabio" +"16132","Papua New Guinea","PNG","Sweet potatoes","fabio" +"16133","Papua New Guinea","PNG","Roots, Other","fabio" +"16134","Papua New Guinea","PNG","Yams","fabio" +"16135","Papua New Guinea","PNG","Sugar cane","fabio" +"16136","Papua New Guinea","PNG","Sugar beet","fabio" +"16137","Papua New Guinea","PNG","Beans","fabio" +"16138","Papua New Guinea","PNG","Peas","fabio" +"16139","Papua New Guinea","PNG","Pulses, Other and products","fabio" +"16140","Papua New Guinea","PNG","Nuts and products","fabio" +"16141","Papua New Guinea","PNG","Soyabeans","fabio" +"16142","Papua New Guinea","PNG","Groundnuts (Shelled Eq)","fabio" +"16143","Papua New Guinea","PNG","Sunflower seed","fabio" +"16144","Papua New Guinea","PNG","Rape and Mustardseed","fabio" +"16145","Papua New Guinea","PNG","Seed cotton","fabio" +"16146","Papua New Guinea","PNG","Coconuts - Incl Copra","fabio" +"16147","Papua New Guinea","PNG","Sesame seed","fabio" +"16148","Papua New Guinea","PNG","Oil, palm fruit","fabio" +"16149","Papua New Guinea","PNG","Olives (including preserved)","fabio" +"16150","Papua New Guinea","PNG","Oilcrops, Other","fabio" +"16151","Papua New Guinea","PNG","Tomatoes and products","fabio" +"16152","Papua New Guinea","PNG","Onions","fabio" +"16153","Papua New Guinea","PNG","Vegetables, Other","fabio" +"16154","Papua New Guinea","PNG","Oranges, Mandarines","fabio" +"16155","Papua New Guinea","PNG","Lemons, Limes and products","fabio" +"16156","Papua New Guinea","PNG","Grapefruit and products","fabio" +"16157","Papua New Guinea","PNG","Citrus, Other","fabio" +"16158","Papua New Guinea","PNG","Bananas","fabio" +"16159","Papua New Guinea","PNG","Plantains","fabio" +"16160","Papua New Guinea","PNG","Apples and products","fabio" +"16161","Papua New Guinea","PNG","Pineapples and products","fabio" +"16162","Papua New Guinea","PNG","Dates","fabio" +"16163","Papua New Guinea","PNG","Grapes and products (excl wine)","fabio" +"16164","Papua New Guinea","PNG","Fruits, Other","fabio" +"16165","Papua New Guinea","PNG","Coffee and products","fabio" +"16166","Papua New Guinea","PNG","Cocoa Beans and products","fabio" +"16167","Papua New Guinea","PNG","Tea (including mate)","fabio" +"16168","Papua New Guinea","PNG","Hops","fabio" +"16169","Papua New Guinea","PNG","Pepper","fabio" +"16170","Papua New Guinea","PNG","Pimento","fabio" +"16171","Papua New Guinea","PNG","Cloves","fabio" +"16172","Papua New Guinea","PNG","Spices, Other","fabio" +"16173","Papua New Guinea","PNG","Jute","fabio" +"16174","Papua New Guinea","PNG","Jute-Like Fibres","fabio" +"16175","Papua New Guinea","PNG","Soft-Fibres, Other","fabio" +"16176","Papua New Guinea","PNG","Sisal","fabio" +"16177","Papua New Guinea","PNG","Abaca","fabio" +"16178","Papua New Guinea","PNG","Hard Fibres, Other","fabio" +"16179","Papua New Guinea","PNG","Tobacco","fabio" +"16180","Papua New Guinea","PNG","Rubber","fabio" +"16181","Papua New Guinea","PNG","Fodder crops","fabio" +"16182","Papua New Guinea","PNG","Grazing","fabio" +"16183","Papua New Guinea","PNG","Cottonseed","fabio" +"16184","Papua New Guinea","PNG","Palm kernels","fabio" +"16185","Papua New Guinea","PNG","Sugar non-centrifugal","fabio" +"16186","Papua New Guinea","PNG","Molasses","fabio" +"16187","Papua New Guinea","PNG","Sugar, Refined Equiv","fabio" +"16188","Papua New Guinea","PNG","Sweeteners, Other","fabio" +"16189","Papua New Guinea","PNG","Soyabean Oil","fabio" +"16190","Papua New Guinea","PNG","Groundnut Oil","fabio" +"16191","Papua New Guinea","PNG","Sunflowerseed Oil","fabio" +"16192","Papua New Guinea","PNG","Rape and Mustard Oil","fabio" +"16193","Papua New Guinea","PNG","Cottonseed Oil","fabio" +"16194","Papua New Guinea","PNG","Palmkernel Oil","fabio" +"16195","Papua New Guinea","PNG","Palm Oil","fabio" +"16196","Papua New Guinea","PNG","Coconut Oil","fabio" +"16197","Papua New Guinea","PNG","Sesameseed Oil","fabio" +"16198","Papua New Guinea","PNG","Olive Oil","fabio" +"16199","Papua New Guinea","PNG","Ricebran Oil","fabio" +"16200","Papua New Guinea","PNG","Maize Germ Oil","fabio" +"16201","Papua New Guinea","PNG","Oilcrops Oil, Other","fabio" +"16202","Papua New Guinea","PNG","Soyabean Cake","fabio" +"16203","Papua New Guinea","PNG","Groundnut Cake","fabio" +"16204","Papua New Guinea","PNG","Sunflowerseed Cake","fabio" +"16205","Papua New Guinea","PNG","Rape and Mustard Cake","fabio" +"16206","Papua New Guinea","PNG","Cottonseed Cake","fabio" +"16207","Papua New Guinea","PNG","Palmkernel Cake","fabio" +"16208","Papua New Guinea","PNG","Copra Cake","fabio" +"16209","Papua New Guinea","PNG","Sesameseed Cake","fabio" +"16210","Papua New Guinea","PNG","Oilseed Cakes, Other","fabio" +"16211","Papua New Guinea","PNG","Wine","fabio" +"16212","Papua New Guinea","PNG","Beer","fabio" +"16213","Papua New Guinea","PNG","Beverages, Fermented","fabio" +"16214","Papua New Guinea","PNG","Beverages, Alcoholic","fabio" +"16215","Papua New Guinea","PNG","Alcohol, Non-Food","fabio" +"16216","Papua New Guinea","PNG","Cotton lint","fabio" +"16217","Papua New Guinea","PNG","Cattle","fabio" +"16218","Papua New Guinea","PNG","Buffaloes","fabio" +"16219","Papua New Guinea","PNG","Sheep","fabio" +"16220","Papua New Guinea","PNG","Goats","fabio" +"16221","Papua New Guinea","PNG","Pigs","fabio" +"16222","Papua New Guinea","PNG","Poultry Birds","fabio" +"16223","Papua New Guinea","PNG","Horses","fabio" +"16224","Papua New Guinea","PNG","Asses","fabio" +"16225","Papua New Guinea","PNG","Mules","fabio" +"16226","Papua New Guinea","PNG","Camels","fabio" +"16227","Papua New Guinea","PNG","Camelids, other","fabio" +"16228","Papua New Guinea","PNG","Rabbits and hares","fabio" +"16229","Papua New Guinea","PNG","Rodents, other","fabio" +"16230","Papua New Guinea","PNG","Live animals, other","fabio" +"16231","Papua New Guinea","PNG","Milk - Excluding Butter","fabio" +"16232","Papua New Guinea","PNG","Butter, Ghee","fabio" +"16233","Papua New Guinea","PNG","Eggs","fabio" +"16234","Papua New Guinea","PNG","Wool (Clean Eq.)","fabio" +"16235","Papua New Guinea","PNG","Bovine Meat","fabio" +"16236","Papua New Guinea","PNG","Mutton & Goat Meat","fabio" +"16237","Papua New Guinea","PNG","Pigmeat","fabio" +"16238","Papua New Guinea","PNG","Poultry Meat","fabio" +"16239","Papua New Guinea","PNG","Meat, Other","fabio" +"16240","Papua New Guinea","PNG","Offals, Edible","fabio" +"16241","Papua New Guinea","PNG","Fats, Animals, Raw","fabio" +"16242","Papua New Guinea","PNG","Hides and skins","fabio" +"16243","Papua New Guinea","PNG","Meat Meal","fabio" +"16244","Papua New Guinea","PNG","Pet food","fabio" +"16245","Papua New Guinea","PNG","Honey","fabio" +"16246","Papua New Guinea","PNG","Silk","fabio" +"16247","Papua New Guinea","PNG","Fish, Seafood","fabio" +"16248","Papua New Guinea","PNG","Wood fuel","fabio" +"16249","Papua New Guinea","PNG","Industrial roundwood, coniferous","fabio" +"16250","Papua New Guinea","PNG","Industrial roundwood, non-coniferous","fabio" +"16251","Paraguay","PRY","Rice (Milled Equivalent)","fabio" +"16252","Paraguay","PRY","Wheat and products","fabio" +"16253","Paraguay","PRY","Barley and products","fabio" +"16254","Paraguay","PRY","Maize and products","fabio" +"16255","Paraguay","PRY","Rye and products","fabio" +"16256","Paraguay","PRY","Oats","fabio" +"16257","Paraguay","PRY","Millet and products","fabio" +"16258","Paraguay","PRY","Sorghum and products","fabio" +"16259","Paraguay","PRY","Cereals, Other","fabio" +"16260","Paraguay","PRY","Potatoes and products","fabio" +"16261","Paraguay","PRY","Cassava and products","fabio" +"16262","Paraguay","PRY","Sweet potatoes","fabio" +"16263","Paraguay","PRY","Roots, Other","fabio" +"16264","Paraguay","PRY","Yams","fabio" +"16265","Paraguay","PRY","Sugar cane","fabio" +"16266","Paraguay","PRY","Sugar beet","fabio" +"16267","Paraguay","PRY","Beans","fabio" +"16268","Paraguay","PRY","Peas","fabio" +"16269","Paraguay","PRY","Pulses, Other and products","fabio" +"16270","Paraguay","PRY","Nuts and products","fabio" +"16271","Paraguay","PRY","Soyabeans","fabio" +"16272","Paraguay","PRY","Groundnuts (Shelled Eq)","fabio" +"16273","Paraguay","PRY","Sunflower seed","fabio" +"16274","Paraguay","PRY","Rape and Mustardseed","fabio" +"16275","Paraguay","PRY","Seed cotton","fabio" +"16276","Paraguay","PRY","Coconuts - Incl Copra","fabio" +"16277","Paraguay","PRY","Sesame seed","fabio" +"16278","Paraguay","PRY","Oil, palm fruit","fabio" +"16279","Paraguay","PRY","Olives (including preserved)","fabio" +"16280","Paraguay","PRY","Oilcrops, Other","fabio" +"16281","Paraguay","PRY","Tomatoes and products","fabio" +"16282","Paraguay","PRY","Onions","fabio" +"16283","Paraguay","PRY","Vegetables, Other","fabio" +"16284","Paraguay","PRY","Oranges, Mandarines","fabio" +"16285","Paraguay","PRY","Lemons, Limes and products","fabio" +"16286","Paraguay","PRY","Grapefruit and products","fabio" +"16287","Paraguay","PRY","Citrus, Other","fabio" +"16288","Paraguay","PRY","Bananas","fabio" +"16289","Paraguay","PRY","Plantains","fabio" +"16290","Paraguay","PRY","Apples and products","fabio" +"16291","Paraguay","PRY","Pineapples and products","fabio" +"16292","Paraguay","PRY","Dates","fabio" +"16293","Paraguay","PRY","Grapes and products (excl wine)","fabio" +"16294","Paraguay","PRY","Fruits, Other","fabio" +"16295","Paraguay","PRY","Coffee and products","fabio" +"16296","Paraguay","PRY","Cocoa Beans and products","fabio" +"16297","Paraguay","PRY","Tea (including mate)","fabio" +"16298","Paraguay","PRY","Hops","fabio" +"16299","Paraguay","PRY","Pepper","fabio" +"16300","Paraguay","PRY","Pimento","fabio" +"16301","Paraguay","PRY","Cloves","fabio" +"16302","Paraguay","PRY","Spices, Other","fabio" +"16303","Paraguay","PRY","Jute","fabio" +"16304","Paraguay","PRY","Jute-Like Fibres","fabio" +"16305","Paraguay","PRY","Soft-Fibres, Other","fabio" +"16306","Paraguay","PRY","Sisal","fabio" +"16307","Paraguay","PRY","Abaca","fabio" +"16308","Paraguay","PRY","Hard Fibres, Other","fabio" +"16309","Paraguay","PRY","Tobacco","fabio" +"16310","Paraguay","PRY","Rubber","fabio" +"16311","Paraguay","PRY","Fodder crops","fabio" +"16312","Paraguay","PRY","Grazing","fabio" +"16313","Paraguay","PRY","Cottonseed","fabio" +"16314","Paraguay","PRY","Palm kernels","fabio" +"16315","Paraguay","PRY","Sugar non-centrifugal","fabio" +"16316","Paraguay","PRY","Molasses","fabio" +"16317","Paraguay","PRY","Sugar, Refined Equiv","fabio" +"16318","Paraguay","PRY","Sweeteners, Other","fabio" +"16319","Paraguay","PRY","Soyabean Oil","fabio" +"16320","Paraguay","PRY","Groundnut Oil","fabio" +"16321","Paraguay","PRY","Sunflowerseed Oil","fabio" +"16322","Paraguay","PRY","Rape and Mustard Oil","fabio" +"16323","Paraguay","PRY","Cottonseed Oil","fabio" +"16324","Paraguay","PRY","Palmkernel Oil","fabio" +"16325","Paraguay","PRY","Palm Oil","fabio" +"16326","Paraguay","PRY","Coconut Oil","fabio" +"16327","Paraguay","PRY","Sesameseed Oil","fabio" +"16328","Paraguay","PRY","Olive Oil","fabio" +"16329","Paraguay","PRY","Ricebran Oil","fabio" +"16330","Paraguay","PRY","Maize Germ Oil","fabio" +"16331","Paraguay","PRY","Oilcrops Oil, Other","fabio" +"16332","Paraguay","PRY","Soyabean Cake","fabio" +"16333","Paraguay","PRY","Groundnut Cake","fabio" +"16334","Paraguay","PRY","Sunflowerseed Cake","fabio" +"16335","Paraguay","PRY","Rape and Mustard Cake","fabio" +"16336","Paraguay","PRY","Cottonseed Cake","fabio" +"16337","Paraguay","PRY","Palmkernel Cake","fabio" +"16338","Paraguay","PRY","Copra Cake","fabio" +"16339","Paraguay","PRY","Sesameseed Cake","fabio" +"16340","Paraguay","PRY","Oilseed Cakes, Other","fabio" +"16341","Paraguay","PRY","Wine","fabio" +"16342","Paraguay","PRY","Beer","fabio" +"16343","Paraguay","PRY","Beverages, Fermented","fabio" +"16344","Paraguay","PRY","Beverages, Alcoholic","fabio" +"16345","Paraguay","PRY","Alcohol, Non-Food","fabio" +"16346","Paraguay","PRY","Cotton lint","fabio" +"16347","Paraguay","PRY","Cattle","fabio" +"16348","Paraguay","PRY","Buffaloes","fabio" +"16349","Paraguay","PRY","Sheep","fabio" +"16350","Paraguay","PRY","Goats","fabio" +"16351","Paraguay","PRY","Pigs","fabio" +"16352","Paraguay","PRY","Poultry Birds","fabio" +"16353","Paraguay","PRY","Horses","fabio" +"16354","Paraguay","PRY","Asses","fabio" +"16355","Paraguay","PRY","Mules","fabio" +"16356","Paraguay","PRY","Camels","fabio" +"16357","Paraguay","PRY","Camelids, other","fabio" +"16358","Paraguay","PRY","Rabbits and hares","fabio" +"16359","Paraguay","PRY","Rodents, other","fabio" +"16360","Paraguay","PRY","Live animals, other","fabio" +"16361","Paraguay","PRY","Milk - Excluding Butter","fabio" +"16362","Paraguay","PRY","Butter, Ghee","fabio" +"16363","Paraguay","PRY","Eggs","fabio" +"16364","Paraguay","PRY","Wool (Clean Eq.)","fabio" +"16365","Paraguay","PRY","Bovine Meat","fabio" +"16366","Paraguay","PRY","Mutton & Goat Meat","fabio" +"16367","Paraguay","PRY","Pigmeat","fabio" +"16368","Paraguay","PRY","Poultry Meat","fabio" +"16369","Paraguay","PRY","Meat, Other","fabio" +"16370","Paraguay","PRY","Offals, Edible","fabio" +"16371","Paraguay","PRY","Fats, Animals, Raw","fabio" +"16372","Paraguay","PRY","Hides and skins","fabio" +"16373","Paraguay","PRY","Meat Meal","fabio" +"16374","Paraguay","PRY","Pet food","fabio" +"16375","Paraguay","PRY","Honey","fabio" +"16376","Paraguay","PRY","Silk","fabio" +"16377","Paraguay","PRY","Fish, Seafood","fabio" +"16378","Paraguay","PRY","Wood fuel","fabio" +"16379","Paraguay","PRY","Industrial roundwood, coniferous","fabio" +"16380","Paraguay","PRY","Industrial roundwood, non-coniferous","fabio" +"16381","Peru","PER","Rice (Milled Equivalent)","fabio" +"16382","Peru","PER","Wheat and products","fabio" +"16383","Peru","PER","Barley and products","fabio" +"16384","Peru","PER","Maize and products","fabio" +"16385","Peru","PER","Rye and products","fabio" +"16386","Peru","PER","Oats","fabio" +"16387","Peru","PER","Millet and products","fabio" +"16388","Peru","PER","Sorghum and products","fabio" +"16389","Peru","PER","Cereals, Other","fabio" +"16390","Peru","PER","Potatoes and products","fabio" +"16391","Peru","PER","Cassava and products","fabio" +"16392","Peru","PER","Sweet potatoes","fabio" +"16393","Peru","PER","Roots, Other","fabio" +"16394","Peru","PER","Yams","fabio" +"16395","Peru","PER","Sugar cane","fabio" +"16396","Peru","PER","Sugar beet","fabio" +"16397","Peru","PER","Beans","fabio" +"16398","Peru","PER","Peas","fabio" +"16399","Peru","PER","Pulses, Other and products","fabio" +"16400","Peru","PER","Nuts and products","fabio" +"16401","Peru","PER","Soyabeans","fabio" +"16402","Peru","PER","Groundnuts (Shelled Eq)","fabio" +"16403","Peru","PER","Sunflower seed","fabio" +"16404","Peru","PER","Rape and Mustardseed","fabio" +"16405","Peru","PER","Seed cotton","fabio" +"16406","Peru","PER","Coconuts - Incl Copra","fabio" +"16407","Peru","PER","Sesame seed","fabio" +"16408","Peru","PER","Oil, palm fruit","fabio" +"16409","Peru","PER","Olives (including preserved)","fabio" +"16410","Peru","PER","Oilcrops, Other","fabio" +"16411","Peru","PER","Tomatoes and products","fabio" +"16412","Peru","PER","Onions","fabio" +"16413","Peru","PER","Vegetables, Other","fabio" +"16414","Peru","PER","Oranges, Mandarines","fabio" +"16415","Peru","PER","Lemons, Limes and products","fabio" +"16416","Peru","PER","Grapefruit and products","fabio" +"16417","Peru","PER","Citrus, Other","fabio" +"16418","Peru","PER","Bananas","fabio" +"16419","Peru","PER","Plantains","fabio" +"16420","Peru","PER","Apples and products","fabio" +"16421","Peru","PER","Pineapples and products","fabio" +"16422","Peru","PER","Dates","fabio" +"16423","Peru","PER","Grapes and products (excl wine)","fabio" +"16424","Peru","PER","Fruits, Other","fabio" +"16425","Peru","PER","Coffee and products","fabio" +"16426","Peru","PER","Cocoa Beans and products","fabio" +"16427","Peru","PER","Tea (including mate)","fabio" +"16428","Peru","PER","Hops","fabio" +"16429","Peru","PER","Pepper","fabio" +"16430","Peru","PER","Pimento","fabio" +"16431","Peru","PER","Cloves","fabio" +"16432","Peru","PER","Spices, Other","fabio" +"16433","Peru","PER","Jute","fabio" +"16434","Peru","PER","Jute-Like Fibres","fabio" +"16435","Peru","PER","Soft-Fibres, Other","fabio" +"16436","Peru","PER","Sisal","fabio" +"16437","Peru","PER","Abaca","fabio" +"16438","Peru","PER","Hard Fibres, Other","fabio" +"16439","Peru","PER","Tobacco","fabio" +"16440","Peru","PER","Rubber","fabio" +"16441","Peru","PER","Fodder crops","fabio" +"16442","Peru","PER","Grazing","fabio" +"16443","Peru","PER","Cottonseed","fabio" +"16444","Peru","PER","Palm kernels","fabio" +"16445","Peru","PER","Sugar non-centrifugal","fabio" +"16446","Peru","PER","Molasses","fabio" +"16447","Peru","PER","Sugar, Refined Equiv","fabio" +"16448","Peru","PER","Sweeteners, Other","fabio" +"16449","Peru","PER","Soyabean Oil","fabio" +"16450","Peru","PER","Groundnut Oil","fabio" +"16451","Peru","PER","Sunflowerseed Oil","fabio" +"16452","Peru","PER","Rape and Mustard Oil","fabio" +"16453","Peru","PER","Cottonseed Oil","fabio" +"16454","Peru","PER","Palmkernel Oil","fabio" +"16455","Peru","PER","Palm Oil","fabio" +"16456","Peru","PER","Coconut Oil","fabio" +"16457","Peru","PER","Sesameseed Oil","fabio" +"16458","Peru","PER","Olive Oil","fabio" +"16459","Peru","PER","Ricebran Oil","fabio" +"16460","Peru","PER","Maize Germ Oil","fabio" +"16461","Peru","PER","Oilcrops Oil, Other","fabio" +"16462","Peru","PER","Soyabean Cake","fabio" +"16463","Peru","PER","Groundnut Cake","fabio" +"16464","Peru","PER","Sunflowerseed Cake","fabio" +"16465","Peru","PER","Rape and Mustard Cake","fabio" +"16466","Peru","PER","Cottonseed Cake","fabio" +"16467","Peru","PER","Palmkernel Cake","fabio" +"16468","Peru","PER","Copra Cake","fabio" +"16469","Peru","PER","Sesameseed Cake","fabio" +"16470","Peru","PER","Oilseed Cakes, Other","fabio" +"16471","Peru","PER","Wine","fabio" +"16472","Peru","PER","Beer","fabio" +"16473","Peru","PER","Beverages, Fermented","fabio" +"16474","Peru","PER","Beverages, Alcoholic","fabio" +"16475","Peru","PER","Alcohol, Non-Food","fabio" +"16476","Peru","PER","Cotton lint","fabio" +"16477","Peru","PER","Cattle","fabio" +"16478","Peru","PER","Buffaloes","fabio" +"16479","Peru","PER","Sheep","fabio" +"16480","Peru","PER","Goats","fabio" +"16481","Peru","PER","Pigs","fabio" +"16482","Peru","PER","Poultry Birds","fabio" +"16483","Peru","PER","Horses","fabio" +"16484","Peru","PER","Asses","fabio" +"16485","Peru","PER","Mules","fabio" +"16486","Peru","PER","Camels","fabio" +"16487","Peru","PER","Camelids, other","fabio" +"16488","Peru","PER","Rabbits and hares","fabio" +"16489","Peru","PER","Rodents, other","fabio" +"16490","Peru","PER","Live animals, other","fabio" +"16491","Peru","PER","Milk - Excluding Butter","fabio" +"16492","Peru","PER","Butter, Ghee","fabio" +"16493","Peru","PER","Eggs","fabio" +"16494","Peru","PER","Wool (Clean Eq.)","fabio" +"16495","Peru","PER","Bovine Meat","fabio" +"16496","Peru","PER","Mutton & Goat Meat","fabio" +"16497","Peru","PER","Pigmeat","fabio" +"16498","Peru","PER","Poultry Meat","fabio" +"16499","Peru","PER","Meat, Other","fabio" +"16500","Peru","PER","Offals, Edible","fabio" +"16501","Peru","PER","Fats, Animals, Raw","fabio" +"16502","Peru","PER","Hides and skins","fabio" +"16503","Peru","PER","Meat Meal","fabio" +"16504","Peru","PER","Pet food","fabio" +"16505","Peru","PER","Honey","fabio" +"16506","Peru","PER","Silk","fabio" +"16507","Peru","PER","Fish, Seafood","fabio" +"16508","Peru","PER","Wood fuel","fabio" +"16509","Peru","PER","Industrial roundwood, coniferous","fabio" +"16510","Peru","PER","Industrial roundwood, non-coniferous","fabio" +"16511","Philippines","PHL","Rice (Milled Equivalent)","fabio" +"16512","Philippines","PHL","Wheat and products","fabio" +"16513","Philippines","PHL","Barley and products","fabio" +"16514","Philippines","PHL","Maize and products","fabio" +"16515","Philippines","PHL","Rye and products","fabio" +"16516","Philippines","PHL","Oats","fabio" +"16517","Philippines","PHL","Millet and products","fabio" +"16518","Philippines","PHL","Sorghum and products","fabio" +"16519","Philippines","PHL","Cereals, Other","fabio" +"16520","Philippines","PHL","Potatoes and products","fabio" +"16521","Philippines","PHL","Cassava and products","fabio" +"16522","Philippines","PHL","Sweet potatoes","fabio" +"16523","Philippines","PHL","Roots, Other","fabio" +"16524","Philippines","PHL","Yams","fabio" +"16525","Philippines","PHL","Sugar cane","fabio" +"16526","Philippines","PHL","Sugar beet","fabio" +"16527","Philippines","PHL","Beans","fabio" +"16528","Philippines","PHL","Peas","fabio" +"16529","Philippines","PHL","Pulses, Other and products","fabio" +"16530","Philippines","PHL","Nuts and products","fabio" +"16531","Philippines","PHL","Soyabeans","fabio" +"16532","Philippines","PHL","Groundnuts (Shelled Eq)","fabio" +"16533","Philippines","PHL","Sunflower seed","fabio" +"16534","Philippines","PHL","Rape and Mustardseed","fabio" +"16535","Philippines","PHL","Seed cotton","fabio" +"16536","Philippines","PHL","Coconuts - Incl Copra","fabio" +"16537","Philippines","PHL","Sesame seed","fabio" +"16538","Philippines","PHL","Oil, palm fruit","fabio" +"16539","Philippines","PHL","Olives (including preserved)","fabio" +"16540","Philippines","PHL","Oilcrops, Other","fabio" +"16541","Philippines","PHL","Tomatoes and products","fabio" +"16542","Philippines","PHL","Onions","fabio" +"16543","Philippines","PHL","Vegetables, Other","fabio" +"16544","Philippines","PHL","Oranges, Mandarines","fabio" +"16545","Philippines","PHL","Lemons, Limes and products","fabio" +"16546","Philippines","PHL","Grapefruit and products","fabio" +"16547","Philippines","PHL","Citrus, Other","fabio" +"16548","Philippines","PHL","Bananas","fabio" +"16549","Philippines","PHL","Plantains","fabio" +"16550","Philippines","PHL","Apples and products","fabio" +"16551","Philippines","PHL","Pineapples and products","fabio" +"16552","Philippines","PHL","Dates","fabio" +"16553","Philippines","PHL","Grapes and products (excl wine)","fabio" +"16554","Philippines","PHL","Fruits, Other","fabio" +"16555","Philippines","PHL","Coffee and products","fabio" +"16556","Philippines","PHL","Cocoa Beans and products","fabio" +"16557","Philippines","PHL","Tea (including mate)","fabio" +"16558","Philippines","PHL","Hops","fabio" +"16559","Philippines","PHL","Pepper","fabio" +"16560","Philippines","PHL","Pimento","fabio" +"16561","Philippines","PHL","Cloves","fabio" +"16562","Philippines","PHL","Spices, Other","fabio" +"16563","Philippines","PHL","Jute","fabio" +"16564","Philippines","PHL","Jute-Like Fibres","fabio" +"16565","Philippines","PHL","Soft-Fibres, Other","fabio" +"16566","Philippines","PHL","Sisal","fabio" +"16567","Philippines","PHL","Abaca","fabio" +"16568","Philippines","PHL","Hard Fibres, Other","fabio" +"16569","Philippines","PHL","Tobacco","fabio" +"16570","Philippines","PHL","Rubber","fabio" +"16571","Philippines","PHL","Fodder crops","fabio" +"16572","Philippines","PHL","Grazing","fabio" +"16573","Philippines","PHL","Cottonseed","fabio" +"16574","Philippines","PHL","Palm kernels","fabio" +"16575","Philippines","PHL","Sugar non-centrifugal","fabio" +"16576","Philippines","PHL","Molasses","fabio" +"16577","Philippines","PHL","Sugar, Refined Equiv","fabio" +"16578","Philippines","PHL","Sweeteners, Other","fabio" +"16579","Philippines","PHL","Soyabean Oil","fabio" +"16580","Philippines","PHL","Groundnut Oil","fabio" +"16581","Philippines","PHL","Sunflowerseed Oil","fabio" +"16582","Philippines","PHL","Rape and Mustard Oil","fabio" +"16583","Philippines","PHL","Cottonseed Oil","fabio" +"16584","Philippines","PHL","Palmkernel Oil","fabio" +"16585","Philippines","PHL","Palm Oil","fabio" +"16586","Philippines","PHL","Coconut Oil","fabio" +"16587","Philippines","PHL","Sesameseed Oil","fabio" +"16588","Philippines","PHL","Olive Oil","fabio" +"16589","Philippines","PHL","Ricebran Oil","fabio" +"16590","Philippines","PHL","Maize Germ Oil","fabio" +"16591","Philippines","PHL","Oilcrops Oil, Other","fabio" +"16592","Philippines","PHL","Soyabean Cake","fabio" +"16593","Philippines","PHL","Groundnut Cake","fabio" +"16594","Philippines","PHL","Sunflowerseed Cake","fabio" +"16595","Philippines","PHL","Rape and Mustard Cake","fabio" +"16596","Philippines","PHL","Cottonseed Cake","fabio" +"16597","Philippines","PHL","Palmkernel Cake","fabio" +"16598","Philippines","PHL","Copra Cake","fabio" +"16599","Philippines","PHL","Sesameseed Cake","fabio" +"16600","Philippines","PHL","Oilseed Cakes, Other","fabio" +"16601","Philippines","PHL","Wine","fabio" +"16602","Philippines","PHL","Beer","fabio" +"16603","Philippines","PHL","Beverages, Fermented","fabio" +"16604","Philippines","PHL","Beverages, Alcoholic","fabio" +"16605","Philippines","PHL","Alcohol, Non-Food","fabio" +"16606","Philippines","PHL","Cotton lint","fabio" +"16607","Philippines","PHL","Cattle","fabio" +"16608","Philippines","PHL","Buffaloes","fabio" +"16609","Philippines","PHL","Sheep","fabio" +"16610","Philippines","PHL","Goats","fabio" +"16611","Philippines","PHL","Pigs","fabio" +"16612","Philippines","PHL","Poultry Birds","fabio" +"16613","Philippines","PHL","Horses","fabio" +"16614","Philippines","PHL","Asses","fabio" +"16615","Philippines","PHL","Mules","fabio" +"16616","Philippines","PHL","Camels","fabio" +"16617","Philippines","PHL","Camelids, other","fabio" +"16618","Philippines","PHL","Rabbits and hares","fabio" +"16619","Philippines","PHL","Rodents, other","fabio" +"16620","Philippines","PHL","Live animals, other","fabio" +"16621","Philippines","PHL","Milk - Excluding Butter","fabio" +"16622","Philippines","PHL","Butter, Ghee","fabio" +"16623","Philippines","PHL","Eggs","fabio" +"16624","Philippines","PHL","Wool (Clean Eq.)","fabio" +"16625","Philippines","PHL","Bovine Meat","fabio" +"16626","Philippines","PHL","Mutton & Goat Meat","fabio" +"16627","Philippines","PHL","Pigmeat","fabio" +"16628","Philippines","PHL","Poultry Meat","fabio" +"16629","Philippines","PHL","Meat, Other","fabio" +"16630","Philippines","PHL","Offals, Edible","fabio" +"16631","Philippines","PHL","Fats, Animals, Raw","fabio" +"16632","Philippines","PHL","Hides and skins","fabio" +"16633","Philippines","PHL","Meat Meal","fabio" +"16634","Philippines","PHL","Pet food","fabio" +"16635","Philippines","PHL","Honey","fabio" +"16636","Philippines","PHL","Silk","fabio" +"16637","Philippines","PHL","Fish, Seafood","fabio" +"16638","Philippines","PHL","Wood fuel","fabio" +"16639","Philippines","PHL","Industrial roundwood, coniferous","fabio" +"16640","Philippines","PHL","Industrial roundwood, non-coniferous","fabio" +"16641","Poland","POL","Rice (Milled Equivalent)","fabio" +"16642","Poland","POL","Wheat and products","fabio" +"16643","Poland","POL","Barley and products","fabio" +"16644","Poland","POL","Maize and products","fabio" +"16645","Poland","POL","Rye and products","fabio" +"16646","Poland","POL","Oats","fabio" +"16647","Poland","POL","Millet and products","fabio" +"16648","Poland","POL","Sorghum and products","fabio" +"16649","Poland","POL","Cereals, Other","fabio" +"16650","Poland","POL","Potatoes and products","fabio" +"16651","Poland","POL","Cassava and products","fabio" +"16652","Poland","POL","Sweet potatoes","fabio" +"16653","Poland","POL","Roots, Other","fabio" +"16654","Poland","POL","Yams","fabio" +"16655","Poland","POL","Sugar cane","fabio" +"16656","Poland","POL","Sugar beet","fabio" +"16657","Poland","POL","Beans","fabio" +"16658","Poland","POL","Peas","fabio" +"16659","Poland","POL","Pulses, Other and products","fabio" +"16660","Poland","POL","Nuts and products","fabio" +"16661","Poland","POL","Soyabeans","fabio" +"16662","Poland","POL","Groundnuts (Shelled Eq)","fabio" +"16663","Poland","POL","Sunflower seed","fabio" +"16664","Poland","POL","Rape and Mustardseed","fabio" +"16665","Poland","POL","Seed cotton","fabio" +"16666","Poland","POL","Coconuts - Incl Copra","fabio" +"16667","Poland","POL","Sesame seed","fabio" +"16668","Poland","POL","Oil, palm fruit","fabio" +"16669","Poland","POL","Olives (including preserved)","fabio" +"16670","Poland","POL","Oilcrops, Other","fabio" +"16671","Poland","POL","Tomatoes and products","fabio" +"16672","Poland","POL","Onions","fabio" +"16673","Poland","POL","Vegetables, Other","fabio" +"16674","Poland","POL","Oranges, Mandarines","fabio" +"16675","Poland","POL","Lemons, Limes and products","fabio" +"16676","Poland","POL","Grapefruit and products","fabio" +"16677","Poland","POL","Citrus, Other","fabio" +"16678","Poland","POL","Bananas","fabio" +"16679","Poland","POL","Plantains","fabio" +"16680","Poland","POL","Apples and products","fabio" +"16681","Poland","POL","Pineapples and products","fabio" +"16682","Poland","POL","Dates","fabio" +"16683","Poland","POL","Grapes and products (excl wine)","fabio" +"16684","Poland","POL","Fruits, Other","fabio" +"16685","Poland","POL","Coffee and products","fabio" +"16686","Poland","POL","Cocoa Beans and products","fabio" +"16687","Poland","POL","Tea (including mate)","fabio" +"16688","Poland","POL","Hops","fabio" +"16689","Poland","POL","Pepper","fabio" +"16690","Poland","POL","Pimento","fabio" +"16691","Poland","POL","Cloves","fabio" +"16692","Poland","POL","Spices, Other","fabio" +"16693","Poland","POL","Jute","fabio" +"16694","Poland","POL","Jute-Like Fibres","fabio" +"16695","Poland","POL","Soft-Fibres, Other","fabio" +"16696","Poland","POL","Sisal","fabio" +"16697","Poland","POL","Abaca","fabio" +"16698","Poland","POL","Hard Fibres, Other","fabio" +"16699","Poland","POL","Tobacco","fabio" +"16700","Poland","POL","Rubber","fabio" +"16701","Poland","POL","Fodder crops","fabio" +"16702","Poland","POL","Grazing","fabio" +"16703","Poland","POL","Cottonseed","fabio" +"16704","Poland","POL","Palm kernels","fabio" +"16705","Poland","POL","Sugar non-centrifugal","fabio" +"16706","Poland","POL","Molasses","fabio" +"16707","Poland","POL","Sugar, Refined Equiv","fabio" +"16708","Poland","POL","Sweeteners, Other","fabio" +"16709","Poland","POL","Soyabean Oil","fabio" +"16710","Poland","POL","Groundnut Oil","fabio" +"16711","Poland","POL","Sunflowerseed Oil","fabio" +"16712","Poland","POL","Rape and Mustard Oil","fabio" +"16713","Poland","POL","Cottonseed Oil","fabio" +"16714","Poland","POL","Palmkernel Oil","fabio" +"16715","Poland","POL","Palm Oil","fabio" +"16716","Poland","POL","Coconut Oil","fabio" +"16717","Poland","POL","Sesameseed Oil","fabio" +"16718","Poland","POL","Olive Oil","fabio" +"16719","Poland","POL","Ricebran Oil","fabio" +"16720","Poland","POL","Maize Germ Oil","fabio" +"16721","Poland","POL","Oilcrops Oil, Other","fabio" +"16722","Poland","POL","Soyabean Cake","fabio" +"16723","Poland","POL","Groundnut Cake","fabio" +"16724","Poland","POL","Sunflowerseed Cake","fabio" +"16725","Poland","POL","Rape and Mustard Cake","fabio" +"16726","Poland","POL","Cottonseed Cake","fabio" +"16727","Poland","POL","Palmkernel Cake","fabio" +"16728","Poland","POL","Copra Cake","fabio" +"16729","Poland","POL","Sesameseed Cake","fabio" +"16730","Poland","POL","Oilseed Cakes, Other","fabio" +"16731","Poland","POL","Wine","fabio" +"16732","Poland","POL","Beer","fabio" +"16733","Poland","POL","Beverages, Fermented","fabio" +"16734","Poland","POL","Beverages, Alcoholic","fabio" +"16735","Poland","POL","Alcohol, Non-Food","fabio" +"16736","Poland","POL","Cotton lint","fabio" +"16737","Poland","POL","Cattle","fabio" +"16738","Poland","POL","Buffaloes","fabio" +"16739","Poland","POL","Sheep","fabio" +"16740","Poland","POL","Goats","fabio" +"16741","Poland","POL","Pigs","fabio" +"16742","Poland","POL","Poultry Birds","fabio" +"16743","Poland","POL","Horses","fabio" +"16744","Poland","POL","Asses","fabio" +"16745","Poland","POL","Mules","fabio" +"16746","Poland","POL","Camels","fabio" +"16747","Poland","POL","Camelids, other","fabio" +"16748","Poland","POL","Rabbits and hares","fabio" +"16749","Poland","POL","Rodents, other","fabio" +"16750","Poland","POL","Live animals, other","fabio" +"16751","Poland","POL","Milk - Excluding Butter","fabio" +"16752","Poland","POL","Butter, Ghee","fabio" +"16753","Poland","POL","Eggs","fabio" +"16754","Poland","POL","Wool (Clean Eq.)","fabio" +"16755","Poland","POL","Bovine Meat","fabio" +"16756","Poland","POL","Mutton & Goat Meat","fabio" +"16757","Poland","POL","Pigmeat","fabio" +"16758","Poland","POL","Poultry Meat","fabio" +"16759","Poland","POL","Meat, Other","fabio" +"16760","Poland","POL","Offals, Edible","fabio" +"16761","Poland","POL","Fats, Animals, Raw","fabio" +"16762","Poland","POL","Hides and skins","fabio" +"16763","Poland","POL","Meat Meal","fabio" +"16764","Poland","POL","Pet food","fabio" +"16765","Poland","POL","Honey","fabio" +"16766","Poland","POL","Silk","fabio" +"16767","Poland","POL","Fish, Seafood","fabio" +"16768","Poland","POL","Wood fuel","fabio" +"16769","Poland","POL","Industrial roundwood, coniferous","fabio" +"16770","Poland","POL","Industrial roundwood, non-coniferous","fabio" +"16771","Portugal","PRT","Rice (Milled Equivalent)","fabio" +"16772","Portugal","PRT","Wheat and products","fabio" +"16773","Portugal","PRT","Barley and products","fabio" +"16774","Portugal","PRT","Maize and products","fabio" +"16775","Portugal","PRT","Rye and products","fabio" +"16776","Portugal","PRT","Oats","fabio" +"16777","Portugal","PRT","Millet and products","fabio" +"16778","Portugal","PRT","Sorghum and products","fabio" +"16779","Portugal","PRT","Cereals, Other","fabio" +"16780","Portugal","PRT","Potatoes and products","fabio" +"16781","Portugal","PRT","Cassava and products","fabio" +"16782","Portugal","PRT","Sweet potatoes","fabio" +"16783","Portugal","PRT","Roots, Other","fabio" +"16784","Portugal","PRT","Yams","fabio" +"16785","Portugal","PRT","Sugar cane","fabio" +"16786","Portugal","PRT","Sugar beet","fabio" +"16787","Portugal","PRT","Beans","fabio" +"16788","Portugal","PRT","Peas","fabio" +"16789","Portugal","PRT","Pulses, Other and products","fabio" +"16790","Portugal","PRT","Nuts and products","fabio" +"16791","Portugal","PRT","Soyabeans","fabio" +"16792","Portugal","PRT","Groundnuts (Shelled Eq)","fabio" +"16793","Portugal","PRT","Sunflower seed","fabio" +"16794","Portugal","PRT","Rape and Mustardseed","fabio" +"16795","Portugal","PRT","Seed cotton","fabio" +"16796","Portugal","PRT","Coconuts - Incl Copra","fabio" +"16797","Portugal","PRT","Sesame seed","fabio" +"16798","Portugal","PRT","Oil, palm fruit","fabio" +"16799","Portugal","PRT","Olives (including preserved)","fabio" +"16800","Portugal","PRT","Oilcrops, Other","fabio" +"16801","Portugal","PRT","Tomatoes and products","fabio" +"16802","Portugal","PRT","Onions","fabio" +"16803","Portugal","PRT","Vegetables, Other","fabio" +"16804","Portugal","PRT","Oranges, Mandarines","fabio" +"16805","Portugal","PRT","Lemons, Limes and products","fabio" +"16806","Portugal","PRT","Grapefruit and products","fabio" +"16807","Portugal","PRT","Citrus, Other","fabio" +"16808","Portugal","PRT","Bananas","fabio" +"16809","Portugal","PRT","Plantains","fabio" +"16810","Portugal","PRT","Apples and products","fabio" +"16811","Portugal","PRT","Pineapples and products","fabio" +"16812","Portugal","PRT","Dates","fabio" +"16813","Portugal","PRT","Grapes and products (excl wine)","fabio" +"16814","Portugal","PRT","Fruits, Other","fabio" +"16815","Portugal","PRT","Coffee and products","fabio" +"16816","Portugal","PRT","Cocoa Beans and products","fabio" +"16817","Portugal","PRT","Tea (including mate)","fabio" +"16818","Portugal","PRT","Hops","fabio" +"16819","Portugal","PRT","Pepper","fabio" +"16820","Portugal","PRT","Pimento","fabio" +"16821","Portugal","PRT","Cloves","fabio" +"16822","Portugal","PRT","Spices, Other","fabio" +"16823","Portugal","PRT","Jute","fabio" +"16824","Portugal","PRT","Jute-Like Fibres","fabio" +"16825","Portugal","PRT","Soft-Fibres, Other","fabio" +"16826","Portugal","PRT","Sisal","fabio" +"16827","Portugal","PRT","Abaca","fabio" +"16828","Portugal","PRT","Hard Fibres, Other","fabio" +"16829","Portugal","PRT","Tobacco","fabio" +"16830","Portugal","PRT","Rubber","fabio" +"16831","Portugal","PRT","Fodder crops","fabio" +"16832","Portugal","PRT","Grazing","fabio" +"16833","Portugal","PRT","Cottonseed","fabio" +"16834","Portugal","PRT","Palm kernels","fabio" +"16835","Portugal","PRT","Sugar non-centrifugal","fabio" +"16836","Portugal","PRT","Molasses","fabio" +"16837","Portugal","PRT","Sugar, Refined Equiv","fabio" +"16838","Portugal","PRT","Sweeteners, Other","fabio" +"16839","Portugal","PRT","Soyabean Oil","fabio" +"16840","Portugal","PRT","Groundnut Oil","fabio" +"16841","Portugal","PRT","Sunflowerseed Oil","fabio" +"16842","Portugal","PRT","Rape and Mustard Oil","fabio" +"16843","Portugal","PRT","Cottonseed Oil","fabio" +"16844","Portugal","PRT","Palmkernel Oil","fabio" +"16845","Portugal","PRT","Palm Oil","fabio" +"16846","Portugal","PRT","Coconut Oil","fabio" +"16847","Portugal","PRT","Sesameseed Oil","fabio" +"16848","Portugal","PRT","Olive Oil","fabio" +"16849","Portugal","PRT","Ricebran Oil","fabio" +"16850","Portugal","PRT","Maize Germ Oil","fabio" +"16851","Portugal","PRT","Oilcrops Oil, Other","fabio" +"16852","Portugal","PRT","Soyabean Cake","fabio" +"16853","Portugal","PRT","Groundnut Cake","fabio" +"16854","Portugal","PRT","Sunflowerseed Cake","fabio" +"16855","Portugal","PRT","Rape and Mustard Cake","fabio" +"16856","Portugal","PRT","Cottonseed Cake","fabio" +"16857","Portugal","PRT","Palmkernel Cake","fabio" +"16858","Portugal","PRT","Copra Cake","fabio" +"16859","Portugal","PRT","Sesameseed Cake","fabio" +"16860","Portugal","PRT","Oilseed Cakes, Other","fabio" +"16861","Portugal","PRT","Wine","fabio" +"16862","Portugal","PRT","Beer","fabio" +"16863","Portugal","PRT","Beverages, Fermented","fabio" +"16864","Portugal","PRT","Beverages, Alcoholic","fabio" +"16865","Portugal","PRT","Alcohol, Non-Food","fabio" +"16866","Portugal","PRT","Cotton lint","fabio" +"16867","Portugal","PRT","Cattle","fabio" +"16868","Portugal","PRT","Buffaloes","fabio" +"16869","Portugal","PRT","Sheep","fabio" +"16870","Portugal","PRT","Goats","fabio" +"16871","Portugal","PRT","Pigs","fabio" +"16872","Portugal","PRT","Poultry Birds","fabio" +"16873","Portugal","PRT","Horses","fabio" +"16874","Portugal","PRT","Asses","fabio" +"16875","Portugal","PRT","Mules","fabio" +"16876","Portugal","PRT","Camels","fabio" +"16877","Portugal","PRT","Camelids, other","fabio" +"16878","Portugal","PRT","Rabbits and hares","fabio" +"16879","Portugal","PRT","Rodents, other","fabio" +"16880","Portugal","PRT","Live animals, other","fabio" +"16881","Portugal","PRT","Milk - Excluding Butter","fabio" +"16882","Portugal","PRT","Butter, Ghee","fabio" +"16883","Portugal","PRT","Eggs","fabio" +"16884","Portugal","PRT","Wool (Clean Eq.)","fabio" +"16885","Portugal","PRT","Bovine Meat","fabio" +"16886","Portugal","PRT","Mutton & Goat Meat","fabio" +"16887","Portugal","PRT","Pigmeat","fabio" +"16888","Portugal","PRT","Poultry Meat","fabio" +"16889","Portugal","PRT","Meat, Other","fabio" +"16890","Portugal","PRT","Offals, Edible","fabio" +"16891","Portugal","PRT","Fats, Animals, Raw","fabio" +"16892","Portugal","PRT","Hides and skins","fabio" +"16893","Portugal","PRT","Meat Meal","fabio" +"16894","Portugal","PRT","Pet food","fabio" +"16895","Portugal","PRT","Honey","fabio" +"16896","Portugal","PRT","Silk","fabio" +"16897","Portugal","PRT","Fish, Seafood","fabio" +"16898","Portugal","PRT","Wood fuel","fabio" +"16899","Portugal","PRT","Industrial roundwood, coniferous","fabio" +"16900","Portugal","PRT","Industrial roundwood, non-coniferous","fabio" +"16901","Guinea-Bissau","GNB","Rice (Milled Equivalent)","fabio" +"16902","Guinea-Bissau","GNB","Wheat and products","fabio" +"16903","Guinea-Bissau","GNB","Barley and products","fabio" +"16904","Guinea-Bissau","GNB","Maize and products","fabio" +"16905","Guinea-Bissau","GNB","Rye and products","fabio" +"16906","Guinea-Bissau","GNB","Oats","fabio" +"16907","Guinea-Bissau","GNB","Millet and products","fabio" +"16908","Guinea-Bissau","GNB","Sorghum and products","fabio" +"16909","Guinea-Bissau","GNB","Cereals, Other","fabio" +"16910","Guinea-Bissau","GNB","Potatoes and products","fabio" +"16911","Guinea-Bissau","GNB","Cassava and products","fabio" +"16912","Guinea-Bissau","GNB","Sweet potatoes","fabio" +"16913","Guinea-Bissau","GNB","Roots, Other","fabio" +"16914","Guinea-Bissau","GNB","Yams","fabio" +"16915","Guinea-Bissau","GNB","Sugar cane","fabio" +"16916","Guinea-Bissau","GNB","Sugar beet","fabio" +"16917","Guinea-Bissau","GNB","Beans","fabio" +"16918","Guinea-Bissau","GNB","Peas","fabio" +"16919","Guinea-Bissau","GNB","Pulses, Other and products","fabio" +"16920","Guinea-Bissau","GNB","Nuts and products","fabio" +"16921","Guinea-Bissau","GNB","Soyabeans","fabio" +"16922","Guinea-Bissau","GNB","Groundnuts (Shelled Eq)","fabio" +"16923","Guinea-Bissau","GNB","Sunflower seed","fabio" +"16924","Guinea-Bissau","GNB","Rape and Mustardseed","fabio" +"16925","Guinea-Bissau","GNB","Seed cotton","fabio" +"16926","Guinea-Bissau","GNB","Coconuts - Incl Copra","fabio" +"16927","Guinea-Bissau","GNB","Sesame seed","fabio" +"16928","Guinea-Bissau","GNB","Oil, palm fruit","fabio" +"16929","Guinea-Bissau","GNB","Olives (including preserved)","fabio" +"16930","Guinea-Bissau","GNB","Oilcrops, Other","fabio" +"16931","Guinea-Bissau","GNB","Tomatoes and products","fabio" +"16932","Guinea-Bissau","GNB","Onions","fabio" +"16933","Guinea-Bissau","GNB","Vegetables, Other","fabio" +"16934","Guinea-Bissau","GNB","Oranges, Mandarines","fabio" +"16935","Guinea-Bissau","GNB","Lemons, Limes and products","fabio" +"16936","Guinea-Bissau","GNB","Grapefruit and products","fabio" +"16937","Guinea-Bissau","GNB","Citrus, Other","fabio" +"16938","Guinea-Bissau","GNB","Bananas","fabio" +"16939","Guinea-Bissau","GNB","Plantains","fabio" +"16940","Guinea-Bissau","GNB","Apples and products","fabio" +"16941","Guinea-Bissau","GNB","Pineapples and products","fabio" +"16942","Guinea-Bissau","GNB","Dates","fabio" +"16943","Guinea-Bissau","GNB","Grapes and products (excl wine)","fabio" +"16944","Guinea-Bissau","GNB","Fruits, Other","fabio" +"16945","Guinea-Bissau","GNB","Coffee and products","fabio" +"16946","Guinea-Bissau","GNB","Cocoa Beans and products","fabio" +"16947","Guinea-Bissau","GNB","Tea (including mate)","fabio" +"16948","Guinea-Bissau","GNB","Hops","fabio" +"16949","Guinea-Bissau","GNB","Pepper","fabio" +"16950","Guinea-Bissau","GNB","Pimento","fabio" +"16951","Guinea-Bissau","GNB","Cloves","fabio" +"16952","Guinea-Bissau","GNB","Spices, Other","fabio" +"16953","Guinea-Bissau","GNB","Jute","fabio" +"16954","Guinea-Bissau","GNB","Jute-Like Fibres","fabio" +"16955","Guinea-Bissau","GNB","Soft-Fibres, Other","fabio" +"16956","Guinea-Bissau","GNB","Sisal","fabio" +"16957","Guinea-Bissau","GNB","Abaca","fabio" +"16958","Guinea-Bissau","GNB","Hard Fibres, Other","fabio" +"16959","Guinea-Bissau","GNB","Tobacco","fabio" +"16960","Guinea-Bissau","GNB","Rubber","fabio" +"16961","Guinea-Bissau","GNB","Fodder crops","fabio" +"16962","Guinea-Bissau","GNB","Grazing","fabio" +"16963","Guinea-Bissau","GNB","Cottonseed","fabio" +"16964","Guinea-Bissau","GNB","Palm kernels","fabio" +"16965","Guinea-Bissau","GNB","Sugar non-centrifugal","fabio" +"16966","Guinea-Bissau","GNB","Molasses","fabio" +"16967","Guinea-Bissau","GNB","Sugar, Refined Equiv","fabio" +"16968","Guinea-Bissau","GNB","Sweeteners, Other","fabio" +"16969","Guinea-Bissau","GNB","Soyabean Oil","fabio" +"16970","Guinea-Bissau","GNB","Groundnut Oil","fabio" +"16971","Guinea-Bissau","GNB","Sunflowerseed Oil","fabio" +"16972","Guinea-Bissau","GNB","Rape and Mustard Oil","fabio" +"16973","Guinea-Bissau","GNB","Cottonseed Oil","fabio" +"16974","Guinea-Bissau","GNB","Palmkernel Oil","fabio" +"16975","Guinea-Bissau","GNB","Palm Oil","fabio" +"16976","Guinea-Bissau","GNB","Coconut Oil","fabio" +"16977","Guinea-Bissau","GNB","Sesameseed Oil","fabio" +"16978","Guinea-Bissau","GNB","Olive Oil","fabio" +"16979","Guinea-Bissau","GNB","Ricebran Oil","fabio" +"16980","Guinea-Bissau","GNB","Maize Germ Oil","fabio" +"16981","Guinea-Bissau","GNB","Oilcrops Oil, Other","fabio" +"16982","Guinea-Bissau","GNB","Soyabean Cake","fabio" +"16983","Guinea-Bissau","GNB","Groundnut Cake","fabio" +"16984","Guinea-Bissau","GNB","Sunflowerseed Cake","fabio" +"16985","Guinea-Bissau","GNB","Rape and Mustard Cake","fabio" +"16986","Guinea-Bissau","GNB","Cottonseed Cake","fabio" +"16987","Guinea-Bissau","GNB","Palmkernel Cake","fabio" +"16988","Guinea-Bissau","GNB","Copra Cake","fabio" +"16989","Guinea-Bissau","GNB","Sesameseed Cake","fabio" +"16990","Guinea-Bissau","GNB","Oilseed Cakes, Other","fabio" +"16991","Guinea-Bissau","GNB","Wine","fabio" +"16992","Guinea-Bissau","GNB","Beer","fabio" +"16993","Guinea-Bissau","GNB","Beverages, Fermented","fabio" +"16994","Guinea-Bissau","GNB","Beverages, Alcoholic","fabio" +"16995","Guinea-Bissau","GNB","Alcohol, Non-Food","fabio" +"16996","Guinea-Bissau","GNB","Cotton lint","fabio" +"16997","Guinea-Bissau","GNB","Cattle","fabio" +"16998","Guinea-Bissau","GNB","Buffaloes","fabio" +"16999","Guinea-Bissau","GNB","Sheep","fabio" +"17000","Guinea-Bissau","GNB","Goats","fabio" +"17001","Guinea-Bissau","GNB","Pigs","fabio" +"17002","Guinea-Bissau","GNB","Poultry Birds","fabio" +"17003","Guinea-Bissau","GNB","Horses","fabio" +"17004","Guinea-Bissau","GNB","Asses","fabio" +"17005","Guinea-Bissau","GNB","Mules","fabio" +"17006","Guinea-Bissau","GNB","Camels","fabio" +"17007","Guinea-Bissau","GNB","Camelids, other","fabio" +"17008","Guinea-Bissau","GNB","Rabbits and hares","fabio" +"17009","Guinea-Bissau","GNB","Rodents, other","fabio" +"17010","Guinea-Bissau","GNB","Live animals, other","fabio" +"17011","Guinea-Bissau","GNB","Milk - Excluding Butter","fabio" +"17012","Guinea-Bissau","GNB","Butter, Ghee","fabio" +"17013","Guinea-Bissau","GNB","Eggs","fabio" +"17014","Guinea-Bissau","GNB","Wool (Clean Eq.)","fabio" +"17015","Guinea-Bissau","GNB","Bovine Meat","fabio" +"17016","Guinea-Bissau","GNB","Mutton & Goat Meat","fabio" +"17017","Guinea-Bissau","GNB","Pigmeat","fabio" +"17018","Guinea-Bissau","GNB","Poultry Meat","fabio" +"17019","Guinea-Bissau","GNB","Meat, Other","fabio" +"17020","Guinea-Bissau","GNB","Offals, Edible","fabio" +"17021","Guinea-Bissau","GNB","Fats, Animals, Raw","fabio" +"17022","Guinea-Bissau","GNB","Hides and skins","fabio" +"17023","Guinea-Bissau","GNB","Meat Meal","fabio" +"17024","Guinea-Bissau","GNB","Pet food","fabio" +"17025","Guinea-Bissau","GNB","Honey","fabio" +"17026","Guinea-Bissau","GNB","Silk","fabio" +"17027","Guinea-Bissau","GNB","Fish, Seafood","fabio" +"17028","Guinea-Bissau","GNB","Wood fuel","fabio" +"17029","Guinea-Bissau","GNB","Industrial roundwood, coniferous","fabio" +"17030","Guinea-Bissau","GNB","Industrial roundwood, non-coniferous","fabio" +"17031","Timor-Leste","TLS","Rice (Milled Equivalent)","fabio" +"17032","Timor-Leste","TLS","Wheat and products","fabio" +"17033","Timor-Leste","TLS","Barley and products","fabio" +"17034","Timor-Leste","TLS","Maize and products","fabio" +"17035","Timor-Leste","TLS","Rye and products","fabio" +"17036","Timor-Leste","TLS","Oats","fabio" +"17037","Timor-Leste","TLS","Millet and products","fabio" +"17038","Timor-Leste","TLS","Sorghum and products","fabio" +"17039","Timor-Leste","TLS","Cereals, Other","fabio" +"17040","Timor-Leste","TLS","Potatoes and products","fabio" +"17041","Timor-Leste","TLS","Cassava and products","fabio" +"17042","Timor-Leste","TLS","Sweet potatoes","fabio" +"17043","Timor-Leste","TLS","Roots, Other","fabio" +"17044","Timor-Leste","TLS","Yams","fabio" +"17045","Timor-Leste","TLS","Sugar cane","fabio" +"17046","Timor-Leste","TLS","Sugar beet","fabio" +"17047","Timor-Leste","TLS","Beans","fabio" +"17048","Timor-Leste","TLS","Peas","fabio" +"17049","Timor-Leste","TLS","Pulses, Other and products","fabio" +"17050","Timor-Leste","TLS","Nuts and products","fabio" +"17051","Timor-Leste","TLS","Soyabeans","fabio" +"17052","Timor-Leste","TLS","Groundnuts (Shelled Eq)","fabio" +"17053","Timor-Leste","TLS","Sunflower seed","fabio" +"17054","Timor-Leste","TLS","Rape and Mustardseed","fabio" +"17055","Timor-Leste","TLS","Seed cotton","fabio" +"17056","Timor-Leste","TLS","Coconuts - Incl Copra","fabio" +"17057","Timor-Leste","TLS","Sesame seed","fabio" +"17058","Timor-Leste","TLS","Oil, palm fruit","fabio" +"17059","Timor-Leste","TLS","Olives (including preserved)","fabio" +"17060","Timor-Leste","TLS","Oilcrops, Other","fabio" +"17061","Timor-Leste","TLS","Tomatoes and products","fabio" +"17062","Timor-Leste","TLS","Onions","fabio" +"17063","Timor-Leste","TLS","Vegetables, Other","fabio" +"17064","Timor-Leste","TLS","Oranges, Mandarines","fabio" +"17065","Timor-Leste","TLS","Lemons, Limes and products","fabio" +"17066","Timor-Leste","TLS","Grapefruit and products","fabio" +"17067","Timor-Leste","TLS","Citrus, Other","fabio" +"17068","Timor-Leste","TLS","Bananas","fabio" +"17069","Timor-Leste","TLS","Plantains","fabio" +"17070","Timor-Leste","TLS","Apples and products","fabio" +"17071","Timor-Leste","TLS","Pineapples and products","fabio" +"17072","Timor-Leste","TLS","Dates","fabio" +"17073","Timor-Leste","TLS","Grapes and products (excl wine)","fabio" +"17074","Timor-Leste","TLS","Fruits, Other","fabio" +"17075","Timor-Leste","TLS","Coffee and products","fabio" +"17076","Timor-Leste","TLS","Cocoa Beans and products","fabio" +"17077","Timor-Leste","TLS","Tea (including mate)","fabio" +"17078","Timor-Leste","TLS","Hops","fabio" +"17079","Timor-Leste","TLS","Pepper","fabio" +"17080","Timor-Leste","TLS","Pimento","fabio" +"17081","Timor-Leste","TLS","Cloves","fabio" +"17082","Timor-Leste","TLS","Spices, Other","fabio" +"17083","Timor-Leste","TLS","Jute","fabio" +"17084","Timor-Leste","TLS","Jute-Like Fibres","fabio" +"17085","Timor-Leste","TLS","Soft-Fibres, Other","fabio" +"17086","Timor-Leste","TLS","Sisal","fabio" +"17087","Timor-Leste","TLS","Abaca","fabio" +"17088","Timor-Leste","TLS","Hard Fibres, Other","fabio" +"17089","Timor-Leste","TLS","Tobacco","fabio" +"17090","Timor-Leste","TLS","Rubber","fabio" +"17091","Timor-Leste","TLS","Fodder crops","fabio" +"17092","Timor-Leste","TLS","Grazing","fabio" +"17093","Timor-Leste","TLS","Cottonseed","fabio" +"17094","Timor-Leste","TLS","Palm kernels","fabio" +"17095","Timor-Leste","TLS","Sugar non-centrifugal","fabio" +"17096","Timor-Leste","TLS","Molasses","fabio" +"17097","Timor-Leste","TLS","Sugar, Refined Equiv","fabio" +"17098","Timor-Leste","TLS","Sweeteners, Other","fabio" +"17099","Timor-Leste","TLS","Soyabean Oil","fabio" +"17100","Timor-Leste","TLS","Groundnut Oil","fabio" +"17101","Timor-Leste","TLS","Sunflowerseed Oil","fabio" +"17102","Timor-Leste","TLS","Rape and Mustard Oil","fabio" +"17103","Timor-Leste","TLS","Cottonseed Oil","fabio" +"17104","Timor-Leste","TLS","Palmkernel Oil","fabio" +"17105","Timor-Leste","TLS","Palm Oil","fabio" +"17106","Timor-Leste","TLS","Coconut Oil","fabio" +"17107","Timor-Leste","TLS","Sesameseed Oil","fabio" +"17108","Timor-Leste","TLS","Olive Oil","fabio" +"17109","Timor-Leste","TLS","Ricebran Oil","fabio" +"17110","Timor-Leste","TLS","Maize Germ Oil","fabio" +"17111","Timor-Leste","TLS","Oilcrops Oil, Other","fabio" +"17112","Timor-Leste","TLS","Soyabean Cake","fabio" +"17113","Timor-Leste","TLS","Groundnut Cake","fabio" +"17114","Timor-Leste","TLS","Sunflowerseed Cake","fabio" +"17115","Timor-Leste","TLS","Rape and Mustard Cake","fabio" +"17116","Timor-Leste","TLS","Cottonseed Cake","fabio" +"17117","Timor-Leste","TLS","Palmkernel Cake","fabio" +"17118","Timor-Leste","TLS","Copra Cake","fabio" +"17119","Timor-Leste","TLS","Sesameseed Cake","fabio" +"17120","Timor-Leste","TLS","Oilseed Cakes, Other","fabio" +"17121","Timor-Leste","TLS","Wine","fabio" +"17122","Timor-Leste","TLS","Beer","fabio" +"17123","Timor-Leste","TLS","Beverages, Fermented","fabio" +"17124","Timor-Leste","TLS","Beverages, Alcoholic","fabio" +"17125","Timor-Leste","TLS","Alcohol, Non-Food","fabio" +"17126","Timor-Leste","TLS","Cotton lint","fabio" +"17127","Timor-Leste","TLS","Cattle","fabio" +"17128","Timor-Leste","TLS","Buffaloes","fabio" +"17129","Timor-Leste","TLS","Sheep","fabio" +"17130","Timor-Leste","TLS","Goats","fabio" +"17131","Timor-Leste","TLS","Pigs","fabio" +"17132","Timor-Leste","TLS","Poultry Birds","fabio" +"17133","Timor-Leste","TLS","Horses","fabio" +"17134","Timor-Leste","TLS","Asses","fabio" +"17135","Timor-Leste","TLS","Mules","fabio" +"17136","Timor-Leste","TLS","Camels","fabio" +"17137","Timor-Leste","TLS","Camelids, other","fabio" +"17138","Timor-Leste","TLS","Rabbits and hares","fabio" +"17139","Timor-Leste","TLS","Rodents, other","fabio" +"17140","Timor-Leste","TLS","Live animals, other","fabio" +"17141","Timor-Leste","TLS","Milk - Excluding Butter","fabio" +"17142","Timor-Leste","TLS","Butter, Ghee","fabio" +"17143","Timor-Leste","TLS","Eggs","fabio" +"17144","Timor-Leste","TLS","Wool (Clean Eq.)","fabio" +"17145","Timor-Leste","TLS","Bovine Meat","fabio" +"17146","Timor-Leste","TLS","Mutton & Goat Meat","fabio" +"17147","Timor-Leste","TLS","Pigmeat","fabio" +"17148","Timor-Leste","TLS","Poultry Meat","fabio" +"17149","Timor-Leste","TLS","Meat, Other","fabio" +"17150","Timor-Leste","TLS","Offals, Edible","fabio" +"17151","Timor-Leste","TLS","Fats, Animals, Raw","fabio" +"17152","Timor-Leste","TLS","Hides and skins","fabio" +"17153","Timor-Leste","TLS","Meat Meal","fabio" +"17154","Timor-Leste","TLS","Pet food","fabio" +"17155","Timor-Leste","TLS","Honey","fabio" +"17156","Timor-Leste","TLS","Silk","fabio" +"17157","Timor-Leste","TLS","Fish, Seafood","fabio" +"17158","Timor-Leste","TLS","Wood fuel","fabio" +"17159","Timor-Leste","TLS","Industrial roundwood, coniferous","fabio" +"17160","Timor-Leste","TLS","Industrial roundwood, non-coniferous","fabio" +"17161","Puerto Rico","PRI","Rice (Milled Equivalent)","fabio" +"17162","Puerto Rico","PRI","Wheat and products","fabio" +"17163","Puerto Rico","PRI","Barley and products","fabio" +"17164","Puerto Rico","PRI","Maize and products","fabio" +"17165","Puerto Rico","PRI","Rye and products","fabio" +"17166","Puerto Rico","PRI","Oats","fabio" +"17167","Puerto Rico","PRI","Millet and products","fabio" +"17168","Puerto Rico","PRI","Sorghum and products","fabio" +"17169","Puerto Rico","PRI","Cereals, Other","fabio" +"17170","Puerto Rico","PRI","Potatoes and products","fabio" +"17171","Puerto Rico","PRI","Cassava and products","fabio" +"17172","Puerto Rico","PRI","Sweet potatoes","fabio" +"17173","Puerto Rico","PRI","Roots, Other","fabio" +"17174","Puerto Rico","PRI","Yams","fabio" +"17175","Puerto Rico","PRI","Sugar cane","fabio" +"17176","Puerto Rico","PRI","Sugar beet","fabio" +"17177","Puerto Rico","PRI","Beans","fabio" +"17178","Puerto Rico","PRI","Peas","fabio" +"17179","Puerto Rico","PRI","Pulses, Other and products","fabio" +"17180","Puerto Rico","PRI","Nuts and products","fabio" +"17181","Puerto Rico","PRI","Soyabeans","fabio" +"17182","Puerto Rico","PRI","Groundnuts (Shelled Eq)","fabio" +"17183","Puerto Rico","PRI","Sunflower seed","fabio" +"17184","Puerto Rico","PRI","Rape and Mustardseed","fabio" +"17185","Puerto Rico","PRI","Seed cotton","fabio" +"17186","Puerto Rico","PRI","Coconuts - Incl Copra","fabio" +"17187","Puerto Rico","PRI","Sesame seed","fabio" +"17188","Puerto Rico","PRI","Oil, palm fruit","fabio" +"17189","Puerto Rico","PRI","Olives (including preserved)","fabio" +"17190","Puerto Rico","PRI","Oilcrops, Other","fabio" +"17191","Puerto Rico","PRI","Tomatoes and products","fabio" +"17192","Puerto Rico","PRI","Onions","fabio" +"17193","Puerto Rico","PRI","Vegetables, Other","fabio" +"17194","Puerto Rico","PRI","Oranges, Mandarines","fabio" +"17195","Puerto Rico","PRI","Lemons, Limes and products","fabio" +"17196","Puerto Rico","PRI","Grapefruit and products","fabio" +"17197","Puerto Rico","PRI","Citrus, Other","fabio" +"17198","Puerto Rico","PRI","Bananas","fabio" +"17199","Puerto Rico","PRI","Plantains","fabio" +"17200","Puerto Rico","PRI","Apples and products","fabio" +"17201","Puerto Rico","PRI","Pineapples and products","fabio" +"17202","Puerto Rico","PRI","Dates","fabio" +"17203","Puerto Rico","PRI","Grapes and products (excl wine)","fabio" +"17204","Puerto Rico","PRI","Fruits, Other","fabio" +"17205","Puerto Rico","PRI","Coffee and products","fabio" +"17206","Puerto Rico","PRI","Cocoa Beans and products","fabio" +"17207","Puerto Rico","PRI","Tea (including mate)","fabio" +"17208","Puerto Rico","PRI","Hops","fabio" +"17209","Puerto Rico","PRI","Pepper","fabio" +"17210","Puerto Rico","PRI","Pimento","fabio" +"17211","Puerto Rico","PRI","Cloves","fabio" +"17212","Puerto Rico","PRI","Spices, Other","fabio" +"17213","Puerto Rico","PRI","Jute","fabio" +"17214","Puerto Rico","PRI","Jute-Like Fibres","fabio" +"17215","Puerto Rico","PRI","Soft-Fibres, Other","fabio" +"17216","Puerto Rico","PRI","Sisal","fabio" +"17217","Puerto Rico","PRI","Abaca","fabio" +"17218","Puerto Rico","PRI","Hard Fibres, Other","fabio" +"17219","Puerto Rico","PRI","Tobacco","fabio" +"17220","Puerto Rico","PRI","Rubber","fabio" +"17221","Puerto Rico","PRI","Fodder crops","fabio" +"17222","Puerto Rico","PRI","Grazing","fabio" +"17223","Puerto Rico","PRI","Cottonseed","fabio" +"17224","Puerto Rico","PRI","Palm kernels","fabio" +"17225","Puerto Rico","PRI","Sugar non-centrifugal","fabio" +"17226","Puerto Rico","PRI","Molasses","fabio" +"17227","Puerto Rico","PRI","Sugar, Refined Equiv","fabio" +"17228","Puerto Rico","PRI","Sweeteners, Other","fabio" +"17229","Puerto Rico","PRI","Soyabean Oil","fabio" +"17230","Puerto Rico","PRI","Groundnut Oil","fabio" +"17231","Puerto Rico","PRI","Sunflowerseed Oil","fabio" +"17232","Puerto Rico","PRI","Rape and Mustard Oil","fabio" +"17233","Puerto Rico","PRI","Cottonseed Oil","fabio" +"17234","Puerto Rico","PRI","Palmkernel Oil","fabio" +"17235","Puerto Rico","PRI","Palm Oil","fabio" +"17236","Puerto Rico","PRI","Coconut Oil","fabio" +"17237","Puerto Rico","PRI","Sesameseed Oil","fabio" +"17238","Puerto Rico","PRI","Olive Oil","fabio" +"17239","Puerto Rico","PRI","Ricebran Oil","fabio" +"17240","Puerto Rico","PRI","Maize Germ Oil","fabio" +"17241","Puerto Rico","PRI","Oilcrops Oil, Other","fabio" +"17242","Puerto Rico","PRI","Soyabean Cake","fabio" +"17243","Puerto Rico","PRI","Groundnut Cake","fabio" +"17244","Puerto Rico","PRI","Sunflowerseed Cake","fabio" +"17245","Puerto Rico","PRI","Rape and Mustard Cake","fabio" +"17246","Puerto Rico","PRI","Cottonseed Cake","fabio" +"17247","Puerto Rico","PRI","Palmkernel Cake","fabio" +"17248","Puerto Rico","PRI","Copra Cake","fabio" +"17249","Puerto Rico","PRI","Sesameseed Cake","fabio" +"17250","Puerto Rico","PRI","Oilseed Cakes, Other","fabio" +"17251","Puerto Rico","PRI","Wine","fabio" +"17252","Puerto Rico","PRI","Beer","fabio" +"17253","Puerto Rico","PRI","Beverages, Fermented","fabio" +"17254","Puerto Rico","PRI","Beverages, Alcoholic","fabio" +"17255","Puerto Rico","PRI","Alcohol, Non-Food","fabio" +"17256","Puerto Rico","PRI","Cotton lint","fabio" +"17257","Puerto Rico","PRI","Cattle","fabio" +"17258","Puerto Rico","PRI","Buffaloes","fabio" +"17259","Puerto Rico","PRI","Sheep","fabio" +"17260","Puerto Rico","PRI","Goats","fabio" +"17261","Puerto Rico","PRI","Pigs","fabio" +"17262","Puerto Rico","PRI","Poultry Birds","fabio" +"17263","Puerto Rico","PRI","Horses","fabio" +"17264","Puerto Rico","PRI","Asses","fabio" +"17265","Puerto Rico","PRI","Mules","fabio" +"17266","Puerto Rico","PRI","Camels","fabio" +"17267","Puerto Rico","PRI","Camelids, other","fabio" +"17268","Puerto Rico","PRI","Rabbits and hares","fabio" +"17269","Puerto Rico","PRI","Rodents, other","fabio" +"17270","Puerto Rico","PRI","Live animals, other","fabio" +"17271","Puerto Rico","PRI","Milk - Excluding Butter","fabio" +"17272","Puerto Rico","PRI","Butter, Ghee","fabio" +"17273","Puerto Rico","PRI","Eggs","fabio" +"17274","Puerto Rico","PRI","Wool (Clean Eq.)","fabio" +"17275","Puerto Rico","PRI","Bovine Meat","fabio" +"17276","Puerto Rico","PRI","Mutton & Goat Meat","fabio" +"17277","Puerto Rico","PRI","Pigmeat","fabio" +"17278","Puerto Rico","PRI","Poultry Meat","fabio" +"17279","Puerto Rico","PRI","Meat, Other","fabio" +"17280","Puerto Rico","PRI","Offals, Edible","fabio" +"17281","Puerto Rico","PRI","Fats, Animals, Raw","fabio" +"17282","Puerto Rico","PRI","Hides and skins","fabio" +"17283","Puerto Rico","PRI","Meat Meal","fabio" +"17284","Puerto Rico","PRI","Pet food","fabio" +"17285","Puerto Rico","PRI","Honey","fabio" +"17286","Puerto Rico","PRI","Silk","fabio" +"17287","Puerto Rico","PRI","Fish, Seafood","fabio" +"17288","Puerto Rico","PRI","Wood fuel","fabio" +"17289","Puerto Rico","PRI","Industrial roundwood, coniferous","fabio" +"17290","Puerto Rico","PRI","Industrial roundwood, non-coniferous","fabio" +"17291","Eritrea","ERI","Rice (Milled Equivalent)","fabio" +"17292","Eritrea","ERI","Wheat and products","fabio" +"17293","Eritrea","ERI","Barley and products","fabio" +"17294","Eritrea","ERI","Maize and products","fabio" +"17295","Eritrea","ERI","Rye and products","fabio" +"17296","Eritrea","ERI","Oats","fabio" +"17297","Eritrea","ERI","Millet and products","fabio" +"17298","Eritrea","ERI","Sorghum and products","fabio" +"17299","Eritrea","ERI","Cereals, Other","fabio" +"17300","Eritrea","ERI","Potatoes and products","fabio" +"17301","Eritrea","ERI","Cassava and products","fabio" +"17302","Eritrea","ERI","Sweet potatoes","fabio" +"17303","Eritrea","ERI","Roots, Other","fabio" +"17304","Eritrea","ERI","Yams","fabio" +"17305","Eritrea","ERI","Sugar cane","fabio" +"17306","Eritrea","ERI","Sugar beet","fabio" +"17307","Eritrea","ERI","Beans","fabio" +"17308","Eritrea","ERI","Peas","fabio" +"17309","Eritrea","ERI","Pulses, Other and products","fabio" +"17310","Eritrea","ERI","Nuts and products","fabio" +"17311","Eritrea","ERI","Soyabeans","fabio" +"17312","Eritrea","ERI","Groundnuts (Shelled Eq)","fabio" +"17313","Eritrea","ERI","Sunflower seed","fabio" +"17314","Eritrea","ERI","Rape and Mustardseed","fabio" +"17315","Eritrea","ERI","Seed cotton","fabio" +"17316","Eritrea","ERI","Coconuts - Incl Copra","fabio" +"17317","Eritrea","ERI","Sesame seed","fabio" +"17318","Eritrea","ERI","Oil, palm fruit","fabio" +"17319","Eritrea","ERI","Olives (including preserved)","fabio" +"17320","Eritrea","ERI","Oilcrops, Other","fabio" +"17321","Eritrea","ERI","Tomatoes and products","fabio" +"17322","Eritrea","ERI","Onions","fabio" +"17323","Eritrea","ERI","Vegetables, Other","fabio" +"17324","Eritrea","ERI","Oranges, Mandarines","fabio" +"17325","Eritrea","ERI","Lemons, Limes and products","fabio" +"17326","Eritrea","ERI","Grapefruit and products","fabio" +"17327","Eritrea","ERI","Citrus, Other","fabio" +"17328","Eritrea","ERI","Bananas","fabio" +"17329","Eritrea","ERI","Plantains","fabio" +"17330","Eritrea","ERI","Apples and products","fabio" +"17331","Eritrea","ERI","Pineapples and products","fabio" +"17332","Eritrea","ERI","Dates","fabio" +"17333","Eritrea","ERI","Grapes and products (excl wine)","fabio" +"17334","Eritrea","ERI","Fruits, Other","fabio" +"17335","Eritrea","ERI","Coffee and products","fabio" +"17336","Eritrea","ERI","Cocoa Beans and products","fabio" +"17337","Eritrea","ERI","Tea (including mate)","fabio" +"17338","Eritrea","ERI","Hops","fabio" +"17339","Eritrea","ERI","Pepper","fabio" +"17340","Eritrea","ERI","Pimento","fabio" +"17341","Eritrea","ERI","Cloves","fabio" +"17342","Eritrea","ERI","Spices, Other","fabio" +"17343","Eritrea","ERI","Jute","fabio" +"17344","Eritrea","ERI","Jute-Like Fibres","fabio" +"17345","Eritrea","ERI","Soft-Fibres, Other","fabio" +"17346","Eritrea","ERI","Sisal","fabio" +"17347","Eritrea","ERI","Abaca","fabio" +"17348","Eritrea","ERI","Hard Fibres, Other","fabio" +"17349","Eritrea","ERI","Tobacco","fabio" +"17350","Eritrea","ERI","Rubber","fabio" +"17351","Eritrea","ERI","Fodder crops","fabio" +"17352","Eritrea","ERI","Grazing","fabio" +"17353","Eritrea","ERI","Cottonseed","fabio" +"17354","Eritrea","ERI","Palm kernels","fabio" +"17355","Eritrea","ERI","Sugar non-centrifugal","fabio" +"17356","Eritrea","ERI","Molasses","fabio" +"17357","Eritrea","ERI","Sugar, Refined Equiv","fabio" +"17358","Eritrea","ERI","Sweeteners, Other","fabio" +"17359","Eritrea","ERI","Soyabean Oil","fabio" +"17360","Eritrea","ERI","Groundnut Oil","fabio" +"17361","Eritrea","ERI","Sunflowerseed Oil","fabio" +"17362","Eritrea","ERI","Rape and Mustard Oil","fabio" +"17363","Eritrea","ERI","Cottonseed Oil","fabio" +"17364","Eritrea","ERI","Palmkernel Oil","fabio" +"17365","Eritrea","ERI","Palm Oil","fabio" +"17366","Eritrea","ERI","Coconut Oil","fabio" +"17367","Eritrea","ERI","Sesameseed Oil","fabio" +"17368","Eritrea","ERI","Olive Oil","fabio" +"17369","Eritrea","ERI","Ricebran Oil","fabio" +"17370","Eritrea","ERI","Maize Germ Oil","fabio" +"17371","Eritrea","ERI","Oilcrops Oil, Other","fabio" +"17372","Eritrea","ERI","Soyabean Cake","fabio" +"17373","Eritrea","ERI","Groundnut Cake","fabio" +"17374","Eritrea","ERI","Sunflowerseed Cake","fabio" +"17375","Eritrea","ERI","Rape and Mustard Cake","fabio" +"17376","Eritrea","ERI","Cottonseed Cake","fabio" +"17377","Eritrea","ERI","Palmkernel Cake","fabio" +"17378","Eritrea","ERI","Copra Cake","fabio" +"17379","Eritrea","ERI","Sesameseed Cake","fabio" +"17380","Eritrea","ERI","Oilseed Cakes, Other","fabio" +"17381","Eritrea","ERI","Wine","fabio" +"17382","Eritrea","ERI","Beer","fabio" +"17383","Eritrea","ERI","Beverages, Fermented","fabio" +"17384","Eritrea","ERI","Beverages, Alcoholic","fabio" +"17385","Eritrea","ERI","Alcohol, Non-Food","fabio" +"17386","Eritrea","ERI","Cotton lint","fabio" +"17387","Eritrea","ERI","Cattle","fabio" +"17388","Eritrea","ERI","Buffaloes","fabio" +"17389","Eritrea","ERI","Sheep","fabio" +"17390","Eritrea","ERI","Goats","fabio" +"17391","Eritrea","ERI","Pigs","fabio" +"17392","Eritrea","ERI","Poultry Birds","fabio" +"17393","Eritrea","ERI","Horses","fabio" +"17394","Eritrea","ERI","Asses","fabio" +"17395","Eritrea","ERI","Mules","fabio" +"17396","Eritrea","ERI","Camels","fabio" +"17397","Eritrea","ERI","Camelids, other","fabio" +"17398","Eritrea","ERI","Rabbits and hares","fabio" +"17399","Eritrea","ERI","Rodents, other","fabio" +"17400","Eritrea","ERI","Live animals, other","fabio" +"17401","Eritrea","ERI","Milk - Excluding Butter","fabio" +"17402","Eritrea","ERI","Butter, Ghee","fabio" +"17403","Eritrea","ERI","Eggs","fabio" +"17404","Eritrea","ERI","Wool (Clean Eq.)","fabio" +"17405","Eritrea","ERI","Bovine Meat","fabio" +"17406","Eritrea","ERI","Mutton & Goat Meat","fabio" +"17407","Eritrea","ERI","Pigmeat","fabio" +"17408","Eritrea","ERI","Poultry Meat","fabio" +"17409","Eritrea","ERI","Meat, Other","fabio" +"17410","Eritrea","ERI","Offals, Edible","fabio" +"17411","Eritrea","ERI","Fats, Animals, Raw","fabio" +"17412","Eritrea","ERI","Hides and skins","fabio" +"17413","Eritrea","ERI","Meat Meal","fabio" +"17414","Eritrea","ERI","Pet food","fabio" +"17415","Eritrea","ERI","Honey","fabio" +"17416","Eritrea","ERI","Silk","fabio" +"17417","Eritrea","ERI","Fish, Seafood","fabio" +"17418","Eritrea","ERI","Wood fuel","fabio" +"17419","Eritrea","ERI","Industrial roundwood, coniferous","fabio" +"17420","Eritrea","ERI","Industrial roundwood, non-coniferous","fabio" +"17421","Qatar","QAT","Rice (Milled Equivalent)","fabio" +"17422","Qatar","QAT","Wheat and products","fabio" +"17423","Qatar","QAT","Barley and products","fabio" +"17424","Qatar","QAT","Maize and products","fabio" +"17425","Qatar","QAT","Rye and products","fabio" +"17426","Qatar","QAT","Oats","fabio" +"17427","Qatar","QAT","Millet and products","fabio" +"17428","Qatar","QAT","Sorghum and products","fabio" +"17429","Qatar","QAT","Cereals, Other","fabio" +"17430","Qatar","QAT","Potatoes and products","fabio" +"17431","Qatar","QAT","Cassava and products","fabio" +"17432","Qatar","QAT","Sweet potatoes","fabio" +"17433","Qatar","QAT","Roots, Other","fabio" +"17434","Qatar","QAT","Yams","fabio" +"17435","Qatar","QAT","Sugar cane","fabio" +"17436","Qatar","QAT","Sugar beet","fabio" +"17437","Qatar","QAT","Beans","fabio" +"17438","Qatar","QAT","Peas","fabio" +"17439","Qatar","QAT","Pulses, Other and products","fabio" +"17440","Qatar","QAT","Nuts and products","fabio" +"17441","Qatar","QAT","Soyabeans","fabio" +"17442","Qatar","QAT","Groundnuts (Shelled Eq)","fabio" +"17443","Qatar","QAT","Sunflower seed","fabio" +"17444","Qatar","QAT","Rape and Mustardseed","fabio" +"17445","Qatar","QAT","Seed cotton","fabio" +"17446","Qatar","QAT","Coconuts - Incl Copra","fabio" +"17447","Qatar","QAT","Sesame seed","fabio" +"17448","Qatar","QAT","Oil, palm fruit","fabio" +"17449","Qatar","QAT","Olives (including preserved)","fabio" +"17450","Qatar","QAT","Oilcrops, Other","fabio" +"17451","Qatar","QAT","Tomatoes and products","fabio" +"17452","Qatar","QAT","Onions","fabio" +"17453","Qatar","QAT","Vegetables, Other","fabio" +"17454","Qatar","QAT","Oranges, Mandarines","fabio" +"17455","Qatar","QAT","Lemons, Limes and products","fabio" +"17456","Qatar","QAT","Grapefruit and products","fabio" +"17457","Qatar","QAT","Citrus, Other","fabio" +"17458","Qatar","QAT","Bananas","fabio" +"17459","Qatar","QAT","Plantains","fabio" +"17460","Qatar","QAT","Apples and products","fabio" +"17461","Qatar","QAT","Pineapples and products","fabio" +"17462","Qatar","QAT","Dates","fabio" +"17463","Qatar","QAT","Grapes and products (excl wine)","fabio" +"17464","Qatar","QAT","Fruits, Other","fabio" +"17465","Qatar","QAT","Coffee and products","fabio" +"17466","Qatar","QAT","Cocoa Beans and products","fabio" +"17467","Qatar","QAT","Tea (including mate)","fabio" +"17468","Qatar","QAT","Hops","fabio" +"17469","Qatar","QAT","Pepper","fabio" +"17470","Qatar","QAT","Pimento","fabio" +"17471","Qatar","QAT","Cloves","fabio" +"17472","Qatar","QAT","Spices, Other","fabio" +"17473","Qatar","QAT","Jute","fabio" +"17474","Qatar","QAT","Jute-Like Fibres","fabio" +"17475","Qatar","QAT","Soft-Fibres, Other","fabio" +"17476","Qatar","QAT","Sisal","fabio" +"17477","Qatar","QAT","Abaca","fabio" +"17478","Qatar","QAT","Hard Fibres, Other","fabio" +"17479","Qatar","QAT","Tobacco","fabio" +"17480","Qatar","QAT","Rubber","fabio" +"17481","Qatar","QAT","Fodder crops","fabio" +"17482","Qatar","QAT","Grazing","fabio" +"17483","Qatar","QAT","Cottonseed","fabio" +"17484","Qatar","QAT","Palm kernels","fabio" +"17485","Qatar","QAT","Sugar non-centrifugal","fabio" +"17486","Qatar","QAT","Molasses","fabio" +"17487","Qatar","QAT","Sugar, Refined Equiv","fabio" +"17488","Qatar","QAT","Sweeteners, Other","fabio" +"17489","Qatar","QAT","Soyabean Oil","fabio" +"17490","Qatar","QAT","Groundnut Oil","fabio" +"17491","Qatar","QAT","Sunflowerseed Oil","fabio" +"17492","Qatar","QAT","Rape and Mustard Oil","fabio" +"17493","Qatar","QAT","Cottonseed Oil","fabio" +"17494","Qatar","QAT","Palmkernel Oil","fabio" +"17495","Qatar","QAT","Palm Oil","fabio" +"17496","Qatar","QAT","Coconut Oil","fabio" +"17497","Qatar","QAT","Sesameseed Oil","fabio" +"17498","Qatar","QAT","Olive Oil","fabio" +"17499","Qatar","QAT","Ricebran Oil","fabio" +"17500","Qatar","QAT","Maize Germ Oil","fabio" +"17501","Qatar","QAT","Oilcrops Oil, Other","fabio" +"17502","Qatar","QAT","Soyabean Cake","fabio" +"17503","Qatar","QAT","Groundnut Cake","fabio" +"17504","Qatar","QAT","Sunflowerseed Cake","fabio" +"17505","Qatar","QAT","Rape and Mustard Cake","fabio" +"17506","Qatar","QAT","Cottonseed Cake","fabio" +"17507","Qatar","QAT","Palmkernel Cake","fabio" +"17508","Qatar","QAT","Copra Cake","fabio" +"17509","Qatar","QAT","Sesameseed Cake","fabio" +"17510","Qatar","QAT","Oilseed Cakes, Other","fabio" +"17511","Qatar","QAT","Wine","fabio" +"17512","Qatar","QAT","Beer","fabio" +"17513","Qatar","QAT","Beverages, Fermented","fabio" +"17514","Qatar","QAT","Beverages, Alcoholic","fabio" +"17515","Qatar","QAT","Alcohol, Non-Food","fabio" +"17516","Qatar","QAT","Cotton lint","fabio" +"17517","Qatar","QAT","Cattle","fabio" +"17518","Qatar","QAT","Buffaloes","fabio" +"17519","Qatar","QAT","Sheep","fabio" +"17520","Qatar","QAT","Goats","fabio" +"17521","Qatar","QAT","Pigs","fabio" +"17522","Qatar","QAT","Poultry Birds","fabio" +"17523","Qatar","QAT","Horses","fabio" +"17524","Qatar","QAT","Asses","fabio" +"17525","Qatar","QAT","Mules","fabio" +"17526","Qatar","QAT","Camels","fabio" +"17527","Qatar","QAT","Camelids, other","fabio" +"17528","Qatar","QAT","Rabbits and hares","fabio" +"17529","Qatar","QAT","Rodents, other","fabio" +"17530","Qatar","QAT","Live animals, other","fabio" +"17531","Qatar","QAT","Milk - Excluding Butter","fabio" +"17532","Qatar","QAT","Butter, Ghee","fabio" +"17533","Qatar","QAT","Eggs","fabio" +"17534","Qatar","QAT","Wool (Clean Eq.)","fabio" +"17535","Qatar","QAT","Bovine Meat","fabio" +"17536","Qatar","QAT","Mutton & Goat Meat","fabio" +"17537","Qatar","QAT","Pigmeat","fabio" +"17538","Qatar","QAT","Poultry Meat","fabio" +"17539","Qatar","QAT","Meat, Other","fabio" +"17540","Qatar","QAT","Offals, Edible","fabio" +"17541","Qatar","QAT","Fats, Animals, Raw","fabio" +"17542","Qatar","QAT","Hides and skins","fabio" +"17543","Qatar","QAT","Meat Meal","fabio" +"17544","Qatar","QAT","Pet food","fabio" +"17545","Qatar","QAT","Honey","fabio" +"17546","Qatar","QAT","Silk","fabio" +"17547","Qatar","QAT","Fish, Seafood","fabio" +"17548","Qatar","QAT","Wood fuel","fabio" +"17549","Qatar","QAT","Industrial roundwood, coniferous","fabio" +"17550","Qatar","QAT","Industrial roundwood, non-coniferous","fabio" +"17551","Zimbabwe","ZWE","Rice (Milled Equivalent)","fabio" +"17552","Zimbabwe","ZWE","Wheat and products","fabio" +"17553","Zimbabwe","ZWE","Barley and products","fabio" +"17554","Zimbabwe","ZWE","Maize and products","fabio" +"17555","Zimbabwe","ZWE","Rye and products","fabio" +"17556","Zimbabwe","ZWE","Oats","fabio" +"17557","Zimbabwe","ZWE","Millet and products","fabio" +"17558","Zimbabwe","ZWE","Sorghum and products","fabio" +"17559","Zimbabwe","ZWE","Cereals, Other","fabio" +"17560","Zimbabwe","ZWE","Potatoes and products","fabio" +"17561","Zimbabwe","ZWE","Cassava and products","fabio" +"17562","Zimbabwe","ZWE","Sweet potatoes","fabio" +"17563","Zimbabwe","ZWE","Roots, Other","fabio" +"17564","Zimbabwe","ZWE","Yams","fabio" +"17565","Zimbabwe","ZWE","Sugar cane","fabio" +"17566","Zimbabwe","ZWE","Sugar beet","fabio" +"17567","Zimbabwe","ZWE","Beans","fabio" +"17568","Zimbabwe","ZWE","Peas","fabio" +"17569","Zimbabwe","ZWE","Pulses, Other and products","fabio" +"17570","Zimbabwe","ZWE","Nuts and products","fabio" +"17571","Zimbabwe","ZWE","Soyabeans","fabio" +"17572","Zimbabwe","ZWE","Groundnuts (Shelled Eq)","fabio" +"17573","Zimbabwe","ZWE","Sunflower seed","fabio" +"17574","Zimbabwe","ZWE","Rape and Mustardseed","fabio" +"17575","Zimbabwe","ZWE","Seed cotton","fabio" +"17576","Zimbabwe","ZWE","Coconuts - Incl Copra","fabio" +"17577","Zimbabwe","ZWE","Sesame seed","fabio" +"17578","Zimbabwe","ZWE","Oil, palm fruit","fabio" +"17579","Zimbabwe","ZWE","Olives (including preserved)","fabio" +"17580","Zimbabwe","ZWE","Oilcrops, Other","fabio" +"17581","Zimbabwe","ZWE","Tomatoes and products","fabio" +"17582","Zimbabwe","ZWE","Onions","fabio" +"17583","Zimbabwe","ZWE","Vegetables, Other","fabio" +"17584","Zimbabwe","ZWE","Oranges, Mandarines","fabio" +"17585","Zimbabwe","ZWE","Lemons, Limes and products","fabio" +"17586","Zimbabwe","ZWE","Grapefruit and products","fabio" +"17587","Zimbabwe","ZWE","Citrus, Other","fabio" +"17588","Zimbabwe","ZWE","Bananas","fabio" +"17589","Zimbabwe","ZWE","Plantains","fabio" +"17590","Zimbabwe","ZWE","Apples and products","fabio" +"17591","Zimbabwe","ZWE","Pineapples and products","fabio" +"17592","Zimbabwe","ZWE","Dates","fabio" +"17593","Zimbabwe","ZWE","Grapes and products (excl wine)","fabio" +"17594","Zimbabwe","ZWE","Fruits, Other","fabio" +"17595","Zimbabwe","ZWE","Coffee and products","fabio" +"17596","Zimbabwe","ZWE","Cocoa Beans and products","fabio" +"17597","Zimbabwe","ZWE","Tea (including mate)","fabio" +"17598","Zimbabwe","ZWE","Hops","fabio" +"17599","Zimbabwe","ZWE","Pepper","fabio" +"17600","Zimbabwe","ZWE","Pimento","fabio" +"17601","Zimbabwe","ZWE","Cloves","fabio" +"17602","Zimbabwe","ZWE","Spices, Other","fabio" +"17603","Zimbabwe","ZWE","Jute","fabio" +"17604","Zimbabwe","ZWE","Jute-Like Fibres","fabio" +"17605","Zimbabwe","ZWE","Soft-Fibres, Other","fabio" +"17606","Zimbabwe","ZWE","Sisal","fabio" +"17607","Zimbabwe","ZWE","Abaca","fabio" +"17608","Zimbabwe","ZWE","Hard Fibres, Other","fabio" +"17609","Zimbabwe","ZWE","Tobacco","fabio" +"17610","Zimbabwe","ZWE","Rubber","fabio" +"17611","Zimbabwe","ZWE","Fodder crops","fabio" +"17612","Zimbabwe","ZWE","Grazing","fabio" +"17613","Zimbabwe","ZWE","Cottonseed","fabio" +"17614","Zimbabwe","ZWE","Palm kernels","fabio" +"17615","Zimbabwe","ZWE","Sugar non-centrifugal","fabio" +"17616","Zimbabwe","ZWE","Molasses","fabio" +"17617","Zimbabwe","ZWE","Sugar, Refined Equiv","fabio" +"17618","Zimbabwe","ZWE","Sweeteners, Other","fabio" +"17619","Zimbabwe","ZWE","Soyabean Oil","fabio" +"17620","Zimbabwe","ZWE","Groundnut Oil","fabio" +"17621","Zimbabwe","ZWE","Sunflowerseed Oil","fabio" +"17622","Zimbabwe","ZWE","Rape and Mustard Oil","fabio" +"17623","Zimbabwe","ZWE","Cottonseed Oil","fabio" +"17624","Zimbabwe","ZWE","Palmkernel Oil","fabio" +"17625","Zimbabwe","ZWE","Palm Oil","fabio" +"17626","Zimbabwe","ZWE","Coconut Oil","fabio" +"17627","Zimbabwe","ZWE","Sesameseed Oil","fabio" +"17628","Zimbabwe","ZWE","Olive Oil","fabio" +"17629","Zimbabwe","ZWE","Ricebran Oil","fabio" +"17630","Zimbabwe","ZWE","Maize Germ Oil","fabio" +"17631","Zimbabwe","ZWE","Oilcrops Oil, Other","fabio" +"17632","Zimbabwe","ZWE","Soyabean Cake","fabio" +"17633","Zimbabwe","ZWE","Groundnut Cake","fabio" +"17634","Zimbabwe","ZWE","Sunflowerseed Cake","fabio" +"17635","Zimbabwe","ZWE","Rape and Mustard Cake","fabio" +"17636","Zimbabwe","ZWE","Cottonseed Cake","fabio" +"17637","Zimbabwe","ZWE","Palmkernel Cake","fabio" +"17638","Zimbabwe","ZWE","Copra Cake","fabio" +"17639","Zimbabwe","ZWE","Sesameseed Cake","fabio" +"17640","Zimbabwe","ZWE","Oilseed Cakes, Other","fabio" +"17641","Zimbabwe","ZWE","Wine","fabio" +"17642","Zimbabwe","ZWE","Beer","fabio" +"17643","Zimbabwe","ZWE","Beverages, Fermented","fabio" +"17644","Zimbabwe","ZWE","Beverages, Alcoholic","fabio" +"17645","Zimbabwe","ZWE","Alcohol, Non-Food","fabio" +"17646","Zimbabwe","ZWE","Cotton lint","fabio" +"17647","Zimbabwe","ZWE","Cattle","fabio" +"17648","Zimbabwe","ZWE","Buffaloes","fabio" +"17649","Zimbabwe","ZWE","Sheep","fabio" +"17650","Zimbabwe","ZWE","Goats","fabio" +"17651","Zimbabwe","ZWE","Pigs","fabio" +"17652","Zimbabwe","ZWE","Poultry Birds","fabio" +"17653","Zimbabwe","ZWE","Horses","fabio" +"17654","Zimbabwe","ZWE","Asses","fabio" +"17655","Zimbabwe","ZWE","Mules","fabio" +"17656","Zimbabwe","ZWE","Camels","fabio" +"17657","Zimbabwe","ZWE","Camelids, other","fabio" +"17658","Zimbabwe","ZWE","Rabbits and hares","fabio" +"17659","Zimbabwe","ZWE","Rodents, other","fabio" +"17660","Zimbabwe","ZWE","Live animals, other","fabio" +"17661","Zimbabwe","ZWE","Milk - Excluding Butter","fabio" +"17662","Zimbabwe","ZWE","Butter, Ghee","fabio" +"17663","Zimbabwe","ZWE","Eggs","fabio" +"17664","Zimbabwe","ZWE","Wool (Clean Eq.)","fabio" +"17665","Zimbabwe","ZWE","Bovine Meat","fabio" +"17666","Zimbabwe","ZWE","Mutton & Goat Meat","fabio" +"17667","Zimbabwe","ZWE","Pigmeat","fabio" +"17668","Zimbabwe","ZWE","Poultry Meat","fabio" +"17669","Zimbabwe","ZWE","Meat, Other","fabio" +"17670","Zimbabwe","ZWE","Offals, Edible","fabio" +"17671","Zimbabwe","ZWE","Fats, Animals, Raw","fabio" +"17672","Zimbabwe","ZWE","Hides and skins","fabio" +"17673","Zimbabwe","ZWE","Meat Meal","fabio" +"17674","Zimbabwe","ZWE","Pet food","fabio" +"17675","Zimbabwe","ZWE","Honey","fabio" +"17676","Zimbabwe","ZWE","Silk","fabio" +"17677","Zimbabwe","ZWE","Fish, Seafood","fabio" +"17678","Zimbabwe","ZWE","Wood fuel","fabio" +"17679","Zimbabwe","ZWE","Industrial roundwood, coniferous","fabio" +"17680","Zimbabwe","ZWE","Industrial roundwood, non-coniferous","fabio" +"17681","Romania","ROU","Rice (Milled Equivalent)","fabio" +"17682","Romania","ROU","Wheat and products","fabio" +"17683","Romania","ROU","Barley and products","fabio" +"17684","Romania","ROU","Maize and products","fabio" +"17685","Romania","ROU","Rye and products","fabio" +"17686","Romania","ROU","Oats","fabio" +"17687","Romania","ROU","Millet and products","fabio" +"17688","Romania","ROU","Sorghum and products","fabio" +"17689","Romania","ROU","Cereals, Other","fabio" +"17690","Romania","ROU","Potatoes and products","fabio" +"17691","Romania","ROU","Cassava and products","fabio" +"17692","Romania","ROU","Sweet potatoes","fabio" +"17693","Romania","ROU","Roots, Other","fabio" +"17694","Romania","ROU","Yams","fabio" +"17695","Romania","ROU","Sugar cane","fabio" +"17696","Romania","ROU","Sugar beet","fabio" +"17697","Romania","ROU","Beans","fabio" +"17698","Romania","ROU","Peas","fabio" +"17699","Romania","ROU","Pulses, Other and products","fabio" +"17700","Romania","ROU","Nuts and products","fabio" +"17701","Romania","ROU","Soyabeans","fabio" +"17702","Romania","ROU","Groundnuts (Shelled Eq)","fabio" +"17703","Romania","ROU","Sunflower seed","fabio" +"17704","Romania","ROU","Rape and Mustardseed","fabio" +"17705","Romania","ROU","Seed cotton","fabio" +"17706","Romania","ROU","Coconuts - Incl Copra","fabio" +"17707","Romania","ROU","Sesame seed","fabio" +"17708","Romania","ROU","Oil, palm fruit","fabio" +"17709","Romania","ROU","Olives (including preserved)","fabio" +"17710","Romania","ROU","Oilcrops, Other","fabio" +"17711","Romania","ROU","Tomatoes and products","fabio" +"17712","Romania","ROU","Onions","fabio" +"17713","Romania","ROU","Vegetables, Other","fabio" +"17714","Romania","ROU","Oranges, Mandarines","fabio" +"17715","Romania","ROU","Lemons, Limes and products","fabio" +"17716","Romania","ROU","Grapefruit and products","fabio" +"17717","Romania","ROU","Citrus, Other","fabio" +"17718","Romania","ROU","Bananas","fabio" +"17719","Romania","ROU","Plantains","fabio" +"17720","Romania","ROU","Apples and products","fabio" +"17721","Romania","ROU","Pineapples and products","fabio" +"17722","Romania","ROU","Dates","fabio" +"17723","Romania","ROU","Grapes and products (excl wine)","fabio" +"17724","Romania","ROU","Fruits, Other","fabio" +"17725","Romania","ROU","Coffee and products","fabio" +"17726","Romania","ROU","Cocoa Beans and products","fabio" +"17727","Romania","ROU","Tea (including mate)","fabio" +"17728","Romania","ROU","Hops","fabio" +"17729","Romania","ROU","Pepper","fabio" +"17730","Romania","ROU","Pimento","fabio" +"17731","Romania","ROU","Cloves","fabio" +"17732","Romania","ROU","Spices, Other","fabio" +"17733","Romania","ROU","Jute","fabio" +"17734","Romania","ROU","Jute-Like Fibres","fabio" +"17735","Romania","ROU","Soft-Fibres, Other","fabio" +"17736","Romania","ROU","Sisal","fabio" +"17737","Romania","ROU","Abaca","fabio" +"17738","Romania","ROU","Hard Fibres, Other","fabio" +"17739","Romania","ROU","Tobacco","fabio" +"17740","Romania","ROU","Rubber","fabio" +"17741","Romania","ROU","Fodder crops","fabio" +"17742","Romania","ROU","Grazing","fabio" +"17743","Romania","ROU","Cottonseed","fabio" +"17744","Romania","ROU","Palm kernels","fabio" +"17745","Romania","ROU","Sugar non-centrifugal","fabio" +"17746","Romania","ROU","Molasses","fabio" +"17747","Romania","ROU","Sugar, Refined Equiv","fabio" +"17748","Romania","ROU","Sweeteners, Other","fabio" +"17749","Romania","ROU","Soyabean Oil","fabio" +"17750","Romania","ROU","Groundnut Oil","fabio" +"17751","Romania","ROU","Sunflowerseed Oil","fabio" +"17752","Romania","ROU","Rape and Mustard Oil","fabio" +"17753","Romania","ROU","Cottonseed Oil","fabio" +"17754","Romania","ROU","Palmkernel Oil","fabio" +"17755","Romania","ROU","Palm Oil","fabio" +"17756","Romania","ROU","Coconut Oil","fabio" +"17757","Romania","ROU","Sesameseed Oil","fabio" +"17758","Romania","ROU","Olive Oil","fabio" +"17759","Romania","ROU","Ricebran Oil","fabio" +"17760","Romania","ROU","Maize Germ Oil","fabio" +"17761","Romania","ROU","Oilcrops Oil, Other","fabio" +"17762","Romania","ROU","Soyabean Cake","fabio" +"17763","Romania","ROU","Groundnut Cake","fabio" +"17764","Romania","ROU","Sunflowerseed Cake","fabio" +"17765","Romania","ROU","Rape and Mustard Cake","fabio" +"17766","Romania","ROU","Cottonseed Cake","fabio" +"17767","Romania","ROU","Palmkernel Cake","fabio" +"17768","Romania","ROU","Copra Cake","fabio" +"17769","Romania","ROU","Sesameseed Cake","fabio" +"17770","Romania","ROU","Oilseed Cakes, Other","fabio" +"17771","Romania","ROU","Wine","fabio" +"17772","Romania","ROU","Beer","fabio" +"17773","Romania","ROU","Beverages, Fermented","fabio" +"17774","Romania","ROU","Beverages, Alcoholic","fabio" +"17775","Romania","ROU","Alcohol, Non-Food","fabio" +"17776","Romania","ROU","Cotton lint","fabio" +"17777","Romania","ROU","Cattle","fabio" +"17778","Romania","ROU","Buffaloes","fabio" +"17779","Romania","ROU","Sheep","fabio" +"17780","Romania","ROU","Goats","fabio" +"17781","Romania","ROU","Pigs","fabio" +"17782","Romania","ROU","Poultry Birds","fabio" +"17783","Romania","ROU","Horses","fabio" +"17784","Romania","ROU","Asses","fabio" +"17785","Romania","ROU","Mules","fabio" +"17786","Romania","ROU","Camels","fabio" +"17787","Romania","ROU","Camelids, other","fabio" +"17788","Romania","ROU","Rabbits and hares","fabio" +"17789","Romania","ROU","Rodents, other","fabio" +"17790","Romania","ROU","Live animals, other","fabio" +"17791","Romania","ROU","Milk - Excluding Butter","fabio" +"17792","Romania","ROU","Butter, Ghee","fabio" +"17793","Romania","ROU","Eggs","fabio" +"17794","Romania","ROU","Wool (Clean Eq.)","fabio" +"17795","Romania","ROU","Bovine Meat","fabio" +"17796","Romania","ROU","Mutton & Goat Meat","fabio" +"17797","Romania","ROU","Pigmeat","fabio" +"17798","Romania","ROU","Poultry Meat","fabio" +"17799","Romania","ROU","Meat, Other","fabio" +"17800","Romania","ROU","Offals, Edible","fabio" +"17801","Romania","ROU","Fats, Animals, Raw","fabio" +"17802","Romania","ROU","Hides and skins","fabio" +"17803","Romania","ROU","Meat Meal","fabio" +"17804","Romania","ROU","Pet food","fabio" +"17805","Romania","ROU","Honey","fabio" +"17806","Romania","ROU","Silk","fabio" +"17807","Romania","ROU","Fish, Seafood","fabio" +"17808","Romania","ROU","Wood fuel","fabio" +"17809","Romania","ROU","Industrial roundwood, coniferous","fabio" +"17810","Romania","ROU","Industrial roundwood, non-coniferous","fabio" +"17811","Rwanda","RWA","Rice (Milled Equivalent)","fabio" +"17812","Rwanda","RWA","Wheat and products","fabio" +"17813","Rwanda","RWA","Barley and products","fabio" +"17814","Rwanda","RWA","Maize and products","fabio" +"17815","Rwanda","RWA","Rye and products","fabio" +"17816","Rwanda","RWA","Oats","fabio" +"17817","Rwanda","RWA","Millet and products","fabio" +"17818","Rwanda","RWA","Sorghum and products","fabio" +"17819","Rwanda","RWA","Cereals, Other","fabio" +"17820","Rwanda","RWA","Potatoes and products","fabio" +"17821","Rwanda","RWA","Cassava and products","fabio" +"17822","Rwanda","RWA","Sweet potatoes","fabio" +"17823","Rwanda","RWA","Roots, Other","fabio" +"17824","Rwanda","RWA","Yams","fabio" +"17825","Rwanda","RWA","Sugar cane","fabio" +"17826","Rwanda","RWA","Sugar beet","fabio" +"17827","Rwanda","RWA","Beans","fabio" +"17828","Rwanda","RWA","Peas","fabio" +"17829","Rwanda","RWA","Pulses, Other and products","fabio" +"17830","Rwanda","RWA","Nuts and products","fabio" +"17831","Rwanda","RWA","Soyabeans","fabio" +"17832","Rwanda","RWA","Groundnuts (Shelled Eq)","fabio" +"17833","Rwanda","RWA","Sunflower seed","fabio" +"17834","Rwanda","RWA","Rape and Mustardseed","fabio" +"17835","Rwanda","RWA","Seed cotton","fabio" +"17836","Rwanda","RWA","Coconuts - Incl Copra","fabio" +"17837","Rwanda","RWA","Sesame seed","fabio" +"17838","Rwanda","RWA","Oil, palm fruit","fabio" +"17839","Rwanda","RWA","Olives (including preserved)","fabio" +"17840","Rwanda","RWA","Oilcrops, Other","fabio" +"17841","Rwanda","RWA","Tomatoes and products","fabio" +"17842","Rwanda","RWA","Onions","fabio" +"17843","Rwanda","RWA","Vegetables, Other","fabio" +"17844","Rwanda","RWA","Oranges, Mandarines","fabio" +"17845","Rwanda","RWA","Lemons, Limes and products","fabio" +"17846","Rwanda","RWA","Grapefruit and products","fabio" +"17847","Rwanda","RWA","Citrus, Other","fabio" +"17848","Rwanda","RWA","Bananas","fabio" +"17849","Rwanda","RWA","Plantains","fabio" +"17850","Rwanda","RWA","Apples and products","fabio" +"17851","Rwanda","RWA","Pineapples and products","fabio" +"17852","Rwanda","RWA","Dates","fabio" +"17853","Rwanda","RWA","Grapes and products (excl wine)","fabio" +"17854","Rwanda","RWA","Fruits, Other","fabio" +"17855","Rwanda","RWA","Coffee and products","fabio" +"17856","Rwanda","RWA","Cocoa Beans and products","fabio" +"17857","Rwanda","RWA","Tea (including mate)","fabio" +"17858","Rwanda","RWA","Hops","fabio" +"17859","Rwanda","RWA","Pepper","fabio" +"17860","Rwanda","RWA","Pimento","fabio" +"17861","Rwanda","RWA","Cloves","fabio" +"17862","Rwanda","RWA","Spices, Other","fabio" +"17863","Rwanda","RWA","Jute","fabio" +"17864","Rwanda","RWA","Jute-Like Fibres","fabio" +"17865","Rwanda","RWA","Soft-Fibres, Other","fabio" +"17866","Rwanda","RWA","Sisal","fabio" +"17867","Rwanda","RWA","Abaca","fabio" +"17868","Rwanda","RWA","Hard Fibres, Other","fabio" +"17869","Rwanda","RWA","Tobacco","fabio" +"17870","Rwanda","RWA","Rubber","fabio" +"17871","Rwanda","RWA","Fodder crops","fabio" +"17872","Rwanda","RWA","Grazing","fabio" +"17873","Rwanda","RWA","Cottonseed","fabio" +"17874","Rwanda","RWA","Palm kernels","fabio" +"17875","Rwanda","RWA","Sugar non-centrifugal","fabio" +"17876","Rwanda","RWA","Molasses","fabio" +"17877","Rwanda","RWA","Sugar, Refined Equiv","fabio" +"17878","Rwanda","RWA","Sweeteners, Other","fabio" +"17879","Rwanda","RWA","Soyabean Oil","fabio" +"17880","Rwanda","RWA","Groundnut Oil","fabio" +"17881","Rwanda","RWA","Sunflowerseed Oil","fabio" +"17882","Rwanda","RWA","Rape and Mustard Oil","fabio" +"17883","Rwanda","RWA","Cottonseed Oil","fabio" +"17884","Rwanda","RWA","Palmkernel Oil","fabio" +"17885","Rwanda","RWA","Palm Oil","fabio" +"17886","Rwanda","RWA","Coconut Oil","fabio" +"17887","Rwanda","RWA","Sesameseed Oil","fabio" +"17888","Rwanda","RWA","Olive Oil","fabio" +"17889","Rwanda","RWA","Ricebran Oil","fabio" +"17890","Rwanda","RWA","Maize Germ Oil","fabio" +"17891","Rwanda","RWA","Oilcrops Oil, Other","fabio" +"17892","Rwanda","RWA","Soyabean Cake","fabio" +"17893","Rwanda","RWA","Groundnut Cake","fabio" +"17894","Rwanda","RWA","Sunflowerseed Cake","fabio" +"17895","Rwanda","RWA","Rape and Mustard Cake","fabio" +"17896","Rwanda","RWA","Cottonseed Cake","fabio" +"17897","Rwanda","RWA","Palmkernel Cake","fabio" +"17898","Rwanda","RWA","Copra Cake","fabio" +"17899","Rwanda","RWA","Sesameseed Cake","fabio" +"17900","Rwanda","RWA","Oilseed Cakes, Other","fabio" +"17901","Rwanda","RWA","Wine","fabio" +"17902","Rwanda","RWA","Beer","fabio" +"17903","Rwanda","RWA","Beverages, Fermented","fabio" +"17904","Rwanda","RWA","Beverages, Alcoholic","fabio" +"17905","Rwanda","RWA","Alcohol, Non-Food","fabio" +"17906","Rwanda","RWA","Cotton lint","fabio" +"17907","Rwanda","RWA","Cattle","fabio" +"17908","Rwanda","RWA","Buffaloes","fabio" +"17909","Rwanda","RWA","Sheep","fabio" +"17910","Rwanda","RWA","Goats","fabio" +"17911","Rwanda","RWA","Pigs","fabio" +"17912","Rwanda","RWA","Poultry Birds","fabio" +"17913","Rwanda","RWA","Horses","fabio" +"17914","Rwanda","RWA","Asses","fabio" +"17915","Rwanda","RWA","Mules","fabio" +"17916","Rwanda","RWA","Camels","fabio" +"17917","Rwanda","RWA","Camelids, other","fabio" +"17918","Rwanda","RWA","Rabbits and hares","fabio" +"17919","Rwanda","RWA","Rodents, other","fabio" +"17920","Rwanda","RWA","Live animals, other","fabio" +"17921","Rwanda","RWA","Milk - Excluding Butter","fabio" +"17922","Rwanda","RWA","Butter, Ghee","fabio" +"17923","Rwanda","RWA","Eggs","fabio" +"17924","Rwanda","RWA","Wool (Clean Eq.)","fabio" +"17925","Rwanda","RWA","Bovine Meat","fabio" +"17926","Rwanda","RWA","Mutton & Goat Meat","fabio" +"17927","Rwanda","RWA","Pigmeat","fabio" +"17928","Rwanda","RWA","Poultry Meat","fabio" +"17929","Rwanda","RWA","Meat, Other","fabio" +"17930","Rwanda","RWA","Offals, Edible","fabio" +"17931","Rwanda","RWA","Fats, Animals, Raw","fabio" +"17932","Rwanda","RWA","Hides and skins","fabio" +"17933","Rwanda","RWA","Meat Meal","fabio" +"17934","Rwanda","RWA","Pet food","fabio" +"17935","Rwanda","RWA","Honey","fabio" +"17936","Rwanda","RWA","Silk","fabio" +"17937","Rwanda","RWA","Fish, Seafood","fabio" +"17938","Rwanda","RWA","Wood fuel","fabio" +"17939","Rwanda","RWA","Industrial roundwood, coniferous","fabio" +"17940","Rwanda","RWA","Industrial roundwood, non-coniferous","fabio" +"17941","Russian Federation","RUS","Rice (Milled Equivalent)","fabio" +"17942","Russian Federation","RUS","Wheat and products","fabio" +"17943","Russian Federation","RUS","Barley and products","fabio" +"17944","Russian Federation","RUS","Maize and products","fabio" +"17945","Russian Federation","RUS","Rye and products","fabio" +"17946","Russian Federation","RUS","Oats","fabio" +"17947","Russian Federation","RUS","Millet and products","fabio" +"17948","Russian Federation","RUS","Sorghum and products","fabio" +"17949","Russian Federation","RUS","Cereals, Other","fabio" +"17950","Russian Federation","RUS","Potatoes and products","fabio" +"17951","Russian Federation","RUS","Cassava and products","fabio" +"17952","Russian Federation","RUS","Sweet potatoes","fabio" +"17953","Russian Federation","RUS","Roots, Other","fabio" +"17954","Russian Federation","RUS","Yams","fabio" +"17955","Russian Federation","RUS","Sugar cane","fabio" +"17956","Russian Federation","RUS","Sugar beet","fabio" +"17957","Russian Federation","RUS","Beans","fabio" +"17958","Russian Federation","RUS","Peas","fabio" +"17959","Russian Federation","RUS","Pulses, Other and products","fabio" +"17960","Russian Federation","RUS","Nuts and products","fabio" +"17961","Russian Federation","RUS","Soyabeans","fabio" +"17962","Russian Federation","RUS","Groundnuts (Shelled Eq)","fabio" +"17963","Russian Federation","RUS","Sunflower seed","fabio" +"17964","Russian Federation","RUS","Rape and Mustardseed","fabio" +"17965","Russian Federation","RUS","Seed cotton","fabio" +"17966","Russian Federation","RUS","Coconuts - Incl Copra","fabio" +"17967","Russian Federation","RUS","Sesame seed","fabio" +"17968","Russian Federation","RUS","Oil, palm fruit","fabio" +"17969","Russian Federation","RUS","Olives (including preserved)","fabio" +"17970","Russian Federation","RUS","Oilcrops, Other","fabio" +"17971","Russian Federation","RUS","Tomatoes and products","fabio" +"17972","Russian Federation","RUS","Onions","fabio" +"17973","Russian Federation","RUS","Vegetables, Other","fabio" +"17974","Russian Federation","RUS","Oranges, Mandarines","fabio" +"17975","Russian Federation","RUS","Lemons, Limes and products","fabio" +"17976","Russian Federation","RUS","Grapefruit and products","fabio" +"17977","Russian Federation","RUS","Citrus, Other","fabio" +"17978","Russian Federation","RUS","Bananas","fabio" +"17979","Russian Federation","RUS","Plantains","fabio" +"17980","Russian Federation","RUS","Apples and products","fabio" +"17981","Russian Federation","RUS","Pineapples and products","fabio" +"17982","Russian Federation","RUS","Dates","fabio" +"17983","Russian Federation","RUS","Grapes and products (excl wine)","fabio" +"17984","Russian Federation","RUS","Fruits, Other","fabio" +"17985","Russian Federation","RUS","Coffee and products","fabio" +"17986","Russian Federation","RUS","Cocoa Beans and products","fabio" +"17987","Russian Federation","RUS","Tea (including mate)","fabio" +"17988","Russian Federation","RUS","Hops","fabio" +"17989","Russian Federation","RUS","Pepper","fabio" +"17990","Russian Federation","RUS","Pimento","fabio" +"17991","Russian Federation","RUS","Cloves","fabio" +"17992","Russian Federation","RUS","Spices, Other","fabio" +"17993","Russian Federation","RUS","Jute","fabio" +"17994","Russian Federation","RUS","Jute-Like Fibres","fabio" +"17995","Russian Federation","RUS","Soft-Fibres, Other","fabio" +"17996","Russian Federation","RUS","Sisal","fabio" +"17997","Russian Federation","RUS","Abaca","fabio" +"17998","Russian Federation","RUS","Hard Fibres, Other","fabio" +"17999","Russian Federation","RUS","Tobacco","fabio" +"18000","Russian Federation","RUS","Rubber","fabio" +"18001","Russian Federation","RUS","Fodder crops","fabio" +"18002","Russian Federation","RUS","Grazing","fabio" +"18003","Russian Federation","RUS","Cottonseed","fabio" +"18004","Russian Federation","RUS","Palm kernels","fabio" +"18005","Russian Federation","RUS","Sugar non-centrifugal","fabio" +"18006","Russian Federation","RUS","Molasses","fabio" +"18007","Russian Federation","RUS","Sugar, Refined Equiv","fabio" +"18008","Russian Federation","RUS","Sweeteners, Other","fabio" +"18009","Russian Federation","RUS","Soyabean Oil","fabio" +"18010","Russian Federation","RUS","Groundnut Oil","fabio" +"18011","Russian Federation","RUS","Sunflowerseed Oil","fabio" +"18012","Russian Federation","RUS","Rape and Mustard Oil","fabio" +"18013","Russian Federation","RUS","Cottonseed Oil","fabio" +"18014","Russian Federation","RUS","Palmkernel Oil","fabio" +"18015","Russian Federation","RUS","Palm Oil","fabio" +"18016","Russian Federation","RUS","Coconut Oil","fabio" +"18017","Russian Federation","RUS","Sesameseed Oil","fabio" +"18018","Russian Federation","RUS","Olive Oil","fabio" +"18019","Russian Federation","RUS","Ricebran Oil","fabio" +"18020","Russian Federation","RUS","Maize Germ Oil","fabio" +"18021","Russian Federation","RUS","Oilcrops Oil, Other","fabio" +"18022","Russian Federation","RUS","Soyabean Cake","fabio" +"18023","Russian Federation","RUS","Groundnut Cake","fabio" +"18024","Russian Federation","RUS","Sunflowerseed Cake","fabio" +"18025","Russian Federation","RUS","Rape and Mustard Cake","fabio" +"18026","Russian Federation","RUS","Cottonseed Cake","fabio" +"18027","Russian Federation","RUS","Palmkernel Cake","fabio" +"18028","Russian Federation","RUS","Copra Cake","fabio" +"18029","Russian Federation","RUS","Sesameseed Cake","fabio" +"18030","Russian Federation","RUS","Oilseed Cakes, Other","fabio" +"18031","Russian Federation","RUS","Wine","fabio" +"18032","Russian Federation","RUS","Beer","fabio" +"18033","Russian Federation","RUS","Beverages, Fermented","fabio" +"18034","Russian Federation","RUS","Beverages, Alcoholic","fabio" +"18035","Russian Federation","RUS","Alcohol, Non-Food","fabio" +"18036","Russian Federation","RUS","Cotton lint","fabio" +"18037","Russian Federation","RUS","Cattle","fabio" +"18038","Russian Federation","RUS","Buffaloes","fabio" +"18039","Russian Federation","RUS","Sheep","fabio" +"18040","Russian Federation","RUS","Goats","fabio" +"18041","Russian Federation","RUS","Pigs","fabio" +"18042","Russian Federation","RUS","Poultry Birds","fabio" +"18043","Russian Federation","RUS","Horses","fabio" +"18044","Russian Federation","RUS","Asses","fabio" +"18045","Russian Federation","RUS","Mules","fabio" +"18046","Russian Federation","RUS","Camels","fabio" +"18047","Russian Federation","RUS","Camelids, other","fabio" +"18048","Russian Federation","RUS","Rabbits and hares","fabio" +"18049","Russian Federation","RUS","Rodents, other","fabio" +"18050","Russian Federation","RUS","Live animals, other","fabio" +"18051","Russian Federation","RUS","Milk - Excluding Butter","fabio" +"18052","Russian Federation","RUS","Butter, Ghee","fabio" +"18053","Russian Federation","RUS","Eggs","fabio" +"18054","Russian Federation","RUS","Wool (Clean Eq.)","fabio" +"18055","Russian Federation","RUS","Bovine Meat","fabio" +"18056","Russian Federation","RUS","Mutton & Goat Meat","fabio" +"18057","Russian Federation","RUS","Pigmeat","fabio" +"18058","Russian Federation","RUS","Poultry Meat","fabio" +"18059","Russian Federation","RUS","Meat, Other","fabio" +"18060","Russian Federation","RUS","Offals, Edible","fabio" +"18061","Russian Federation","RUS","Fats, Animals, Raw","fabio" +"18062","Russian Federation","RUS","Hides and skins","fabio" +"18063","Russian Federation","RUS","Meat Meal","fabio" +"18064","Russian Federation","RUS","Pet food","fabio" +"18065","Russian Federation","RUS","Honey","fabio" +"18066","Russian Federation","RUS","Silk","fabio" +"18067","Russian Federation","RUS","Fish, Seafood","fabio" +"18068","Russian Federation","RUS","Wood fuel","fabio" +"18069","Russian Federation","RUS","Industrial roundwood, coniferous","fabio" +"18070","Russian Federation","RUS","Industrial roundwood, non-coniferous","fabio" +"18071","Serbia and Montenegro","SCG","Rice (Milled Equivalent)","fabio" +"18072","Serbia and Montenegro","SCG","Wheat and products","fabio" +"18073","Serbia and Montenegro","SCG","Barley and products","fabio" +"18074","Serbia and Montenegro","SCG","Maize and products","fabio" +"18075","Serbia and Montenegro","SCG","Rye and products","fabio" +"18076","Serbia and Montenegro","SCG","Oats","fabio" +"18077","Serbia and Montenegro","SCG","Millet and products","fabio" +"18078","Serbia and Montenegro","SCG","Sorghum and products","fabio" +"18079","Serbia and Montenegro","SCG","Cereals, Other","fabio" +"18080","Serbia and Montenegro","SCG","Potatoes and products","fabio" +"18081","Serbia and Montenegro","SCG","Cassava and products","fabio" +"18082","Serbia and Montenegro","SCG","Sweet potatoes","fabio" +"18083","Serbia and Montenegro","SCG","Roots, Other","fabio" +"18084","Serbia and Montenegro","SCG","Yams","fabio" +"18085","Serbia and Montenegro","SCG","Sugar cane","fabio" +"18086","Serbia and Montenegro","SCG","Sugar beet","fabio" +"18087","Serbia and Montenegro","SCG","Beans","fabio" +"18088","Serbia and Montenegro","SCG","Peas","fabio" +"18089","Serbia and Montenegro","SCG","Pulses, Other and products","fabio" +"18090","Serbia and Montenegro","SCG","Nuts and products","fabio" +"18091","Serbia and Montenegro","SCG","Soyabeans","fabio" +"18092","Serbia and Montenegro","SCG","Groundnuts (Shelled Eq)","fabio" +"18093","Serbia and Montenegro","SCG","Sunflower seed","fabio" +"18094","Serbia and Montenegro","SCG","Rape and Mustardseed","fabio" +"18095","Serbia and Montenegro","SCG","Seed cotton","fabio" +"18096","Serbia and Montenegro","SCG","Coconuts - Incl Copra","fabio" +"18097","Serbia and Montenegro","SCG","Sesame seed","fabio" +"18098","Serbia and Montenegro","SCG","Oil, palm fruit","fabio" +"18099","Serbia and Montenegro","SCG","Olives (including preserved)","fabio" +"18100","Serbia and Montenegro","SCG","Oilcrops, Other","fabio" +"18101","Serbia and Montenegro","SCG","Tomatoes and products","fabio" +"18102","Serbia and Montenegro","SCG","Onions","fabio" +"18103","Serbia and Montenegro","SCG","Vegetables, Other","fabio" +"18104","Serbia and Montenegro","SCG","Oranges, Mandarines","fabio" +"18105","Serbia and Montenegro","SCG","Lemons, Limes and products","fabio" +"18106","Serbia and Montenegro","SCG","Grapefruit and products","fabio" +"18107","Serbia and Montenegro","SCG","Citrus, Other","fabio" +"18108","Serbia and Montenegro","SCG","Bananas","fabio" +"18109","Serbia and Montenegro","SCG","Plantains","fabio" +"18110","Serbia and Montenegro","SCG","Apples and products","fabio" +"18111","Serbia and Montenegro","SCG","Pineapples and products","fabio" +"18112","Serbia and Montenegro","SCG","Dates","fabio" +"18113","Serbia and Montenegro","SCG","Grapes and products (excl wine)","fabio" +"18114","Serbia and Montenegro","SCG","Fruits, Other","fabio" +"18115","Serbia and Montenegro","SCG","Coffee and products","fabio" +"18116","Serbia and Montenegro","SCG","Cocoa Beans and products","fabio" +"18117","Serbia and Montenegro","SCG","Tea (including mate)","fabio" +"18118","Serbia and Montenegro","SCG","Hops","fabio" +"18119","Serbia and Montenegro","SCG","Pepper","fabio" +"18120","Serbia and Montenegro","SCG","Pimento","fabio" +"18121","Serbia and Montenegro","SCG","Cloves","fabio" +"18122","Serbia and Montenegro","SCG","Spices, Other","fabio" +"18123","Serbia and Montenegro","SCG","Jute","fabio" +"18124","Serbia and Montenegro","SCG","Jute-Like Fibres","fabio" +"18125","Serbia and Montenegro","SCG","Soft-Fibres, Other","fabio" +"18126","Serbia and Montenegro","SCG","Sisal","fabio" +"18127","Serbia and Montenegro","SCG","Abaca","fabio" +"18128","Serbia and Montenegro","SCG","Hard Fibres, Other","fabio" +"18129","Serbia and Montenegro","SCG","Tobacco","fabio" +"18130","Serbia and Montenegro","SCG","Rubber","fabio" +"18131","Serbia and Montenegro","SCG","Fodder crops","fabio" +"18132","Serbia and Montenegro","SCG","Grazing","fabio" +"18133","Serbia and Montenegro","SCG","Cottonseed","fabio" +"18134","Serbia and Montenegro","SCG","Palm kernels","fabio" +"18135","Serbia and Montenegro","SCG","Sugar non-centrifugal","fabio" +"18136","Serbia and Montenegro","SCG","Molasses","fabio" +"18137","Serbia and Montenegro","SCG","Sugar, Refined Equiv","fabio" +"18138","Serbia and Montenegro","SCG","Sweeteners, Other","fabio" +"18139","Serbia and Montenegro","SCG","Soyabean Oil","fabio" +"18140","Serbia and Montenegro","SCG","Groundnut Oil","fabio" +"18141","Serbia and Montenegro","SCG","Sunflowerseed Oil","fabio" +"18142","Serbia and Montenegro","SCG","Rape and Mustard Oil","fabio" +"18143","Serbia and Montenegro","SCG","Cottonseed Oil","fabio" +"18144","Serbia and Montenegro","SCG","Palmkernel Oil","fabio" +"18145","Serbia and Montenegro","SCG","Palm Oil","fabio" +"18146","Serbia and Montenegro","SCG","Coconut Oil","fabio" +"18147","Serbia and Montenegro","SCG","Sesameseed Oil","fabio" +"18148","Serbia and Montenegro","SCG","Olive Oil","fabio" +"18149","Serbia and Montenegro","SCG","Ricebran Oil","fabio" +"18150","Serbia and Montenegro","SCG","Maize Germ Oil","fabio" +"18151","Serbia and Montenegro","SCG","Oilcrops Oil, Other","fabio" +"18152","Serbia and Montenegro","SCG","Soyabean Cake","fabio" +"18153","Serbia and Montenegro","SCG","Groundnut Cake","fabio" +"18154","Serbia and Montenegro","SCG","Sunflowerseed Cake","fabio" +"18155","Serbia and Montenegro","SCG","Rape and Mustard Cake","fabio" +"18156","Serbia and Montenegro","SCG","Cottonseed Cake","fabio" +"18157","Serbia and Montenegro","SCG","Palmkernel Cake","fabio" +"18158","Serbia and Montenegro","SCG","Copra Cake","fabio" +"18159","Serbia and Montenegro","SCG","Sesameseed Cake","fabio" +"18160","Serbia and Montenegro","SCG","Oilseed Cakes, Other","fabio" +"18161","Serbia and Montenegro","SCG","Wine","fabio" +"18162","Serbia and Montenegro","SCG","Beer","fabio" +"18163","Serbia and Montenegro","SCG","Beverages, Fermented","fabio" +"18164","Serbia and Montenegro","SCG","Beverages, Alcoholic","fabio" +"18165","Serbia and Montenegro","SCG","Alcohol, Non-Food","fabio" +"18166","Serbia and Montenegro","SCG","Cotton lint","fabio" +"18167","Serbia and Montenegro","SCG","Cattle","fabio" +"18168","Serbia and Montenegro","SCG","Buffaloes","fabio" +"18169","Serbia and Montenegro","SCG","Sheep","fabio" +"18170","Serbia and Montenegro","SCG","Goats","fabio" +"18171","Serbia and Montenegro","SCG","Pigs","fabio" +"18172","Serbia and Montenegro","SCG","Poultry Birds","fabio" +"18173","Serbia and Montenegro","SCG","Horses","fabio" +"18174","Serbia and Montenegro","SCG","Asses","fabio" +"18175","Serbia and Montenegro","SCG","Mules","fabio" +"18176","Serbia and Montenegro","SCG","Camels","fabio" +"18177","Serbia and Montenegro","SCG","Camelids, other","fabio" +"18178","Serbia and Montenegro","SCG","Rabbits and hares","fabio" +"18179","Serbia and Montenegro","SCG","Rodents, other","fabio" +"18180","Serbia and Montenegro","SCG","Live animals, other","fabio" +"18181","Serbia and Montenegro","SCG","Milk - Excluding Butter","fabio" +"18182","Serbia and Montenegro","SCG","Butter, Ghee","fabio" +"18183","Serbia and Montenegro","SCG","Eggs","fabio" +"18184","Serbia and Montenegro","SCG","Wool (Clean Eq.)","fabio" +"18185","Serbia and Montenegro","SCG","Bovine Meat","fabio" +"18186","Serbia and Montenegro","SCG","Mutton & Goat Meat","fabio" +"18187","Serbia and Montenegro","SCG","Pigmeat","fabio" +"18188","Serbia and Montenegro","SCG","Poultry Meat","fabio" +"18189","Serbia and Montenegro","SCG","Meat, Other","fabio" +"18190","Serbia and Montenegro","SCG","Offals, Edible","fabio" +"18191","Serbia and Montenegro","SCG","Fats, Animals, Raw","fabio" +"18192","Serbia and Montenegro","SCG","Hides and skins","fabio" +"18193","Serbia and Montenegro","SCG","Meat Meal","fabio" +"18194","Serbia and Montenegro","SCG","Pet food","fabio" +"18195","Serbia and Montenegro","SCG","Honey","fabio" +"18196","Serbia and Montenegro","SCG","Silk","fabio" +"18197","Serbia and Montenegro","SCG","Fish, Seafood","fabio" +"18198","Serbia and Montenegro","SCG","Wood fuel","fabio" +"18199","Serbia and Montenegro","SCG","Industrial roundwood, coniferous","fabio" +"18200","Serbia and Montenegro","SCG","Industrial roundwood, non-coniferous","fabio" +"18201","Saint Kitts and Nevis","KNA","Rice (Milled Equivalent)","fabio" +"18202","Saint Kitts and Nevis","KNA","Wheat and products","fabio" +"18203","Saint Kitts and Nevis","KNA","Barley and products","fabio" +"18204","Saint Kitts and Nevis","KNA","Maize and products","fabio" +"18205","Saint Kitts and Nevis","KNA","Rye and products","fabio" +"18206","Saint Kitts and Nevis","KNA","Oats","fabio" +"18207","Saint Kitts and Nevis","KNA","Millet and products","fabio" +"18208","Saint Kitts and Nevis","KNA","Sorghum and products","fabio" +"18209","Saint Kitts and Nevis","KNA","Cereals, Other","fabio" +"18210","Saint Kitts and Nevis","KNA","Potatoes and products","fabio" +"18211","Saint Kitts and Nevis","KNA","Cassava and products","fabio" +"18212","Saint Kitts and Nevis","KNA","Sweet potatoes","fabio" +"18213","Saint Kitts and Nevis","KNA","Roots, Other","fabio" +"18214","Saint Kitts and Nevis","KNA","Yams","fabio" +"18215","Saint Kitts and Nevis","KNA","Sugar cane","fabio" +"18216","Saint Kitts and Nevis","KNA","Sugar beet","fabio" +"18217","Saint Kitts and Nevis","KNA","Beans","fabio" +"18218","Saint Kitts and Nevis","KNA","Peas","fabio" +"18219","Saint Kitts and Nevis","KNA","Pulses, Other and products","fabio" +"18220","Saint Kitts and Nevis","KNA","Nuts and products","fabio" +"18221","Saint Kitts and Nevis","KNA","Soyabeans","fabio" +"18222","Saint Kitts and Nevis","KNA","Groundnuts (Shelled Eq)","fabio" +"18223","Saint Kitts and Nevis","KNA","Sunflower seed","fabio" +"18224","Saint Kitts and Nevis","KNA","Rape and Mustardseed","fabio" +"18225","Saint Kitts and Nevis","KNA","Seed cotton","fabio" +"18226","Saint Kitts and Nevis","KNA","Coconuts - Incl Copra","fabio" +"18227","Saint Kitts and Nevis","KNA","Sesame seed","fabio" +"18228","Saint Kitts and Nevis","KNA","Oil, palm fruit","fabio" +"18229","Saint Kitts and Nevis","KNA","Olives (including preserved)","fabio" +"18230","Saint Kitts and Nevis","KNA","Oilcrops, Other","fabio" +"18231","Saint Kitts and Nevis","KNA","Tomatoes and products","fabio" +"18232","Saint Kitts and Nevis","KNA","Onions","fabio" +"18233","Saint Kitts and Nevis","KNA","Vegetables, Other","fabio" +"18234","Saint Kitts and Nevis","KNA","Oranges, Mandarines","fabio" +"18235","Saint Kitts and Nevis","KNA","Lemons, Limes and products","fabio" +"18236","Saint Kitts and Nevis","KNA","Grapefruit and products","fabio" +"18237","Saint Kitts and Nevis","KNA","Citrus, Other","fabio" +"18238","Saint Kitts and Nevis","KNA","Bananas","fabio" +"18239","Saint Kitts and Nevis","KNA","Plantains","fabio" +"18240","Saint Kitts and Nevis","KNA","Apples and products","fabio" +"18241","Saint Kitts and Nevis","KNA","Pineapples and products","fabio" +"18242","Saint Kitts and Nevis","KNA","Dates","fabio" +"18243","Saint Kitts and Nevis","KNA","Grapes and products (excl wine)","fabio" +"18244","Saint Kitts and Nevis","KNA","Fruits, Other","fabio" +"18245","Saint Kitts and Nevis","KNA","Coffee and products","fabio" +"18246","Saint Kitts and Nevis","KNA","Cocoa Beans and products","fabio" +"18247","Saint Kitts and Nevis","KNA","Tea (including mate)","fabio" +"18248","Saint Kitts and Nevis","KNA","Hops","fabio" +"18249","Saint Kitts and Nevis","KNA","Pepper","fabio" +"18250","Saint Kitts and Nevis","KNA","Pimento","fabio" +"18251","Saint Kitts and Nevis","KNA","Cloves","fabio" +"18252","Saint Kitts and Nevis","KNA","Spices, Other","fabio" +"18253","Saint Kitts and Nevis","KNA","Jute","fabio" +"18254","Saint Kitts and Nevis","KNA","Jute-Like Fibres","fabio" +"18255","Saint Kitts and Nevis","KNA","Soft-Fibres, Other","fabio" +"18256","Saint Kitts and Nevis","KNA","Sisal","fabio" +"18257","Saint Kitts and Nevis","KNA","Abaca","fabio" +"18258","Saint Kitts and Nevis","KNA","Hard Fibres, Other","fabio" +"18259","Saint Kitts and Nevis","KNA","Tobacco","fabio" +"18260","Saint Kitts and Nevis","KNA","Rubber","fabio" +"18261","Saint Kitts and Nevis","KNA","Fodder crops","fabio" +"18262","Saint Kitts and Nevis","KNA","Grazing","fabio" +"18263","Saint Kitts and Nevis","KNA","Cottonseed","fabio" +"18264","Saint Kitts and Nevis","KNA","Palm kernels","fabio" +"18265","Saint Kitts and Nevis","KNA","Sugar non-centrifugal","fabio" +"18266","Saint Kitts and Nevis","KNA","Molasses","fabio" +"18267","Saint Kitts and Nevis","KNA","Sugar, Refined Equiv","fabio" +"18268","Saint Kitts and Nevis","KNA","Sweeteners, Other","fabio" +"18269","Saint Kitts and Nevis","KNA","Soyabean Oil","fabio" +"18270","Saint Kitts and Nevis","KNA","Groundnut Oil","fabio" +"18271","Saint Kitts and Nevis","KNA","Sunflowerseed Oil","fabio" +"18272","Saint Kitts and Nevis","KNA","Rape and Mustard Oil","fabio" +"18273","Saint Kitts and Nevis","KNA","Cottonseed Oil","fabio" +"18274","Saint Kitts and Nevis","KNA","Palmkernel Oil","fabio" +"18275","Saint Kitts and Nevis","KNA","Palm Oil","fabio" +"18276","Saint Kitts and Nevis","KNA","Coconut Oil","fabio" +"18277","Saint Kitts and Nevis","KNA","Sesameseed Oil","fabio" +"18278","Saint Kitts and Nevis","KNA","Olive Oil","fabio" +"18279","Saint Kitts and Nevis","KNA","Ricebran Oil","fabio" +"18280","Saint Kitts and Nevis","KNA","Maize Germ Oil","fabio" +"18281","Saint Kitts and Nevis","KNA","Oilcrops Oil, Other","fabio" +"18282","Saint Kitts and Nevis","KNA","Soyabean Cake","fabio" +"18283","Saint Kitts and Nevis","KNA","Groundnut Cake","fabio" +"18284","Saint Kitts and Nevis","KNA","Sunflowerseed Cake","fabio" +"18285","Saint Kitts and Nevis","KNA","Rape and Mustard Cake","fabio" +"18286","Saint Kitts and Nevis","KNA","Cottonseed Cake","fabio" +"18287","Saint Kitts and Nevis","KNA","Palmkernel Cake","fabio" +"18288","Saint Kitts and Nevis","KNA","Copra Cake","fabio" +"18289","Saint Kitts and Nevis","KNA","Sesameseed Cake","fabio" +"18290","Saint Kitts and Nevis","KNA","Oilseed Cakes, Other","fabio" +"18291","Saint Kitts and Nevis","KNA","Wine","fabio" +"18292","Saint Kitts and Nevis","KNA","Beer","fabio" +"18293","Saint Kitts and Nevis","KNA","Beverages, Fermented","fabio" +"18294","Saint Kitts and Nevis","KNA","Beverages, Alcoholic","fabio" +"18295","Saint Kitts and Nevis","KNA","Alcohol, Non-Food","fabio" +"18296","Saint Kitts and Nevis","KNA","Cotton lint","fabio" +"18297","Saint Kitts and Nevis","KNA","Cattle","fabio" +"18298","Saint Kitts and Nevis","KNA","Buffaloes","fabio" +"18299","Saint Kitts and Nevis","KNA","Sheep","fabio" +"18300","Saint Kitts and Nevis","KNA","Goats","fabio" +"18301","Saint Kitts and Nevis","KNA","Pigs","fabio" +"18302","Saint Kitts and Nevis","KNA","Poultry Birds","fabio" +"18303","Saint Kitts and Nevis","KNA","Horses","fabio" +"18304","Saint Kitts and Nevis","KNA","Asses","fabio" +"18305","Saint Kitts and Nevis","KNA","Mules","fabio" +"18306","Saint Kitts and Nevis","KNA","Camels","fabio" +"18307","Saint Kitts and Nevis","KNA","Camelids, other","fabio" +"18308","Saint Kitts and Nevis","KNA","Rabbits and hares","fabio" +"18309","Saint Kitts and Nevis","KNA","Rodents, other","fabio" +"18310","Saint Kitts and Nevis","KNA","Live animals, other","fabio" +"18311","Saint Kitts and Nevis","KNA","Milk - Excluding Butter","fabio" +"18312","Saint Kitts and Nevis","KNA","Butter, Ghee","fabio" +"18313","Saint Kitts and Nevis","KNA","Eggs","fabio" +"18314","Saint Kitts and Nevis","KNA","Wool (Clean Eq.)","fabio" +"18315","Saint Kitts and Nevis","KNA","Bovine Meat","fabio" +"18316","Saint Kitts and Nevis","KNA","Mutton & Goat Meat","fabio" +"18317","Saint Kitts and Nevis","KNA","Pigmeat","fabio" +"18318","Saint Kitts and Nevis","KNA","Poultry Meat","fabio" +"18319","Saint Kitts and Nevis","KNA","Meat, Other","fabio" +"18320","Saint Kitts and Nevis","KNA","Offals, Edible","fabio" +"18321","Saint Kitts and Nevis","KNA","Fats, Animals, Raw","fabio" +"18322","Saint Kitts and Nevis","KNA","Hides and skins","fabio" +"18323","Saint Kitts and Nevis","KNA","Meat Meal","fabio" +"18324","Saint Kitts and Nevis","KNA","Pet food","fabio" +"18325","Saint Kitts and Nevis","KNA","Honey","fabio" +"18326","Saint Kitts and Nevis","KNA","Silk","fabio" +"18327","Saint Kitts and Nevis","KNA","Fish, Seafood","fabio" +"18328","Saint Kitts and Nevis","KNA","Wood fuel","fabio" +"18329","Saint Kitts and Nevis","KNA","Industrial roundwood, coniferous","fabio" +"18330","Saint Kitts and Nevis","KNA","Industrial roundwood, non-coniferous","fabio" +"18331","Saint Lucia","LCA","Rice (Milled Equivalent)","fabio" +"18332","Saint Lucia","LCA","Wheat and products","fabio" +"18333","Saint Lucia","LCA","Barley and products","fabio" +"18334","Saint Lucia","LCA","Maize and products","fabio" +"18335","Saint Lucia","LCA","Rye and products","fabio" +"18336","Saint Lucia","LCA","Oats","fabio" +"18337","Saint Lucia","LCA","Millet and products","fabio" +"18338","Saint Lucia","LCA","Sorghum and products","fabio" +"18339","Saint Lucia","LCA","Cereals, Other","fabio" +"18340","Saint Lucia","LCA","Potatoes and products","fabio" +"18341","Saint Lucia","LCA","Cassava and products","fabio" +"18342","Saint Lucia","LCA","Sweet potatoes","fabio" +"18343","Saint Lucia","LCA","Roots, Other","fabio" +"18344","Saint Lucia","LCA","Yams","fabio" +"18345","Saint Lucia","LCA","Sugar cane","fabio" +"18346","Saint Lucia","LCA","Sugar beet","fabio" +"18347","Saint Lucia","LCA","Beans","fabio" +"18348","Saint Lucia","LCA","Peas","fabio" +"18349","Saint Lucia","LCA","Pulses, Other and products","fabio" +"18350","Saint Lucia","LCA","Nuts and products","fabio" +"18351","Saint Lucia","LCA","Soyabeans","fabio" +"18352","Saint Lucia","LCA","Groundnuts (Shelled Eq)","fabio" +"18353","Saint Lucia","LCA","Sunflower seed","fabio" +"18354","Saint Lucia","LCA","Rape and Mustardseed","fabio" +"18355","Saint Lucia","LCA","Seed cotton","fabio" +"18356","Saint Lucia","LCA","Coconuts - Incl Copra","fabio" +"18357","Saint Lucia","LCA","Sesame seed","fabio" +"18358","Saint Lucia","LCA","Oil, palm fruit","fabio" +"18359","Saint Lucia","LCA","Olives (including preserved)","fabio" +"18360","Saint Lucia","LCA","Oilcrops, Other","fabio" +"18361","Saint Lucia","LCA","Tomatoes and products","fabio" +"18362","Saint Lucia","LCA","Onions","fabio" +"18363","Saint Lucia","LCA","Vegetables, Other","fabio" +"18364","Saint Lucia","LCA","Oranges, Mandarines","fabio" +"18365","Saint Lucia","LCA","Lemons, Limes and products","fabio" +"18366","Saint Lucia","LCA","Grapefruit and products","fabio" +"18367","Saint Lucia","LCA","Citrus, Other","fabio" +"18368","Saint Lucia","LCA","Bananas","fabio" +"18369","Saint Lucia","LCA","Plantains","fabio" +"18370","Saint Lucia","LCA","Apples and products","fabio" +"18371","Saint Lucia","LCA","Pineapples and products","fabio" +"18372","Saint Lucia","LCA","Dates","fabio" +"18373","Saint Lucia","LCA","Grapes and products (excl wine)","fabio" +"18374","Saint Lucia","LCA","Fruits, Other","fabio" +"18375","Saint Lucia","LCA","Coffee and products","fabio" +"18376","Saint Lucia","LCA","Cocoa Beans and products","fabio" +"18377","Saint Lucia","LCA","Tea (including mate)","fabio" +"18378","Saint Lucia","LCA","Hops","fabio" +"18379","Saint Lucia","LCA","Pepper","fabio" +"18380","Saint Lucia","LCA","Pimento","fabio" +"18381","Saint Lucia","LCA","Cloves","fabio" +"18382","Saint Lucia","LCA","Spices, Other","fabio" +"18383","Saint Lucia","LCA","Jute","fabio" +"18384","Saint Lucia","LCA","Jute-Like Fibres","fabio" +"18385","Saint Lucia","LCA","Soft-Fibres, Other","fabio" +"18386","Saint Lucia","LCA","Sisal","fabio" +"18387","Saint Lucia","LCA","Abaca","fabio" +"18388","Saint Lucia","LCA","Hard Fibres, Other","fabio" +"18389","Saint Lucia","LCA","Tobacco","fabio" +"18390","Saint Lucia","LCA","Rubber","fabio" +"18391","Saint Lucia","LCA","Fodder crops","fabio" +"18392","Saint Lucia","LCA","Grazing","fabio" +"18393","Saint Lucia","LCA","Cottonseed","fabio" +"18394","Saint Lucia","LCA","Palm kernels","fabio" +"18395","Saint Lucia","LCA","Sugar non-centrifugal","fabio" +"18396","Saint Lucia","LCA","Molasses","fabio" +"18397","Saint Lucia","LCA","Sugar, Refined Equiv","fabio" +"18398","Saint Lucia","LCA","Sweeteners, Other","fabio" +"18399","Saint Lucia","LCA","Soyabean Oil","fabio" +"18400","Saint Lucia","LCA","Groundnut Oil","fabio" +"18401","Saint Lucia","LCA","Sunflowerseed Oil","fabio" +"18402","Saint Lucia","LCA","Rape and Mustard Oil","fabio" +"18403","Saint Lucia","LCA","Cottonseed Oil","fabio" +"18404","Saint Lucia","LCA","Palmkernel Oil","fabio" +"18405","Saint Lucia","LCA","Palm Oil","fabio" +"18406","Saint Lucia","LCA","Coconut Oil","fabio" +"18407","Saint Lucia","LCA","Sesameseed Oil","fabio" +"18408","Saint Lucia","LCA","Olive Oil","fabio" +"18409","Saint Lucia","LCA","Ricebran Oil","fabio" +"18410","Saint Lucia","LCA","Maize Germ Oil","fabio" +"18411","Saint Lucia","LCA","Oilcrops Oil, Other","fabio" +"18412","Saint Lucia","LCA","Soyabean Cake","fabio" +"18413","Saint Lucia","LCA","Groundnut Cake","fabio" +"18414","Saint Lucia","LCA","Sunflowerseed Cake","fabio" +"18415","Saint Lucia","LCA","Rape and Mustard Cake","fabio" +"18416","Saint Lucia","LCA","Cottonseed Cake","fabio" +"18417","Saint Lucia","LCA","Palmkernel Cake","fabio" +"18418","Saint Lucia","LCA","Copra Cake","fabio" +"18419","Saint Lucia","LCA","Sesameseed Cake","fabio" +"18420","Saint Lucia","LCA","Oilseed Cakes, Other","fabio" +"18421","Saint Lucia","LCA","Wine","fabio" +"18422","Saint Lucia","LCA","Beer","fabio" +"18423","Saint Lucia","LCA","Beverages, Fermented","fabio" +"18424","Saint Lucia","LCA","Beverages, Alcoholic","fabio" +"18425","Saint Lucia","LCA","Alcohol, Non-Food","fabio" +"18426","Saint Lucia","LCA","Cotton lint","fabio" +"18427","Saint Lucia","LCA","Cattle","fabio" +"18428","Saint Lucia","LCA","Buffaloes","fabio" +"18429","Saint Lucia","LCA","Sheep","fabio" +"18430","Saint Lucia","LCA","Goats","fabio" +"18431","Saint Lucia","LCA","Pigs","fabio" +"18432","Saint Lucia","LCA","Poultry Birds","fabio" +"18433","Saint Lucia","LCA","Horses","fabio" +"18434","Saint Lucia","LCA","Asses","fabio" +"18435","Saint Lucia","LCA","Mules","fabio" +"18436","Saint Lucia","LCA","Camels","fabio" +"18437","Saint Lucia","LCA","Camelids, other","fabio" +"18438","Saint Lucia","LCA","Rabbits and hares","fabio" +"18439","Saint Lucia","LCA","Rodents, other","fabio" +"18440","Saint Lucia","LCA","Live animals, other","fabio" +"18441","Saint Lucia","LCA","Milk - Excluding Butter","fabio" +"18442","Saint Lucia","LCA","Butter, Ghee","fabio" +"18443","Saint Lucia","LCA","Eggs","fabio" +"18444","Saint Lucia","LCA","Wool (Clean Eq.)","fabio" +"18445","Saint Lucia","LCA","Bovine Meat","fabio" +"18446","Saint Lucia","LCA","Mutton & Goat Meat","fabio" +"18447","Saint Lucia","LCA","Pigmeat","fabio" +"18448","Saint Lucia","LCA","Poultry Meat","fabio" +"18449","Saint Lucia","LCA","Meat, Other","fabio" +"18450","Saint Lucia","LCA","Offals, Edible","fabio" +"18451","Saint Lucia","LCA","Fats, Animals, Raw","fabio" +"18452","Saint Lucia","LCA","Hides and skins","fabio" +"18453","Saint Lucia","LCA","Meat Meal","fabio" +"18454","Saint Lucia","LCA","Pet food","fabio" +"18455","Saint Lucia","LCA","Honey","fabio" +"18456","Saint Lucia","LCA","Silk","fabio" +"18457","Saint Lucia","LCA","Fish, Seafood","fabio" +"18458","Saint Lucia","LCA","Wood fuel","fabio" +"18459","Saint Lucia","LCA","Industrial roundwood, coniferous","fabio" +"18460","Saint Lucia","LCA","Industrial roundwood, non-coniferous","fabio" +"18461","Saint Vincent and the Grenadines","VCT","Rice (Milled Equivalent)","fabio" +"18462","Saint Vincent and the Grenadines","VCT","Wheat and products","fabio" +"18463","Saint Vincent and the Grenadines","VCT","Barley and products","fabio" +"18464","Saint Vincent and the Grenadines","VCT","Maize and products","fabio" +"18465","Saint Vincent and the Grenadines","VCT","Rye and products","fabio" +"18466","Saint Vincent and the Grenadines","VCT","Oats","fabio" +"18467","Saint Vincent and the Grenadines","VCT","Millet and products","fabio" +"18468","Saint Vincent and the Grenadines","VCT","Sorghum and products","fabio" +"18469","Saint Vincent and the Grenadines","VCT","Cereals, Other","fabio" +"18470","Saint Vincent and the Grenadines","VCT","Potatoes and products","fabio" +"18471","Saint Vincent and the Grenadines","VCT","Cassava and products","fabio" +"18472","Saint Vincent and the Grenadines","VCT","Sweet potatoes","fabio" +"18473","Saint Vincent and the Grenadines","VCT","Roots, Other","fabio" +"18474","Saint Vincent and the Grenadines","VCT","Yams","fabio" +"18475","Saint Vincent and the Grenadines","VCT","Sugar cane","fabio" +"18476","Saint Vincent and the Grenadines","VCT","Sugar beet","fabio" +"18477","Saint Vincent and the Grenadines","VCT","Beans","fabio" +"18478","Saint Vincent and the Grenadines","VCT","Peas","fabio" +"18479","Saint Vincent and the Grenadines","VCT","Pulses, Other and products","fabio" +"18480","Saint Vincent and the Grenadines","VCT","Nuts and products","fabio" +"18481","Saint Vincent and the Grenadines","VCT","Soyabeans","fabio" +"18482","Saint Vincent and the Grenadines","VCT","Groundnuts (Shelled Eq)","fabio" +"18483","Saint Vincent and the Grenadines","VCT","Sunflower seed","fabio" +"18484","Saint Vincent and the Grenadines","VCT","Rape and Mustardseed","fabio" +"18485","Saint Vincent and the Grenadines","VCT","Seed cotton","fabio" +"18486","Saint Vincent and the Grenadines","VCT","Coconuts - Incl Copra","fabio" +"18487","Saint Vincent and the Grenadines","VCT","Sesame seed","fabio" +"18488","Saint Vincent and the Grenadines","VCT","Oil, palm fruit","fabio" +"18489","Saint Vincent and the Grenadines","VCT","Olives (including preserved)","fabio" +"18490","Saint Vincent and the Grenadines","VCT","Oilcrops, Other","fabio" +"18491","Saint Vincent and the Grenadines","VCT","Tomatoes and products","fabio" +"18492","Saint Vincent and the Grenadines","VCT","Onions","fabio" +"18493","Saint Vincent and the Grenadines","VCT","Vegetables, Other","fabio" +"18494","Saint Vincent and the Grenadines","VCT","Oranges, Mandarines","fabio" +"18495","Saint Vincent and the Grenadines","VCT","Lemons, Limes and products","fabio" +"18496","Saint Vincent and the Grenadines","VCT","Grapefruit and products","fabio" +"18497","Saint Vincent and the Grenadines","VCT","Citrus, Other","fabio" +"18498","Saint Vincent and the Grenadines","VCT","Bananas","fabio" +"18499","Saint Vincent and the Grenadines","VCT","Plantains","fabio" +"18500","Saint Vincent and the Grenadines","VCT","Apples and products","fabio" +"18501","Saint Vincent and the Grenadines","VCT","Pineapples and products","fabio" +"18502","Saint Vincent and the Grenadines","VCT","Dates","fabio" +"18503","Saint Vincent and the Grenadines","VCT","Grapes and products (excl wine)","fabio" +"18504","Saint Vincent and the Grenadines","VCT","Fruits, Other","fabio" +"18505","Saint Vincent and the Grenadines","VCT","Coffee and products","fabio" +"18506","Saint Vincent and the Grenadines","VCT","Cocoa Beans and products","fabio" +"18507","Saint Vincent and the Grenadines","VCT","Tea (including mate)","fabio" +"18508","Saint Vincent and the Grenadines","VCT","Hops","fabio" +"18509","Saint Vincent and the Grenadines","VCT","Pepper","fabio" +"18510","Saint Vincent and the Grenadines","VCT","Pimento","fabio" +"18511","Saint Vincent and the Grenadines","VCT","Cloves","fabio" +"18512","Saint Vincent and the Grenadines","VCT","Spices, Other","fabio" +"18513","Saint Vincent and the Grenadines","VCT","Jute","fabio" +"18514","Saint Vincent and the Grenadines","VCT","Jute-Like Fibres","fabio" +"18515","Saint Vincent and the Grenadines","VCT","Soft-Fibres, Other","fabio" +"18516","Saint Vincent and the Grenadines","VCT","Sisal","fabio" +"18517","Saint Vincent and the Grenadines","VCT","Abaca","fabio" +"18518","Saint Vincent and the Grenadines","VCT","Hard Fibres, Other","fabio" +"18519","Saint Vincent and the Grenadines","VCT","Tobacco","fabio" +"18520","Saint Vincent and the Grenadines","VCT","Rubber","fabio" +"18521","Saint Vincent and the Grenadines","VCT","Fodder crops","fabio" +"18522","Saint Vincent and the Grenadines","VCT","Grazing","fabio" +"18523","Saint Vincent and the Grenadines","VCT","Cottonseed","fabio" +"18524","Saint Vincent and the Grenadines","VCT","Palm kernels","fabio" +"18525","Saint Vincent and the Grenadines","VCT","Sugar non-centrifugal","fabio" +"18526","Saint Vincent and the Grenadines","VCT","Molasses","fabio" +"18527","Saint Vincent and the Grenadines","VCT","Sugar, Refined Equiv","fabio" +"18528","Saint Vincent and the Grenadines","VCT","Sweeteners, Other","fabio" +"18529","Saint Vincent and the Grenadines","VCT","Soyabean Oil","fabio" +"18530","Saint Vincent and the Grenadines","VCT","Groundnut Oil","fabio" +"18531","Saint Vincent and the Grenadines","VCT","Sunflowerseed Oil","fabio" +"18532","Saint Vincent and the Grenadines","VCT","Rape and Mustard Oil","fabio" +"18533","Saint Vincent and the Grenadines","VCT","Cottonseed Oil","fabio" +"18534","Saint Vincent and the Grenadines","VCT","Palmkernel Oil","fabio" +"18535","Saint Vincent and the Grenadines","VCT","Palm Oil","fabio" +"18536","Saint Vincent and the Grenadines","VCT","Coconut Oil","fabio" +"18537","Saint Vincent and the Grenadines","VCT","Sesameseed Oil","fabio" +"18538","Saint Vincent and the Grenadines","VCT","Olive Oil","fabio" +"18539","Saint Vincent and the Grenadines","VCT","Ricebran Oil","fabio" +"18540","Saint Vincent and the Grenadines","VCT","Maize Germ Oil","fabio" +"18541","Saint Vincent and the Grenadines","VCT","Oilcrops Oil, Other","fabio" +"18542","Saint Vincent and the Grenadines","VCT","Soyabean Cake","fabio" +"18543","Saint Vincent and the Grenadines","VCT","Groundnut Cake","fabio" +"18544","Saint Vincent and the Grenadines","VCT","Sunflowerseed Cake","fabio" +"18545","Saint Vincent and the Grenadines","VCT","Rape and Mustard Cake","fabio" +"18546","Saint Vincent and the Grenadines","VCT","Cottonseed Cake","fabio" +"18547","Saint Vincent and the Grenadines","VCT","Palmkernel Cake","fabio" +"18548","Saint Vincent and the Grenadines","VCT","Copra Cake","fabio" +"18549","Saint Vincent and the Grenadines","VCT","Sesameseed Cake","fabio" +"18550","Saint Vincent and the Grenadines","VCT","Oilseed Cakes, Other","fabio" +"18551","Saint Vincent and the Grenadines","VCT","Wine","fabio" +"18552","Saint Vincent and the Grenadines","VCT","Beer","fabio" +"18553","Saint Vincent and the Grenadines","VCT","Beverages, Fermented","fabio" +"18554","Saint Vincent and the Grenadines","VCT","Beverages, Alcoholic","fabio" +"18555","Saint Vincent and the Grenadines","VCT","Alcohol, Non-Food","fabio" +"18556","Saint Vincent and the Grenadines","VCT","Cotton lint","fabio" +"18557","Saint Vincent and the Grenadines","VCT","Cattle","fabio" +"18558","Saint Vincent and the Grenadines","VCT","Buffaloes","fabio" +"18559","Saint Vincent and the Grenadines","VCT","Sheep","fabio" +"18560","Saint Vincent and the Grenadines","VCT","Goats","fabio" +"18561","Saint Vincent and the Grenadines","VCT","Pigs","fabio" +"18562","Saint Vincent and the Grenadines","VCT","Poultry Birds","fabio" +"18563","Saint Vincent and the Grenadines","VCT","Horses","fabio" +"18564","Saint Vincent and the Grenadines","VCT","Asses","fabio" +"18565","Saint Vincent and the Grenadines","VCT","Mules","fabio" +"18566","Saint Vincent and the Grenadines","VCT","Camels","fabio" +"18567","Saint Vincent and the Grenadines","VCT","Camelids, other","fabio" +"18568","Saint Vincent and the Grenadines","VCT","Rabbits and hares","fabio" +"18569","Saint Vincent and the Grenadines","VCT","Rodents, other","fabio" +"18570","Saint Vincent and the Grenadines","VCT","Live animals, other","fabio" +"18571","Saint Vincent and the Grenadines","VCT","Milk - Excluding Butter","fabio" +"18572","Saint Vincent and the Grenadines","VCT","Butter, Ghee","fabio" +"18573","Saint Vincent and the Grenadines","VCT","Eggs","fabio" +"18574","Saint Vincent and the Grenadines","VCT","Wool (Clean Eq.)","fabio" +"18575","Saint Vincent and the Grenadines","VCT","Bovine Meat","fabio" +"18576","Saint Vincent and the Grenadines","VCT","Mutton & Goat Meat","fabio" +"18577","Saint Vincent and the Grenadines","VCT","Pigmeat","fabio" +"18578","Saint Vincent and the Grenadines","VCT","Poultry Meat","fabio" +"18579","Saint Vincent and the Grenadines","VCT","Meat, Other","fabio" +"18580","Saint Vincent and the Grenadines","VCT","Offals, Edible","fabio" +"18581","Saint Vincent and the Grenadines","VCT","Fats, Animals, Raw","fabio" +"18582","Saint Vincent and the Grenadines","VCT","Hides and skins","fabio" +"18583","Saint Vincent and the Grenadines","VCT","Meat Meal","fabio" +"18584","Saint Vincent and the Grenadines","VCT","Pet food","fabio" +"18585","Saint Vincent and the Grenadines","VCT","Honey","fabio" +"18586","Saint Vincent and the Grenadines","VCT","Silk","fabio" +"18587","Saint Vincent and the Grenadines","VCT","Fish, Seafood","fabio" +"18588","Saint Vincent and the Grenadines","VCT","Wood fuel","fabio" +"18589","Saint Vincent and the Grenadines","VCT","Industrial roundwood, coniferous","fabio" +"18590","Saint Vincent and the Grenadines","VCT","Industrial roundwood, non-coniferous","fabio" +"18591","Sao Tome and Principe","STP","Rice (Milled Equivalent)","fabio" +"18592","Sao Tome and Principe","STP","Wheat and products","fabio" +"18593","Sao Tome and Principe","STP","Barley and products","fabio" +"18594","Sao Tome and Principe","STP","Maize and products","fabio" +"18595","Sao Tome and Principe","STP","Rye and products","fabio" +"18596","Sao Tome and Principe","STP","Oats","fabio" +"18597","Sao Tome and Principe","STP","Millet and products","fabio" +"18598","Sao Tome and Principe","STP","Sorghum and products","fabio" +"18599","Sao Tome and Principe","STP","Cereals, Other","fabio" +"18600","Sao Tome and Principe","STP","Potatoes and products","fabio" +"18601","Sao Tome and Principe","STP","Cassava and products","fabio" +"18602","Sao Tome and Principe","STP","Sweet potatoes","fabio" +"18603","Sao Tome and Principe","STP","Roots, Other","fabio" +"18604","Sao Tome and Principe","STP","Yams","fabio" +"18605","Sao Tome and Principe","STP","Sugar cane","fabio" +"18606","Sao Tome and Principe","STP","Sugar beet","fabio" +"18607","Sao Tome and Principe","STP","Beans","fabio" +"18608","Sao Tome and Principe","STP","Peas","fabio" +"18609","Sao Tome and Principe","STP","Pulses, Other and products","fabio" +"18610","Sao Tome and Principe","STP","Nuts and products","fabio" +"18611","Sao Tome and Principe","STP","Soyabeans","fabio" +"18612","Sao Tome and Principe","STP","Groundnuts (Shelled Eq)","fabio" +"18613","Sao Tome and Principe","STP","Sunflower seed","fabio" +"18614","Sao Tome and Principe","STP","Rape and Mustardseed","fabio" +"18615","Sao Tome and Principe","STP","Seed cotton","fabio" +"18616","Sao Tome and Principe","STP","Coconuts - Incl Copra","fabio" +"18617","Sao Tome and Principe","STP","Sesame seed","fabio" +"18618","Sao Tome and Principe","STP","Oil, palm fruit","fabio" +"18619","Sao Tome and Principe","STP","Olives (including preserved)","fabio" +"18620","Sao Tome and Principe","STP","Oilcrops, Other","fabio" +"18621","Sao Tome and Principe","STP","Tomatoes and products","fabio" +"18622","Sao Tome and Principe","STP","Onions","fabio" +"18623","Sao Tome and Principe","STP","Vegetables, Other","fabio" +"18624","Sao Tome and Principe","STP","Oranges, Mandarines","fabio" +"18625","Sao Tome and Principe","STP","Lemons, Limes and products","fabio" +"18626","Sao Tome and Principe","STP","Grapefruit and products","fabio" +"18627","Sao Tome and Principe","STP","Citrus, Other","fabio" +"18628","Sao Tome and Principe","STP","Bananas","fabio" +"18629","Sao Tome and Principe","STP","Plantains","fabio" +"18630","Sao Tome and Principe","STP","Apples and products","fabio" +"18631","Sao Tome and Principe","STP","Pineapples and products","fabio" +"18632","Sao Tome and Principe","STP","Dates","fabio" +"18633","Sao Tome and Principe","STP","Grapes and products (excl wine)","fabio" +"18634","Sao Tome and Principe","STP","Fruits, Other","fabio" +"18635","Sao Tome and Principe","STP","Coffee and products","fabio" +"18636","Sao Tome and Principe","STP","Cocoa Beans and products","fabio" +"18637","Sao Tome and Principe","STP","Tea (including mate)","fabio" +"18638","Sao Tome and Principe","STP","Hops","fabio" +"18639","Sao Tome and Principe","STP","Pepper","fabio" +"18640","Sao Tome and Principe","STP","Pimento","fabio" +"18641","Sao Tome and Principe","STP","Cloves","fabio" +"18642","Sao Tome and Principe","STP","Spices, Other","fabio" +"18643","Sao Tome and Principe","STP","Jute","fabio" +"18644","Sao Tome and Principe","STP","Jute-Like Fibres","fabio" +"18645","Sao Tome and Principe","STP","Soft-Fibres, Other","fabio" +"18646","Sao Tome and Principe","STP","Sisal","fabio" +"18647","Sao Tome and Principe","STP","Abaca","fabio" +"18648","Sao Tome and Principe","STP","Hard Fibres, Other","fabio" +"18649","Sao Tome and Principe","STP","Tobacco","fabio" +"18650","Sao Tome and Principe","STP","Rubber","fabio" +"18651","Sao Tome and Principe","STP","Fodder crops","fabio" +"18652","Sao Tome and Principe","STP","Grazing","fabio" +"18653","Sao Tome and Principe","STP","Cottonseed","fabio" +"18654","Sao Tome and Principe","STP","Palm kernels","fabio" +"18655","Sao Tome and Principe","STP","Sugar non-centrifugal","fabio" +"18656","Sao Tome and Principe","STP","Molasses","fabio" +"18657","Sao Tome and Principe","STP","Sugar, Refined Equiv","fabio" +"18658","Sao Tome and Principe","STP","Sweeteners, Other","fabio" +"18659","Sao Tome and Principe","STP","Soyabean Oil","fabio" +"18660","Sao Tome and Principe","STP","Groundnut Oil","fabio" +"18661","Sao Tome and Principe","STP","Sunflowerseed Oil","fabio" +"18662","Sao Tome and Principe","STP","Rape and Mustard Oil","fabio" +"18663","Sao Tome and Principe","STP","Cottonseed Oil","fabio" +"18664","Sao Tome and Principe","STP","Palmkernel Oil","fabio" +"18665","Sao Tome and Principe","STP","Palm Oil","fabio" +"18666","Sao Tome and Principe","STP","Coconut Oil","fabio" +"18667","Sao Tome and Principe","STP","Sesameseed Oil","fabio" +"18668","Sao Tome and Principe","STP","Olive Oil","fabio" +"18669","Sao Tome and Principe","STP","Ricebran Oil","fabio" +"18670","Sao Tome and Principe","STP","Maize Germ Oil","fabio" +"18671","Sao Tome and Principe","STP","Oilcrops Oil, Other","fabio" +"18672","Sao Tome and Principe","STP","Soyabean Cake","fabio" +"18673","Sao Tome and Principe","STP","Groundnut Cake","fabio" +"18674","Sao Tome and Principe","STP","Sunflowerseed Cake","fabio" +"18675","Sao Tome and Principe","STP","Rape and Mustard Cake","fabio" +"18676","Sao Tome and Principe","STP","Cottonseed Cake","fabio" +"18677","Sao Tome and Principe","STP","Palmkernel Cake","fabio" +"18678","Sao Tome and Principe","STP","Copra Cake","fabio" +"18679","Sao Tome and Principe","STP","Sesameseed Cake","fabio" +"18680","Sao Tome and Principe","STP","Oilseed Cakes, Other","fabio" +"18681","Sao Tome and Principe","STP","Wine","fabio" +"18682","Sao Tome and Principe","STP","Beer","fabio" +"18683","Sao Tome and Principe","STP","Beverages, Fermented","fabio" +"18684","Sao Tome and Principe","STP","Beverages, Alcoholic","fabio" +"18685","Sao Tome and Principe","STP","Alcohol, Non-Food","fabio" +"18686","Sao Tome and Principe","STP","Cotton lint","fabio" +"18687","Sao Tome and Principe","STP","Cattle","fabio" +"18688","Sao Tome and Principe","STP","Buffaloes","fabio" +"18689","Sao Tome and Principe","STP","Sheep","fabio" +"18690","Sao Tome and Principe","STP","Goats","fabio" +"18691","Sao Tome and Principe","STP","Pigs","fabio" +"18692","Sao Tome and Principe","STP","Poultry Birds","fabio" +"18693","Sao Tome and Principe","STP","Horses","fabio" +"18694","Sao Tome and Principe","STP","Asses","fabio" +"18695","Sao Tome and Principe","STP","Mules","fabio" +"18696","Sao Tome and Principe","STP","Camels","fabio" +"18697","Sao Tome and Principe","STP","Camelids, other","fabio" +"18698","Sao Tome and Principe","STP","Rabbits and hares","fabio" +"18699","Sao Tome and Principe","STP","Rodents, other","fabio" +"18700","Sao Tome and Principe","STP","Live animals, other","fabio" +"18701","Sao Tome and Principe","STP","Milk - Excluding Butter","fabio" +"18702","Sao Tome and Principe","STP","Butter, Ghee","fabio" +"18703","Sao Tome and Principe","STP","Eggs","fabio" +"18704","Sao Tome and Principe","STP","Wool (Clean Eq.)","fabio" +"18705","Sao Tome and Principe","STP","Bovine Meat","fabio" +"18706","Sao Tome and Principe","STP","Mutton & Goat Meat","fabio" +"18707","Sao Tome and Principe","STP","Pigmeat","fabio" +"18708","Sao Tome and Principe","STP","Poultry Meat","fabio" +"18709","Sao Tome and Principe","STP","Meat, Other","fabio" +"18710","Sao Tome and Principe","STP","Offals, Edible","fabio" +"18711","Sao Tome and Principe","STP","Fats, Animals, Raw","fabio" +"18712","Sao Tome and Principe","STP","Hides and skins","fabio" +"18713","Sao Tome and Principe","STP","Meat Meal","fabio" +"18714","Sao Tome and Principe","STP","Pet food","fabio" +"18715","Sao Tome and Principe","STP","Honey","fabio" +"18716","Sao Tome and Principe","STP","Silk","fabio" +"18717","Sao Tome and Principe","STP","Fish, Seafood","fabio" +"18718","Sao Tome and Principe","STP","Wood fuel","fabio" +"18719","Sao Tome and Principe","STP","Industrial roundwood, coniferous","fabio" +"18720","Sao Tome and Principe","STP","Industrial roundwood, non-coniferous","fabio" +"18721","Saudi Arabia","SAU","Rice (Milled Equivalent)","fabio" +"18722","Saudi Arabia","SAU","Wheat and products","fabio" +"18723","Saudi Arabia","SAU","Barley and products","fabio" +"18724","Saudi Arabia","SAU","Maize and products","fabio" +"18725","Saudi Arabia","SAU","Rye and products","fabio" +"18726","Saudi Arabia","SAU","Oats","fabio" +"18727","Saudi Arabia","SAU","Millet and products","fabio" +"18728","Saudi Arabia","SAU","Sorghum and products","fabio" +"18729","Saudi Arabia","SAU","Cereals, Other","fabio" +"18730","Saudi Arabia","SAU","Potatoes and products","fabio" +"18731","Saudi Arabia","SAU","Cassava and products","fabio" +"18732","Saudi Arabia","SAU","Sweet potatoes","fabio" +"18733","Saudi Arabia","SAU","Roots, Other","fabio" +"18734","Saudi Arabia","SAU","Yams","fabio" +"18735","Saudi Arabia","SAU","Sugar cane","fabio" +"18736","Saudi Arabia","SAU","Sugar beet","fabio" +"18737","Saudi Arabia","SAU","Beans","fabio" +"18738","Saudi Arabia","SAU","Peas","fabio" +"18739","Saudi Arabia","SAU","Pulses, Other and products","fabio" +"18740","Saudi Arabia","SAU","Nuts and products","fabio" +"18741","Saudi Arabia","SAU","Soyabeans","fabio" +"18742","Saudi Arabia","SAU","Groundnuts (Shelled Eq)","fabio" +"18743","Saudi Arabia","SAU","Sunflower seed","fabio" +"18744","Saudi Arabia","SAU","Rape and Mustardseed","fabio" +"18745","Saudi Arabia","SAU","Seed cotton","fabio" +"18746","Saudi Arabia","SAU","Coconuts - Incl Copra","fabio" +"18747","Saudi Arabia","SAU","Sesame seed","fabio" +"18748","Saudi Arabia","SAU","Oil, palm fruit","fabio" +"18749","Saudi Arabia","SAU","Olives (including preserved)","fabio" +"18750","Saudi Arabia","SAU","Oilcrops, Other","fabio" +"18751","Saudi Arabia","SAU","Tomatoes and products","fabio" +"18752","Saudi Arabia","SAU","Onions","fabio" +"18753","Saudi Arabia","SAU","Vegetables, Other","fabio" +"18754","Saudi Arabia","SAU","Oranges, Mandarines","fabio" +"18755","Saudi Arabia","SAU","Lemons, Limes and products","fabio" +"18756","Saudi Arabia","SAU","Grapefruit and products","fabio" +"18757","Saudi Arabia","SAU","Citrus, Other","fabio" +"18758","Saudi Arabia","SAU","Bananas","fabio" +"18759","Saudi Arabia","SAU","Plantains","fabio" +"18760","Saudi Arabia","SAU","Apples and products","fabio" +"18761","Saudi Arabia","SAU","Pineapples and products","fabio" +"18762","Saudi Arabia","SAU","Dates","fabio" +"18763","Saudi Arabia","SAU","Grapes and products (excl wine)","fabio" +"18764","Saudi Arabia","SAU","Fruits, Other","fabio" +"18765","Saudi Arabia","SAU","Coffee and products","fabio" +"18766","Saudi Arabia","SAU","Cocoa Beans and products","fabio" +"18767","Saudi Arabia","SAU","Tea (including mate)","fabio" +"18768","Saudi Arabia","SAU","Hops","fabio" +"18769","Saudi Arabia","SAU","Pepper","fabio" +"18770","Saudi Arabia","SAU","Pimento","fabio" +"18771","Saudi Arabia","SAU","Cloves","fabio" +"18772","Saudi Arabia","SAU","Spices, Other","fabio" +"18773","Saudi Arabia","SAU","Jute","fabio" +"18774","Saudi Arabia","SAU","Jute-Like Fibres","fabio" +"18775","Saudi Arabia","SAU","Soft-Fibres, Other","fabio" +"18776","Saudi Arabia","SAU","Sisal","fabio" +"18777","Saudi Arabia","SAU","Abaca","fabio" +"18778","Saudi Arabia","SAU","Hard Fibres, Other","fabio" +"18779","Saudi Arabia","SAU","Tobacco","fabio" +"18780","Saudi Arabia","SAU","Rubber","fabio" +"18781","Saudi Arabia","SAU","Fodder crops","fabio" +"18782","Saudi Arabia","SAU","Grazing","fabio" +"18783","Saudi Arabia","SAU","Cottonseed","fabio" +"18784","Saudi Arabia","SAU","Palm kernels","fabio" +"18785","Saudi Arabia","SAU","Sugar non-centrifugal","fabio" +"18786","Saudi Arabia","SAU","Molasses","fabio" +"18787","Saudi Arabia","SAU","Sugar, Refined Equiv","fabio" +"18788","Saudi Arabia","SAU","Sweeteners, Other","fabio" +"18789","Saudi Arabia","SAU","Soyabean Oil","fabio" +"18790","Saudi Arabia","SAU","Groundnut Oil","fabio" +"18791","Saudi Arabia","SAU","Sunflowerseed Oil","fabio" +"18792","Saudi Arabia","SAU","Rape and Mustard Oil","fabio" +"18793","Saudi Arabia","SAU","Cottonseed Oil","fabio" +"18794","Saudi Arabia","SAU","Palmkernel Oil","fabio" +"18795","Saudi Arabia","SAU","Palm Oil","fabio" +"18796","Saudi Arabia","SAU","Coconut Oil","fabio" +"18797","Saudi Arabia","SAU","Sesameseed Oil","fabio" +"18798","Saudi Arabia","SAU","Olive Oil","fabio" +"18799","Saudi Arabia","SAU","Ricebran Oil","fabio" +"18800","Saudi Arabia","SAU","Maize Germ Oil","fabio" +"18801","Saudi Arabia","SAU","Oilcrops Oil, Other","fabio" +"18802","Saudi Arabia","SAU","Soyabean Cake","fabio" +"18803","Saudi Arabia","SAU","Groundnut Cake","fabio" +"18804","Saudi Arabia","SAU","Sunflowerseed Cake","fabio" +"18805","Saudi Arabia","SAU","Rape and Mustard Cake","fabio" +"18806","Saudi Arabia","SAU","Cottonseed Cake","fabio" +"18807","Saudi Arabia","SAU","Palmkernel Cake","fabio" +"18808","Saudi Arabia","SAU","Copra Cake","fabio" +"18809","Saudi Arabia","SAU","Sesameseed Cake","fabio" +"18810","Saudi Arabia","SAU","Oilseed Cakes, Other","fabio" +"18811","Saudi Arabia","SAU","Wine","fabio" +"18812","Saudi Arabia","SAU","Beer","fabio" +"18813","Saudi Arabia","SAU","Beverages, Fermented","fabio" +"18814","Saudi Arabia","SAU","Beverages, Alcoholic","fabio" +"18815","Saudi Arabia","SAU","Alcohol, Non-Food","fabio" +"18816","Saudi Arabia","SAU","Cotton lint","fabio" +"18817","Saudi Arabia","SAU","Cattle","fabio" +"18818","Saudi Arabia","SAU","Buffaloes","fabio" +"18819","Saudi Arabia","SAU","Sheep","fabio" +"18820","Saudi Arabia","SAU","Goats","fabio" +"18821","Saudi Arabia","SAU","Pigs","fabio" +"18822","Saudi Arabia","SAU","Poultry Birds","fabio" +"18823","Saudi Arabia","SAU","Horses","fabio" +"18824","Saudi Arabia","SAU","Asses","fabio" +"18825","Saudi Arabia","SAU","Mules","fabio" +"18826","Saudi Arabia","SAU","Camels","fabio" +"18827","Saudi Arabia","SAU","Camelids, other","fabio" +"18828","Saudi Arabia","SAU","Rabbits and hares","fabio" +"18829","Saudi Arabia","SAU","Rodents, other","fabio" +"18830","Saudi Arabia","SAU","Live animals, other","fabio" +"18831","Saudi Arabia","SAU","Milk - Excluding Butter","fabio" +"18832","Saudi Arabia","SAU","Butter, Ghee","fabio" +"18833","Saudi Arabia","SAU","Eggs","fabio" +"18834","Saudi Arabia","SAU","Wool (Clean Eq.)","fabio" +"18835","Saudi Arabia","SAU","Bovine Meat","fabio" +"18836","Saudi Arabia","SAU","Mutton & Goat Meat","fabio" +"18837","Saudi Arabia","SAU","Pigmeat","fabio" +"18838","Saudi Arabia","SAU","Poultry Meat","fabio" +"18839","Saudi Arabia","SAU","Meat, Other","fabio" +"18840","Saudi Arabia","SAU","Offals, Edible","fabio" +"18841","Saudi Arabia","SAU","Fats, Animals, Raw","fabio" +"18842","Saudi Arabia","SAU","Hides and skins","fabio" +"18843","Saudi Arabia","SAU","Meat Meal","fabio" +"18844","Saudi Arabia","SAU","Pet food","fabio" +"18845","Saudi Arabia","SAU","Honey","fabio" +"18846","Saudi Arabia","SAU","Silk","fabio" +"18847","Saudi Arabia","SAU","Fish, Seafood","fabio" +"18848","Saudi Arabia","SAU","Wood fuel","fabio" +"18849","Saudi Arabia","SAU","Industrial roundwood, coniferous","fabio" +"18850","Saudi Arabia","SAU","Industrial roundwood, non-coniferous","fabio" +"18851","Senegal","SEN","Rice (Milled Equivalent)","fabio" +"18852","Senegal","SEN","Wheat and products","fabio" +"18853","Senegal","SEN","Barley and products","fabio" +"18854","Senegal","SEN","Maize and products","fabio" +"18855","Senegal","SEN","Rye and products","fabio" +"18856","Senegal","SEN","Oats","fabio" +"18857","Senegal","SEN","Millet and products","fabio" +"18858","Senegal","SEN","Sorghum and products","fabio" +"18859","Senegal","SEN","Cereals, Other","fabio" +"18860","Senegal","SEN","Potatoes and products","fabio" +"18861","Senegal","SEN","Cassava and products","fabio" +"18862","Senegal","SEN","Sweet potatoes","fabio" +"18863","Senegal","SEN","Roots, Other","fabio" +"18864","Senegal","SEN","Yams","fabio" +"18865","Senegal","SEN","Sugar cane","fabio" +"18866","Senegal","SEN","Sugar beet","fabio" +"18867","Senegal","SEN","Beans","fabio" +"18868","Senegal","SEN","Peas","fabio" +"18869","Senegal","SEN","Pulses, Other and products","fabio" +"18870","Senegal","SEN","Nuts and products","fabio" +"18871","Senegal","SEN","Soyabeans","fabio" +"18872","Senegal","SEN","Groundnuts (Shelled Eq)","fabio" +"18873","Senegal","SEN","Sunflower seed","fabio" +"18874","Senegal","SEN","Rape and Mustardseed","fabio" +"18875","Senegal","SEN","Seed cotton","fabio" +"18876","Senegal","SEN","Coconuts - Incl Copra","fabio" +"18877","Senegal","SEN","Sesame seed","fabio" +"18878","Senegal","SEN","Oil, palm fruit","fabio" +"18879","Senegal","SEN","Olives (including preserved)","fabio" +"18880","Senegal","SEN","Oilcrops, Other","fabio" +"18881","Senegal","SEN","Tomatoes and products","fabio" +"18882","Senegal","SEN","Onions","fabio" +"18883","Senegal","SEN","Vegetables, Other","fabio" +"18884","Senegal","SEN","Oranges, Mandarines","fabio" +"18885","Senegal","SEN","Lemons, Limes and products","fabio" +"18886","Senegal","SEN","Grapefruit and products","fabio" +"18887","Senegal","SEN","Citrus, Other","fabio" +"18888","Senegal","SEN","Bananas","fabio" +"18889","Senegal","SEN","Plantains","fabio" +"18890","Senegal","SEN","Apples and products","fabio" +"18891","Senegal","SEN","Pineapples and products","fabio" +"18892","Senegal","SEN","Dates","fabio" +"18893","Senegal","SEN","Grapes and products (excl wine)","fabio" +"18894","Senegal","SEN","Fruits, Other","fabio" +"18895","Senegal","SEN","Coffee and products","fabio" +"18896","Senegal","SEN","Cocoa Beans and products","fabio" +"18897","Senegal","SEN","Tea (including mate)","fabio" +"18898","Senegal","SEN","Hops","fabio" +"18899","Senegal","SEN","Pepper","fabio" +"18900","Senegal","SEN","Pimento","fabio" +"18901","Senegal","SEN","Cloves","fabio" +"18902","Senegal","SEN","Spices, Other","fabio" +"18903","Senegal","SEN","Jute","fabio" +"18904","Senegal","SEN","Jute-Like Fibres","fabio" +"18905","Senegal","SEN","Soft-Fibres, Other","fabio" +"18906","Senegal","SEN","Sisal","fabio" +"18907","Senegal","SEN","Abaca","fabio" +"18908","Senegal","SEN","Hard Fibres, Other","fabio" +"18909","Senegal","SEN","Tobacco","fabio" +"18910","Senegal","SEN","Rubber","fabio" +"18911","Senegal","SEN","Fodder crops","fabio" +"18912","Senegal","SEN","Grazing","fabio" +"18913","Senegal","SEN","Cottonseed","fabio" +"18914","Senegal","SEN","Palm kernels","fabio" +"18915","Senegal","SEN","Sugar non-centrifugal","fabio" +"18916","Senegal","SEN","Molasses","fabio" +"18917","Senegal","SEN","Sugar, Refined Equiv","fabio" +"18918","Senegal","SEN","Sweeteners, Other","fabio" +"18919","Senegal","SEN","Soyabean Oil","fabio" +"18920","Senegal","SEN","Groundnut Oil","fabio" +"18921","Senegal","SEN","Sunflowerseed Oil","fabio" +"18922","Senegal","SEN","Rape and Mustard Oil","fabio" +"18923","Senegal","SEN","Cottonseed Oil","fabio" +"18924","Senegal","SEN","Palmkernel Oil","fabio" +"18925","Senegal","SEN","Palm Oil","fabio" +"18926","Senegal","SEN","Coconut Oil","fabio" +"18927","Senegal","SEN","Sesameseed Oil","fabio" +"18928","Senegal","SEN","Olive Oil","fabio" +"18929","Senegal","SEN","Ricebran Oil","fabio" +"18930","Senegal","SEN","Maize Germ Oil","fabio" +"18931","Senegal","SEN","Oilcrops Oil, Other","fabio" +"18932","Senegal","SEN","Soyabean Cake","fabio" +"18933","Senegal","SEN","Groundnut Cake","fabio" +"18934","Senegal","SEN","Sunflowerseed Cake","fabio" +"18935","Senegal","SEN","Rape and Mustard Cake","fabio" +"18936","Senegal","SEN","Cottonseed Cake","fabio" +"18937","Senegal","SEN","Palmkernel Cake","fabio" +"18938","Senegal","SEN","Copra Cake","fabio" +"18939","Senegal","SEN","Sesameseed Cake","fabio" +"18940","Senegal","SEN","Oilseed Cakes, Other","fabio" +"18941","Senegal","SEN","Wine","fabio" +"18942","Senegal","SEN","Beer","fabio" +"18943","Senegal","SEN","Beverages, Fermented","fabio" +"18944","Senegal","SEN","Beverages, Alcoholic","fabio" +"18945","Senegal","SEN","Alcohol, Non-Food","fabio" +"18946","Senegal","SEN","Cotton lint","fabio" +"18947","Senegal","SEN","Cattle","fabio" +"18948","Senegal","SEN","Buffaloes","fabio" +"18949","Senegal","SEN","Sheep","fabio" +"18950","Senegal","SEN","Goats","fabio" +"18951","Senegal","SEN","Pigs","fabio" +"18952","Senegal","SEN","Poultry Birds","fabio" +"18953","Senegal","SEN","Horses","fabio" +"18954","Senegal","SEN","Asses","fabio" +"18955","Senegal","SEN","Mules","fabio" +"18956","Senegal","SEN","Camels","fabio" +"18957","Senegal","SEN","Camelids, other","fabio" +"18958","Senegal","SEN","Rabbits and hares","fabio" +"18959","Senegal","SEN","Rodents, other","fabio" +"18960","Senegal","SEN","Live animals, other","fabio" +"18961","Senegal","SEN","Milk - Excluding Butter","fabio" +"18962","Senegal","SEN","Butter, Ghee","fabio" +"18963","Senegal","SEN","Eggs","fabio" +"18964","Senegal","SEN","Wool (Clean Eq.)","fabio" +"18965","Senegal","SEN","Bovine Meat","fabio" +"18966","Senegal","SEN","Mutton & Goat Meat","fabio" +"18967","Senegal","SEN","Pigmeat","fabio" +"18968","Senegal","SEN","Poultry Meat","fabio" +"18969","Senegal","SEN","Meat, Other","fabio" +"18970","Senegal","SEN","Offals, Edible","fabio" +"18971","Senegal","SEN","Fats, Animals, Raw","fabio" +"18972","Senegal","SEN","Hides and skins","fabio" +"18973","Senegal","SEN","Meat Meal","fabio" +"18974","Senegal","SEN","Pet food","fabio" +"18975","Senegal","SEN","Honey","fabio" +"18976","Senegal","SEN","Silk","fabio" +"18977","Senegal","SEN","Fish, Seafood","fabio" +"18978","Senegal","SEN","Wood fuel","fabio" +"18979","Senegal","SEN","Industrial roundwood, coniferous","fabio" +"18980","Senegal","SEN","Industrial roundwood, non-coniferous","fabio" +"18981","Sierra Leone","SLE","Rice (Milled Equivalent)","fabio" +"18982","Sierra Leone","SLE","Wheat and products","fabio" +"18983","Sierra Leone","SLE","Barley and products","fabio" +"18984","Sierra Leone","SLE","Maize and products","fabio" +"18985","Sierra Leone","SLE","Rye and products","fabio" +"18986","Sierra Leone","SLE","Oats","fabio" +"18987","Sierra Leone","SLE","Millet and products","fabio" +"18988","Sierra Leone","SLE","Sorghum and products","fabio" +"18989","Sierra Leone","SLE","Cereals, Other","fabio" +"18990","Sierra Leone","SLE","Potatoes and products","fabio" +"18991","Sierra Leone","SLE","Cassava and products","fabio" +"18992","Sierra Leone","SLE","Sweet potatoes","fabio" +"18993","Sierra Leone","SLE","Roots, Other","fabio" +"18994","Sierra Leone","SLE","Yams","fabio" +"18995","Sierra Leone","SLE","Sugar cane","fabio" +"18996","Sierra Leone","SLE","Sugar beet","fabio" +"18997","Sierra Leone","SLE","Beans","fabio" +"18998","Sierra Leone","SLE","Peas","fabio" +"18999","Sierra Leone","SLE","Pulses, Other and products","fabio" +"19000","Sierra Leone","SLE","Nuts and products","fabio" +"19001","Sierra Leone","SLE","Soyabeans","fabio" +"19002","Sierra Leone","SLE","Groundnuts (Shelled Eq)","fabio" +"19003","Sierra Leone","SLE","Sunflower seed","fabio" +"19004","Sierra Leone","SLE","Rape and Mustardseed","fabio" +"19005","Sierra Leone","SLE","Seed cotton","fabio" +"19006","Sierra Leone","SLE","Coconuts - Incl Copra","fabio" +"19007","Sierra Leone","SLE","Sesame seed","fabio" +"19008","Sierra Leone","SLE","Oil, palm fruit","fabio" +"19009","Sierra Leone","SLE","Olives (including preserved)","fabio" +"19010","Sierra Leone","SLE","Oilcrops, Other","fabio" +"19011","Sierra Leone","SLE","Tomatoes and products","fabio" +"19012","Sierra Leone","SLE","Onions","fabio" +"19013","Sierra Leone","SLE","Vegetables, Other","fabio" +"19014","Sierra Leone","SLE","Oranges, Mandarines","fabio" +"19015","Sierra Leone","SLE","Lemons, Limes and products","fabio" +"19016","Sierra Leone","SLE","Grapefruit and products","fabio" +"19017","Sierra Leone","SLE","Citrus, Other","fabio" +"19018","Sierra Leone","SLE","Bananas","fabio" +"19019","Sierra Leone","SLE","Plantains","fabio" +"19020","Sierra Leone","SLE","Apples and products","fabio" +"19021","Sierra Leone","SLE","Pineapples and products","fabio" +"19022","Sierra Leone","SLE","Dates","fabio" +"19023","Sierra Leone","SLE","Grapes and products (excl wine)","fabio" +"19024","Sierra Leone","SLE","Fruits, Other","fabio" +"19025","Sierra Leone","SLE","Coffee and products","fabio" +"19026","Sierra Leone","SLE","Cocoa Beans and products","fabio" +"19027","Sierra Leone","SLE","Tea (including mate)","fabio" +"19028","Sierra Leone","SLE","Hops","fabio" +"19029","Sierra Leone","SLE","Pepper","fabio" +"19030","Sierra Leone","SLE","Pimento","fabio" +"19031","Sierra Leone","SLE","Cloves","fabio" +"19032","Sierra Leone","SLE","Spices, Other","fabio" +"19033","Sierra Leone","SLE","Jute","fabio" +"19034","Sierra Leone","SLE","Jute-Like Fibres","fabio" +"19035","Sierra Leone","SLE","Soft-Fibres, Other","fabio" +"19036","Sierra Leone","SLE","Sisal","fabio" +"19037","Sierra Leone","SLE","Abaca","fabio" +"19038","Sierra Leone","SLE","Hard Fibres, Other","fabio" +"19039","Sierra Leone","SLE","Tobacco","fabio" +"19040","Sierra Leone","SLE","Rubber","fabio" +"19041","Sierra Leone","SLE","Fodder crops","fabio" +"19042","Sierra Leone","SLE","Grazing","fabio" +"19043","Sierra Leone","SLE","Cottonseed","fabio" +"19044","Sierra Leone","SLE","Palm kernels","fabio" +"19045","Sierra Leone","SLE","Sugar non-centrifugal","fabio" +"19046","Sierra Leone","SLE","Molasses","fabio" +"19047","Sierra Leone","SLE","Sugar, Refined Equiv","fabio" +"19048","Sierra Leone","SLE","Sweeteners, Other","fabio" +"19049","Sierra Leone","SLE","Soyabean Oil","fabio" +"19050","Sierra Leone","SLE","Groundnut Oil","fabio" +"19051","Sierra Leone","SLE","Sunflowerseed Oil","fabio" +"19052","Sierra Leone","SLE","Rape and Mustard Oil","fabio" +"19053","Sierra Leone","SLE","Cottonseed Oil","fabio" +"19054","Sierra Leone","SLE","Palmkernel Oil","fabio" +"19055","Sierra Leone","SLE","Palm Oil","fabio" +"19056","Sierra Leone","SLE","Coconut Oil","fabio" +"19057","Sierra Leone","SLE","Sesameseed Oil","fabio" +"19058","Sierra Leone","SLE","Olive Oil","fabio" +"19059","Sierra Leone","SLE","Ricebran Oil","fabio" +"19060","Sierra Leone","SLE","Maize Germ Oil","fabio" +"19061","Sierra Leone","SLE","Oilcrops Oil, Other","fabio" +"19062","Sierra Leone","SLE","Soyabean Cake","fabio" +"19063","Sierra Leone","SLE","Groundnut Cake","fabio" +"19064","Sierra Leone","SLE","Sunflowerseed Cake","fabio" +"19065","Sierra Leone","SLE","Rape and Mustard Cake","fabio" +"19066","Sierra Leone","SLE","Cottonseed Cake","fabio" +"19067","Sierra Leone","SLE","Palmkernel Cake","fabio" +"19068","Sierra Leone","SLE","Copra Cake","fabio" +"19069","Sierra Leone","SLE","Sesameseed Cake","fabio" +"19070","Sierra Leone","SLE","Oilseed Cakes, Other","fabio" +"19071","Sierra Leone","SLE","Wine","fabio" +"19072","Sierra Leone","SLE","Beer","fabio" +"19073","Sierra Leone","SLE","Beverages, Fermented","fabio" +"19074","Sierra Leone","SLE","Beverages, Alcoholic","fabio" +"19075","Sierra Leone","SLE","Alcohol, Non-Food","fabio" +"19076","Sierra Leone","SLE","Cotton lint","fabio" +"19077","Sierra Leone","SLE","Cattle","fabio" +"19078","Sierra Leone","SLE","Buffaloes","fabio" +"19079","Sierra Leone","SLE","Sheep","fabio" +"19080","Sierra Leone","SLE","Goats","fabio" +"19081","Sierra Leone","SLE","Pigs","fabio" +"19082","Sierra Leone","SLE","Poultry Birds","fabio" +"19083","Sierra Leone","SLE","Horses","fabio" +"19084","Sierra Leone","SLE","Asses","fabio" +"19085","Sierra Leone","SLE","Mules","fabio" +"19086","Sierra Leone","SLE","Camels","fabio" +"19087","Sierra Leone","SLE","Camelids, other","fabio" +"19088","Sierra Leone","SLE","Rabbits and hares","fabio" +"19089","Sierra Leone","SLE","Rodents, other","fabio" +"19090","Sierra Leone","SLE","Live animals, other","fabio" +"19091","Sierra Leone","SLE","Milk - Excluding Butter","fabio" +"19092","Sierra Leone","SLE","Butter, Ghee","fabio" +"19093","Sierra Leone","SLE","Eggs","fabio" +"19094","Sierra Leone","SLE","Wool (Clean Eq.)","fabio" +"19095","Sierra Leone","SLE","Bovine Meat","fabio" +"19096","Sierra Leone","SLE","Mutton & Goat Meat","fabio" +"19097","Sierra Leone","SLE","Pigmeat","fabio" +"19098","Sierra Leone","SLE","Poultry Meat","fabio" +"19099","Sierra Leone","SLE","Meat, Other","fabio" +"19100","Sierra Leone","SLE","Offals, Edible","fabio" +"19101","Sierra Leone","SLE","Fats, Animals, Raw","fabio" +"19102","Sierra Leone","SLE","Hides and skins","fabio" +"19103","Sierra Leone","SLE","Meat Meal","fabio" +"19104","Sierra Leone","SLE","Pet food","fabio" +"19105","Sierra Leone","SLE","Honey","fabio" +"19106","Sierra Leone","SLE","Silk","fabio" +"19107","Sierra Leone","SLE","Fish, Seafood","fabio" +"19108","Sierra Leone","SLE","Wood fuel","fabio" +"19109","Sierra Leone","SLE","Industrial roundwood, coniferous","fabio" +"19110","Sierra Leone","SLE","Industrial roundwood, non-coniferous","fabio" +"19111","Slovenia","SVN","Rice (Milled Equivalent)","fabio" +"19112","Slovenia","SVN","Wheat and products","fabio" +"19113","Slovenia","SVN","Barley and products","fabio" +"19114","Slovenia","SVN","Maize and products","fabio" +"19115","Slovenia","SVN","Rye and products","fabio" +"19116","Slovenia","SVN","Oats","fabio" +"19117","Slovenia","SVN","Millet and products","fabio" +"19118","Slovenia","SVN","Sorghum and products","fabio" +"19119","Slovenia","SVN","Cereals, Other","fabio" +"19120","Slovenia","SVN","Potatoes and products","fabio" +"19121","Slovenia","SVN","Cassava and products","fabio" +"19122","Slovenia","SVN","Sweet potatoes","fabio" +"19123","Slovenia","SVN","Roots, Other","fabio" +"19124","Slovenia","SVN","Yams","fabio" +"19125","Slovenia","SVN","Sugar cane","fabio" +"19126","Slovenia","SVN","Sugar beet","fabio" +"19127","Slovenia","SVN","Beans","fabio" +"19128","Slovenia","SVN","Peas","fabio" +"19129","Slovenia","SVN","Pulses, Other and products","fabio" +"19130","Slovenia","SVN","Nuts and products","fabio" +"19131","Slovenia","SVN","Soyabeans","fabio" +"19132","Slovenia","SVN","Groundnuts (Shelled Eq)","fabio" +"19133","Slovenia","SVN","Sunflower seed","fabio" +"19134","Slovenia","SVN","Rape and Mustardseed","fabio" +"19135","Slovenia","SVN","Seed cotton","fabio" +"19136","Slovenia","SVN","Coconuts - Incl Copra","fabio" +"19137","Slovenia","SVN","Sesame seed","fabio" +"19138","Slovenia","SVN","Oil, palm fruit","fabio" +"19139","Slovenia","SVN","Olives (including preserved)","fabio" +"19140","Slovenia","SVN","Oilcrops, Other","fabio" +"19141","Slovenia","SVN","Tomatoes and products","fabio" +"19142","Slovenia","SVN","Onions","fabio" +"19143","Slovenia","SVN","Vegetables, Other","fabio" +"19144","Slovenia","SVN","Oranges, Mandarines","fabio" +"19145","Slovenia","SVN","Lemons, Limes and products","fabio" +"19146","Slovenia","SVN","Grapefruit and products","fabio" +"19147","Slovenia","SVN","Citrus, Other","fabio" +"19148","Slovenia","SVN","Bananas","fabio" +"19149","Slovenia","SVN","Plantains","fabio" +"19150","Slovenia","SVN","Apples and products","fabio" +"19151","Slovenia","SVN","Pineapples and products","fabio" +"19152","Slovenia","SVN","Dates","fabio" +"19153","Slovenia","SVN","Grapes and products (excl wine)","fabio" +"19154","Slovenia","SVN","Fruits, Other","fabio" +"19155","Slovenia","SVN","Coffee and products","fabio" +"19156","Slovenia","SVN","Cocoa Beans and products","fabio" +"19157","Slovenia","SVN","Tea (including mate)","fabio" +"19158","Slovenia","SVN","Hops","fabio" +"19159","Slovenia","SVN","Pepper","fabio" +"19160","Slovenia","SVN","Pimento","fabio" +"19161","Slovenia","SVN","Cloves","fabio" +"19162","Slovenia","SVN","Spices, Other","fabio" +"19163","Slovenia","SVN","Jute","fabio" +"19164","Slovenia","SVN","Jute-Like Fibres","fabio" +"19165","Slovenia","SVN","Soft-Fibres, Other","fabio" +"19166","Slovenia","SVN","Sisal","fabio" +"19167","Slovenia","SVN","Abaca","fabio" +"19168","Slovenia","SVN","Hard Fibres, Other","fabio" +"19169","Slovenia","SVN","Tobacco","fabio" +"19170","Slovenia","SVN","Rubber","fabio" +"19171","Slovenia","SVN","Fodder crops","fabio" +"19172","Slovenia","SVN","Grazing","fabio" +"19173","Slovenia","SVN","Cottonseed","fabio" +"19174","Slovenia","SVN","Palm kernels","fabio" +"19175","Slovenia","SVN","Sugar non-centrifugal","fabio" +"19176","Slovenia","SVN","Molasses","fabio" +"19177","Slovenia","SVN","Sugar, Refined Equiv","fabio" +"19178","Slovenia","SVN","Sweeteners, Other","fabio" +"19179","Slovenia","SVN","Soyabean Oil","fabio" +"19180","Slovenia","SVN","Groundnut Oil","fabio" +"19181","Slovenia","SVN","Sunflowerseed Oil","fabio" +"19182","Slovenia","SVN","Rape and Mustard Oil","fabio" +"19183","Slovenia","SVN","Cottonseed Oil","fabio" +"19184","Slovenia","SVN","Palmkernel Oil","fabio" +"19185","Slovenia","SVN","Palm Oil","fabio" +"19186","Slovenia","SVN","Coconut Oil","fabio" +"19187","Slovenia","SVN","Sesameseed Oil","fabio" +"19188","Slovenia","SVN","Olive Oil","fabio" +"19189","Slovenia","SVN","Ricebran Oil","fabio" +"19190","Slovenia","SVN","Maize Germ Oil","fabio" +"19191","Slovenia","SVN","Oilcrops Oil, Other","fabio" +"19192","Slovenia","SVN","Soyabean Cake","fabio" +"19193","Slovenia","SVN","Groundnut Cake","fabio" +"19194","Slovenia","SVN","Sunflowerseed Cake","fabio" +"19195","Slovenia","SVN","Rape and Mustard Cake","fabio" +"19196","Slovenia","SVN","Cottonseed Cake","fabio" +"19197","Slovenia","SVN","Palmkernel Cake","fabio" +"19198","Slovenia","SVN","Copra Cake","fabio" +"19199","Slovenia","SVN","Sesameseed Cake","fabio" +"19200","Slovenia","SVN","Oilseed Cakes, Other","fabio" +"19201","Slovenia","SVN","Wine","fabio" +"19202","Slovenia","SVN","Beer","fabio" +"19203","Slovenia","SVN","Beverages, Fermented","fabio" +"19204","Slovenia","SVN","Beverages, Alcoholic","fabio" +"19205","Slovenia","SVN","Alcohol, Non-Food","fabio" +"19206","Slovenia","SVN","Cotton lint","fabio" +"19207","Slovenia","SVN","Cattle","fabio" +"19208","Slovenia","SVN","Buffaloes","fabio" +"19209","Slovenia","SVN","Sheep","fabio" +"19210","Slovenia","SVN","Goats","fabio" +"19211","Slovenia","SVN","Pigs","fabio" +"19212","Slovenia","SVN","Poultry Birds","fabio" +"19213","Slovenia","SVN","Horses","fabio" +"19214","Slovenia","SVN","Asses","fabio" +"19215","Slovenia","SVN","Mules","fabio" +"19216","Slovenia","SVN","Camels","fabio" +"19217","Slovenia","SVN","Camelids, other","fabio" +"19218","Slovenia","SVN","Rabbits and hares","fabio" +"19219","Slovenia","SVN","Rodents, other","fabio" +"19220","Slovenia","SVN","Live animals, other","fabio" +"19221","Slovenia","SVN","Milk - Excluding Butter","fabio" +"19222","Slovenia","SVN","Butter, Ghee","fabio" +"19223","Slovenia","SVN","Eggs","fabio" +"19224","Slovenia","SVN","Wool (Clean Eq.)","fabio" +"19225","Slovenia","SVN","Bovine Meat","fabio" +"19226","Slovenia","SVN","Mutton & Goat Meat","fabio" +"19227","Slovenia","SVN","Pigmeat","fabio" +"19228","Slovenia","SVN","Poultry Meat","fabio" +"19229","Slovenia","SVN","Meat, Other","fabio" +"19230","Slovenia","SVN","Offals, Edible","fabio" +"19231","Slovenia","SVN","Fats, Animals, Raw","fabio" +"19232","Slovenia","SVN","Hides and skins","fabio" +"19233","Slovenia","SVN","Meat Meal","fabio" +"19234","Slovenia","SVN","Pet food","fabio" +"19235","Slovenia","SVN","Honey","fabio" +"19236","Slovenia","SVN","Silk","fabio" +"19237","Slovenia","SVN","Fish, Seafood","fabio" +"19238","Slovenia","SVN","Wood fuel","fabio" +"19239","Slovenia","SVN","Industrial roundwood, coniferous","fabio" +"19240","Slovenia","SVN","Industrial roundwood, non-coniferous","fabio" +"19241","Slovakia","SVK","Rice (Milled Equivalent)","fabio" +"19242","Slovakia","SVK","Wheat and products","fabio" +"19243","Slovakia","SVK","Barley and products","fabio" +"19244","Slovakia","SVK","Maize and products","fabio" +"19245","Slovakia","SVK","Rye and products","fabio" +"19246","Slovakia","SVK","Oats","fabio" +"19247","Slovakia","SVK","Millet and products","fabio" +"19248","Slovakia","SVK","Sorghum and products","fabio" +"19249","Slovakia","SVK","Cereals, Other","fabio" +"19250","Slovakia","SVK","Potatoes and products","fabio" +"19251","Slovakia","SVK","Cassava and products","fabio" +"19252","Slovakia","SVK","Sweet potatoes","fabio" +"19253","Slovakia","SVK","Roots, Other","fabio" +"19254","Slovakia","SVK","Yams","fabio" +"19255","Slovakia","SVK","Sugar cane","fabio" +"19256","Slovakia","SVK","Sugar beet","fabio" +"19257","Slovakia","SVK","Beans","fabio" +"19258","Slovakia","SVK","Peas","fabio" +"19259","Slovakia","SVK","Pulses, Other and products","fabio" +"19260","Slovakia","SVK","Nuts and products","fabio" +"19261","Slovakia","SVK","Soyabeans","fabio" +"19262","Slovakia","SVK","Groundnuts (Shelled Eq)","fabio" +"19263","Slovakia","SVK","Sunflower seed","fabio" +"19264","Slovakia","SVK","Rape and Mustardseed","fabio" +"19265","Slovakia","SVK","Seed cotton","fabio" +"19266","Slovakia","SVK","Coconuts - Incl Copra","fabio" +"19267","Slovakia","SVK","Sesame seed","fabio" +"19268","Slovakia","SVK","Oil, palm fruit","fabio" +"19269","Slovakia","SVK","Olives (including preserved)","fabio" +"19270","Slovakia","SVK","Oilcrops, Other","fabio" +"19271","Slovakia","SVK","Tomatoes and products","fabio" +"19272","Slovakia","SVK","Onions","fabio" +"19273","Slovakia","SVK","Vegetables, Other","fabio" +"19274","Slovakia","SVK","Oranges, Mandarines","fabio" +"19275","Slovakia","SVK","Lemons, Limes and products","fabio" +"19276","Slovakia","SVK","Grapefruit and products","fabio" +"19277","Slovakia","SVK","Citrus, Other","fabio" +"19278","Slovakia","SVK","Bananas","fabio" +"19279","Slovakia","SVK","Plantains","fabio" +"19280","Slovakia","SVK","Apples and products","fabio" +"19281","Slovakia","SVK","Pineapples and products","fabio" +"19282","Slovakia","SVK","Dates","fabio" +"19283","Slovakia","SVK","Grapes and products (excl wine)","fabio" +"19284","Slovakia","SVK","Fruits, Other","fabio" +"19285","Slovakia","SVK","Coffee and products","fabio" +"19286","Slovakia","SVK","Cocoa Beans and products","fabio" +"19287","Slovakia","SVK","Tea (including mate)","fabio" +"19288","Slovakia","SVK","Hops","fabio" +"19289","Slovakia","SVK","Pepper","fabio" +"19290","Slovakia","SVK","Pimento","fabio" +"19291","Slovakia","SVK","Cloves","fabio" +"19292","Slovakia","SVK","Spices, Other","fabio" +"19293","Slovakia","SVK","Jute","fabio" +"19294","Slovakia","SVK","Jute-Like Fibres","fabio" +"19295","Slovakia","SVK","Soft-Fibres, Other","fabio" +"19296","Slovakia","SVK","Sisal","fabio" +"19297","Slovakia","SVK","Abaca","fabio" +"19298","Slovakia","SVK","Hard Fibres, Other","fabio" +"19299","Slovakia","SVK","Tobacco","fabio" +"19300","Slovakia","SVK","Rubber","fabio" +"19301","Slovakia","SVK","Fodder crops","fabio" +"19302","Slovakia","SVK","Grazing","fabio" +"19303","Slovakia","SVK","Cottonseed","fabio" +"19304","Slovakia","SVK","Palm kernels","fabio" +"19305","Slovakia","SVK","Sugar non-centrifugal","fabio" +"19306","Slovakia","SVK","Molasses","fabio" +"19307","Slovakia","SVK","Sugar, Refined Equiv","fabio" +"19308","Slovakia","SVK","Sweeteners, Other","fabio" +"19309","Slovakia","SVK","Soyabean Oil","fabio" +"19310","Slovakia","SVK","Groundnut Oil","fabio" +"19311","Slovakia","SVK","Sunflowerseed Oil","fabio" +"19312","Slovakia","SVK","Rape and Mustard Oil","fabio" +"19313","Slovakia","SVK","Cottonseed Oil","fabio" +"19314","Slovakia","SVK","Palmkernel Oil","fabio" +"19315","Slovakia","SVK","Palm Oil","fabio" +"19316","Slovakia","SVK","Coconut Oil","fabio" +"19317","Slovakia","SVK","Sesameseed Oil","fabio" +"19318","Slovakia","SVK","Olive Oil","fabio" +"19319","Slovakia","SVK","Ricebran Oil","fabio" +"19320","Slovakia","SVK","Maize Germ Oil","fabio" +"19321","Slovakia","SVK","Oilcrops Oil, Other","fabio" +"19322","Slovakia","SVK","Soyabean Cake","fabio" +"19323","Slovakia","SVK","Groundnut Cake","fabio" +"19324","Slovakia","SVK","Sunflowerseed Cake","fabio" +"19325","Slovakia","SVK","Rape and Mustard Cake","fabio" +"19326","Slovakia","SVK","Cottonseed Cake","fabio" +"19327","Slovakia","SVK","Palmkernel Cake","fabio" +"19328","Slovakia","SVK","Copra Cake","fabio" +"19329","Slovakia","SVK","Sesameseed Cake","fabio" +"19330","Slovakia","SVK","Oilseed Cakes, Other","fabio" +"19331","Slovakia","SVK","Wine","fabio" +"19332","Slovakia","SVK","Beer","fabio" +"19333","Slovakia","SVK","Beverages, Fermented","fabio" +"19334","Slovakia","SVK","Beverages, Alcoholic","fabio" +"19335","Slovakia","SVK","Alcohol, Non-Food","fabio" +"19336","Slovakia","SVK","Cotton lint","fabio" +"19337","Slovakia","SVK","Cattle","fabio" +"19338","Slovakia","SVK","Buffaloes","fabio" +"19339","Slovakia","SVK","Sheep","fabio" +"19340","Slovakia","SVK","Goats","fabio" +"19341","Slovakia","SVK","Pigs","fabio" +"19342","Slovakia","SVK","Poultry Birds","fabio" +"19343","Slovakia","SVK","Horses","fabio" +"19344","Slovakia","SVK","Asses","fabio" +"19345","Slovakia","SVK","Mules","fabio" +"19346","Slovakia","SVK","Camels","fabio" +"19347","Slovakia","SVK","Camelids, other","fabio" +"19348","Slovakia","SVK","Rabbits and hares","fabio" +"19349","Slovakia","SVK","Rodents, other","fabio" +"19350","Slovakia","SVK","Live animals, other","fabio" +"19351","Slovakia","SVK","Milk - Excluding Butter","fabio" +"19352","Slovakia","SVK","Butter, Ghee","fabio" +"19353","Slovakia","SVK","Eggs","fabio" +"19354","Slovakia","SVK","Wool (Clean Eq.)","fabio" +"19355","Slovakia","SVK","Bovine Meat","fabio" +"19356","Slovakia","SVK","Mutton & Goat Meat","fabio" +"19357","Slovakia","SVK","Pigmeat","fabio" +"19358","Slovakia","SVK","Poultry Meat","fabio" +"19359","Slovakia","SVK","Meat, Other","fabio" +"19360","Slovakia","SVK","Offals, Edible","fabio" +"19361","Slovakia","SVK","Fats, Animals, Raw","fabio" +"19362","Slovakia","SVK","Hides and skins","fabio" +"19363","Slovakia","SVK","Meat Meal","fabio" +"19364","Slovakia","SVK","Pet food","fabio" +"19365","Slovakia","SVK","Honey","fabio" +"19366","Slovakia","SVK","Silk","fabio" +"19367","Slovakia","SVK","Fish, Seafood","fabio" +"19368","Slovakia","SVK","Wood fuel","fabio" +"19369","Slovakia","SVK","Industrial roundwood, coniferous","fabio" +"19370","Slovakia","SVK","Industrial roundwood, non-coniferous","fabio" +"19371","Singapore","SGP","Rice (Milled Equivalent)","fabio" +"19372","Singapore","SGP","Wheat and products","fabio" +"19373","Singapore","SGP","Barley and products","fabio" +"19374","Singapore","SGP","Maize and products","fabio" +"19375","Singapore","SGP","Rye and products","fabio" +"19376","Singapore","SGP","Oats","fabio" +"19377","Singapore","SGP","Millet and products","fabio" +"19378","Singapore","SGP","Sorghum and products","fabio" +"19379","Singapore","SGP","Cereals, Other","fabio" +"19380","Singapore","SGP","Potatoes and products","fabio" +"19381","Singapore","SGP","Cassava and products","fabio" +"19382","Singapore","SGP","Sweet potatoes","fabio" +"19383","Singapore","SGP","Roots, Other","fabio" +"19384","Singapore","SGP","Yams","fabio" +"19385","Singapore","SGP","Sugar cane","fabio" +"19386","Singapore","SGP","Sugar beet","fabio" +"19387","Singapore","SGP","Beans","fabio" +"19388","Singapore","SGP","Peas","fabio" +"19389","Singapore","SGP","Pulses, Other and products","fabio" +"19390","Singapore","SGP","Nuts and products","fabio" +"19391","Singapore","SGP","Soyabeans","fabio" +"19392","Singapore","SGP","Groundnuts (Shelled Eq)","fabio" +"19393","Singapore","SGP","Sunflower seed","fabio" +"19394","Singapore","SGP","Rape and Mustardseed","fabio" +"19395","Singapore","SGP","Seed cotton","fabio" +"19396","Singapore","SGP","Coconuts - Incl Copra","fabio" +"19397","Singapore","SGP","Sesame seed","fabio" +"19398","Singapore","SGP","Oil, palm fruit","fabio" +"19399","Singapore","SGP","Olives (including preserved)","fabio" +"19400","Singapore","SGP","Oilcrops, Other","fabio" +"19401","Singapore","SGP","Tomatoes and products","fabio" +"19402","Singapore","SGP","Onions","fabio" +"19403","Singapore","SGP","Vegetables, Other","fabio" +"19404","Singapore","SGP","Oranges, Mandarines","fabio" +"19405","Singapore","SGP","Lemons, Limes and products","fabio" +"19406","Singapore","SGP","Grapefruit and products","fabio" +"19407","Singapore","SGP","Citrus, Other","fabio" +"19408","Singapore","SGP","Bananas","fabio" +"19409","Singapore","SGP","Plantains","fabio" +"19410","Singapore","SGP","Apples and products","fabio" +"19411","Singapore","SGP","Pineapples and products","fabio" +"19412","Singapore","SGP","Dates","fabio" +"19413","Singapore","SGP","Grapes and products (excl wine)","fabio" +"19414","Singapore","SGP","Fruits, Other","fabio" +"19415","Singapore","SGP","Coffee and products","fabio" +"19416","Singapore","SGP","Cocoa Beans and products","fabio" +"19417","Singapore","SGP","Tea (including mate)","fabio" +"19418","Singapore","SGP","Hops","fabio" +"19419","Singapore","SGP","Pepper","fabio" +"19420","Singapore","SGP","Pimento","fabio" +"19421","Singapore","SGP","Cloves","fabio" +"19422","Singapore","SGP","Spices, Other","fabio" +"19423","Singapore","SGP","Jute","fabio" +"19424","Singapore","SGP","Jute-Like Fibres","fabio" +"19425","Singapore","SGP","Soft-Fibres, Other","fabio" +"19426","Singapore","SGP","Sisal","fabio" +"19427","Singapore","SGP","Abaca","fabio" +"19428","Singapore","SGP","Hard Fibres, Other","fabio" +"19429","Singapore","SGP","Tobacco","fabio" +"19430","Singapore","SGP","Rubber","fabio" +"19431","Singapore","SGP","Fodder crops","fabio" +"19432","Singapore","SGP","Grazing","fabio" +"19433","Singapore","SGP","Cottonseed","fabio" +"19434","Singapore","SGP","Palm kernels","fabio" +"19435","Singapore","SGP","Sugar non-centrifugal","fabio" +"19436","Singapore","SGP","Molasses","fabio" +"19437","Singapore","SGP","Sugar, Refined Equiv","fabio" +"19438","Singapore","SGP","Sweeteners, Other","fabio" +"19439","Singapore","SGP","Soyabean Oil","fabio" +"19440","Singapore","SGP","Groundnut Oil","fabio" +"19441","Singapore","SGP","Sunflowerseed Oil","fabio" +"19442","Singapore","SGP","Rape and Mustard Oil","fabio" +"19443","Singapore","SGP","Cottonseed Oil","fabio" +"19444","Singapore","SGP","Palmkernel Oil","fabio" +"19445","Singapore","SGP","Palm Oil","fabio" +"19446","Singapore","SGP","Coconut Oil","fabio" +"19447","Singapore","SGP","Sesameseed Oil","fabio" +"19448","Singapore","SGP","Olive Oil","fabio" +"19449","Singapore","SGP","Ricebran Oil","fabio" +"19450","Singapore","SGP","Maize Germ Oil","fabio" +"19451","Singapore","SGP","Oilcrops Oil, Other","fabio" +"19452","Singapore","SGP","Soyabean Cake","fabio" +"19453","Singapore","SGP","Groundnut Cake","fabio" +"19454","Singapore","SGP","Sunflowerseed Cake","fabio" +"19455","Singapore","SGP","Rape and Mustard Cake","fabio" +"19456","Singapore","SGP","Cottonseed Cake","fabio" +"19457","Singapore","SGP","Palmkernel Cake","fabio" +"19458","Singapore","SGP","Copra Cake","fabio" +"19459","Singapore","SGP","Sesameseed Cake","fabio" +"19460","Singapore","SGP","Oilseed Cakes, Other","fabio" +"19461","Singapore","SGP","Wine","fabio" +"19462","Singapore","SGP","Beer","fabio" +"19463","Singapore","SGP","Beverages, Fermented","fabio" +"19464","Singapore","SGP","Beverages, Alcoholic","fabio" +"19465","Singapore","SGP","Alcohol, Non-Food","fabio" +"19466","Singapore","SGP","Cotton lint","fabio" +"19467","Singapore","SGP","Cattle","fabio" +"19468","Singapore","SGP","Buffaloes","fabio" +"19469","Singapore","SGP","Sheep","fabio" +"19470","Singapore","SGP","Goats","fabio" +"19471","Singapore","SGP","Pigs","fabio" +"19472","Singapore","SGP","Poultry Birds","fabio" +"19473","Singapore","SGP","Horses","fabio" +"19474","Singapore","SGP","Asses","fabio" +"19475","Singapore","SGP","Mules","fabio" +"19476","Singapore","SGP","Camels","fabio" +"19477","Singapore","SGP","Camelids, other","fabio" +"19478","Singapore","SGP","Rabbits and hares","fabio" +"19479","Singapore","SGP","Rodents, other","fabio" +"19480","Singapore","SGP","Live animals, other","fabio" +"19481","Singapore","SGP","Milk - Excluding Butter","fabio" +"19482","Singapore","SGP","Butter, Ghee","fabio" +"19483","Singapore","SGP","Eggs","fabio" +"19484","Singapore","SGP","Wool (Clean Eq.)","fabio" +"19485","Singapore","SGP","Bovine Meat","fabio" +"19486","Singapore","SGP","Mutton & Goat Meat","fabio" +"19487","Singapore","SGP","Pigmeat","fabio" +"19488","Singapore","SGP","Poultry Meat","fabio" +"19489","Singapore","SGP","Meat, Other","fabio" +"19490","Singapore","SGP","Offals, Edible","fabio" +"19491","Singapore","SGP","Fats, Animals, Raw","fabio" +"19492","Singapore","SGP","Hides and skins","fabio" +"19493","Singapore","SGP","Meat Meal","fabio" +"19494","Singapore","SGP","Pet food","fabio" +"19495","Singapore","SGP","Honey","fabio" +"19496","Singapore","SGP","Silk","fabio" +"19497","Singapore","SGP","Fish, Seafood","fabio" +"19498","Singapore","SGP","Wood fuel","fabio" +"19499","Singapore","SGP","Industrial roundwood, coniferous","fabio" +"19500","Singapore","SGP","Industrial roundwood, non-coniferous","fabio" +"19501","Somalia","SOM","Rice (Milled Equivalent)","fabio" +"19502","Somalia","SOM","Wheat and products","fabio" +"19503","Somalia","SOM","Barley and products","fabio" +"19504","Somalia","SOM","Maize and products","fabio" +"19505","Somalia","SOM","Rye and products","fabio" +"19506","Somalia","SOM","Oats","fabio" +"19507","Somalia","SOM","Millet and products","fabio" +"19508","Somalia","SOM","Sorghum and products","fabio" +"19509","Somalia","SOM","Cereals, Other","fabio" +"19510","Somalia","SOM","Potatoes and products","fabio" +"19511","Somalia","SOM","Cassava and products","fabio" +"19512","Somalia","SOM","Sweet potatoes","fabio" +"19513","Somalia","SOM","Roots, Other","fabio" +"19514","Somalia","SOM","Yams","fabio" +"19515","Somalia","SOM","Sugar cane","fabio" +"19516","Somalia","SOM","Sugar beet","fabio" +"19517","Somalia","SOM","Beans","fabio" +"19518","Somalia","SOM","Peas","fabio" +"19519","Somalia","SOM","Pulses, Other and products","fabio" +"19520","Somalia","SOM","Nuts and products","fabio" +"19521","Somalia","SOM","Soyabeans","fabio" +"19522","Somalia","SOM","Groundnuts (Shelled Eq)","fabio" +"19523","Somalia","SOM","Sunflower seed","fabio" +"19524","Somalia","SOM","Rape and Mustardseed","fabio" +"19525","Somalia","SOM","Seed cotton","fabio" +"19526","Somalia","SOM","Coconuts - Incl Copra","fabio" +"19527","Somalia","SOM","Sesame seed","fabio" +"19528","Somalia","SOM","Oil, palm fruit","fabio" +"19529","Somalia","SOM","Olives (including preserved)","fabio" +"19530","Somalia","SOM","Oilcrops, Other","fabio" +"19531","Somalia","SOM","Tomatoes and products","fabio" +"19532","Somalia","SOM","Onions","fabio" +"19533","Somalia","SOM","Vegetables, Other","fabio" +"19534","Somalia","SOM","Oranges, Mandarines","fabio" +"19535","Somalia","SOM","Lemons, Limes and products","fabio" +"19536","Somalia","SOM","Grapefruit and products","fabio" +"19537","Somalia","SOM","Citrus, Other","fabio" +"19538","Somalia","SOM","Bananas","fabio" +"19539","Somalia","SOM","Plantains","fabio" +"19540","Somalia","SOM","Apples and products","fabio" +"19541","Somalia","SOM","Pineapples and products","fabio" +"19542","Somalia","SOM","Dates","fabio" +"19543","Somalia","SOM","Grapes and products (excl wine)","fabio" +"19544","Somalia","SOM","Fruits, Other","fabio" +"19545","Somalia","SOM","Coffee and products","fabio" +"19546","Somalia","SOM","Cocoa Beans and products","fabio" +"19547","Somalia","SOM","Tea (including mate)","fabio" +"19548","Somalia","SOM","Hops","fabio" +"19549","Somalia","SOM","Pepper","fabio" +"19550","Somalia","SOM","Pimento","fabio" +"19551","Somalia","SOM","Cloves","fabio" +"19552","Somalia","SOM","Spices, Other","fabio" +"19553","Somalia","SOM","Jute","fabio" +"19554","Somalia","SOM","Jute-Like Fibres","fabio" +"19555","Somalia","SOM","Soft-Fibres, Other","fabio" +"19556","Somalia","SOM","Sisal","fabio" +"19557","Somalia","SOM","Abaca","fabio" +"19558","Somalia","SOM","Hard Fibres, Other","fabio" +"19559","Somalia","SOM","Tobacco","fabio" +"19560","Somalia","SOM","Rubber","fabio" +"19561","Somalia","SOM","Fodder crops","fabio" +"19562","Somalia","SOM","Grazing","fabio" +"19563","Somalia","SOM","Cottonseed","fabio" +"19564","Somalia","SOM","Palm kernels","fabio" +"19565","Somalia","SOM","Sugar non-centrifugal","fabio" +"19566","Somalia","SOM","Molasses","fabio" +"19567","Somalia","SOM","Sugar, Refined Equiv","fabio" +"19568","Somalia","SOM","Sweeteners, Other","fabio" +"19569","Somalia","SOM","Soyabean Oil","fabio" +"19570","Somalia","SOM","Groundnut Oil","fabio" +"19571","Somalia","SOM","Sunflowerseed Oil","fabio" +"19572","Somalia","SOM","Rape and Mustard Oil","fabio" +"19573","Somalia","SOM","Cottonseed Oil","fabio" +"19574","Somalia","SOM","Palmkernel Oil","fabio" +"19575","Somalia","SOM","Palm Oil","fabio" +"19576","Somalia","SOM","Coconut Oil","fabio" +"19577","Somalia","SOM","Sesameseed Oil","fabio" +"19578","Somalia","SOM","Olive Oil","fabio" +"19579","Somalia","SOM","Ricebran Oil","fabio" +"19580","Somalia","SOM","Maize Germ Oil","fabio" +"19581","Somalia","SOM","Oilcrops Oil, Other","fabio" +"19582","Somalia","SOM","Soyabean Cake","fabio" +"19583","Somalia","SOM","Groundnut Cake","fabio" +"19584","Somalia","SOM","Sunflowerseed Cake","fabio" +"19585","Somalia","SOM","Rape and Mustard Cake","fabio" +"19586","Somalia","SOM","Cottonseed Cake","fabio" +"19587","Somalia","SOM","Palmkernel Cake","fabio" +"19588","Somalia","SOM","Copra Cake","fabio" +"19589","Somalia","SOM","Sesameseed Cake","fabio" +"19590","Somalia","SOM","Oilseed Cakes, Other","fabio" +"19591","Somalia","SOM","Wine","fabio" +"19592","Somalia","SOM","Beer","fabio" +"19593","Somalia","SOM","Beverages, Fermented","fabio" +"19594","Somalia","SOM","Beverages, Alcoholic","fabio" +"19595","Somalia","SOM","Alcohol, Non-Food","fabio" +"19596","Somalia","SOM","Cotton lint","fabio" +"19597","Somalia","SOM","Cattle","fabio" +"19598","Somalia","SOM","Buffaloes","fabio" +"19599","Somalia","SOM","Sheep","fabio" +"19600","Somalia","SOM","Goats","fabio" +"19601","Somalia","SOM","Pigs","fabio" +"19602","Somalia","SOM","Poultry Birds","fabio" +"19603","Somalia","SOM","Horses","fabio" +"19604","Somalia","SOM","Asses","fabio" +"19605","Somalia","SOM","Mules","fabio" +"19606","Somalia","SOM","Camels","fabio" +"19607","Somalia","SOM","Camelids, other","fabio" +"19608","Somalia","SOM","Rabbits and hares","fabio" +"19609","Somalia","SOM","Rodents, other","fabio" +"19610","Somalia","SOM","Live animals, other","fabio" +"19611","Somalia","SOM","Milk - Excluding Butter","fabio" +"19612","Somalia","SOM","Butter, Ghee","fabio" +"19613","Somalia","SOM","Eggs","fabio" +"19614","Somalia","SOM","Wool (Clean Eq.)","fabio" +"19615","Somalia","SOM","Bovine Meat","fabio" +"19616","Somalia","SOM","Mutton & Goat Meat","fabio" +"19617","Somalia","SOM","Pigmeat","fabio" +"19618","Somalia","SOM","Poultry Meat","fabio" +"19619","Somalia","SOM","Meat, Other","fabio" +"19620","Somalia","SOM","Offals, Edible","fabio" +"19621","Somalia","SOM","Fats, Animals, Raw","fabio" +"19622","Somalia","SOM","Hides and skins","fabio" +"19623","Somalia","SOM","Meat Meal","fabio" +"19624","Somalia","SOM","Pet food","fabio" +"19625","Somalia","SOM","Honey","fabio" +"19626","Somalia","SOM","Silk","fabio" +"19627","Somalia","SOM","Fish, Seafood","fabio" +"19628","Somalia","SOM","Wood fuel","fabio" +"19629","Somalia","SOM","Industrial roundwood, coniferous","fabio" +"19630","Somalia","SOM","Industrial roundwood, non-coniferous","fabio" +"19631","South Africa","ZAF","Rice (Milled Equivalent)","fabio" +"19632","South Africa","ZAF","Wheat and products","fabio" +"19633","South Africa","ZAF","Barley and products","fabio" +"19634","South Africa","ZAF","Maize and products","fabio" +"19635","South Africa","ZAF","Rye and products","fabio" +"19636","South Africa","ZAF","Oats","fabio" +"19637","South Africa","ZAF","Millet and products","fabio" +"19638","South Africa","ZAF","Sorghum and products","fabio" +"19639","South Africa","ZAF","Cereals, Other","fabio" +"19640","South Africa","ZAF","Potatoes and products","fabio" +"19641","South Africa","ZAF","Cassava and products","fabio" +"19642","South Africa","ZAF","Sweet potatoes","fabio" +"19643","South Africa","ZAF","Roots, Other","fabio" +"19644","South Africa","ZAF","Yams","fabio" +"19645","South Africa","ZAF","Sugar cane","fabio" +"19646","South Africa","ZAF","Sugar beet","fabio" +"19647","South Africa","ZAF","Beans","fabio" +"19648","South Africa","ZAF","Peas","fabio" +"19649","South Africa","ZAF","Pulses, Other and products","fabio" +"19650","South Africa","ZAF","Nuts and products","fabio" +"19651","South Africa","ZAF","Soyabeans","fabio" +"19652","South Africa","ZAF","Groundnuts (Shelled Eq)","fabio" +"19653","South Africa","ZAF","Sunflower seed","fabio" +"19654","South Africa","ZAF","Rape and Mustardseed","fabio" +"19655","South Africa","ZAF","Seed cotton","fabio" +"19656","South Africa","ZAF","Coconuts - Incl Copra","fabio" +"19657","South Africa","ZAF","Sesame seed","fabio" +"19658","South Africa","ZAF","Oil, palm fruit","fabio" +"19659","South Africa","ZAF","Olives (including preserved)","fabio" +"19660","South Africa","ZAF","Oilcrops, Other","fabio" +"19661","South Africa","ZAF","Tomatoes and products","fabio" +"19662","South Africa","ZAF","Onions","fabio" +"19663","South Africa","ZAF","Vegetables, Other","fabio" +"19664","South Africa","ZAF","Oranges, Mandarines","fabio" +"19665","South Africa","ZAF","Lemons, Limes and products","fabio" +"19666","South Africa","ZAF","Grapefruit and products","fabio" +"19667","South Africa","ZAF","Citrus, Other","fabio" +"19668","South Africa","ZAF","Bananas","fabio" +"19669","South Africa","ZAF","Plantains","fabio" +"19670","South Africa","ZAF","Apples and products","fabio" +"19671","South Africa","ZAF","Pineapples and products","fabio" +"19672","South Africa","ZAF","Dates","fabio" +"19673","South Africa","ZAF","Grapes and products (excl wine)","fabio" +"19674","South Africa","ZAF","Fruits, Other","fabio" +"19675","South Africa","ZAF","Coffee and products","fabio" +"19676","South Africa","ZAF","Cocoa Beans and products","fabio" +"19677","South Africa","ZAF","Tea (including mate)","fabio" +"19678","South Africa","ZAF","Hops","fabio" +"19679","South Africa","ZAF","Pepper","fabio" +"19680","South Africa","ZAF","Pimento","fabio" +"19681","South Africa","ZAF","Cloves","fabio" +"19682","South Africa","ZAF","Spices, Other","fabio" +"19683","South Africa","ZAF","Jute","fabio" +"19684","South Africa","ZAF","Jute-Like Fibres","fabio" +"19685","South Africa","ZAF","Soft-Fibres, Other","fabio" +"19686","South Africa","ZAF","Sisal","fabio" +"19687","South Africa","ZAF","Abaca","fabio" +"19688","South Africa","ZAF","Hard Fibres, Other","fabio" +"19689","South Africa","ZAF","Tobacco","fabio" +"19690","South Africa","ZAF","Rubber","fabio" +"19691","South Africa","ZAF","Fodder crops","fabio" +"19692","South Africa","ZAF","Grazing","fabio" +"19693","South Africa","ZAF","Cottonseed","fabio" +"19694","South Africa","ZAF","Palm kernels","fabio" +"19695","South Africa","ZAF","Sugar non-centrifugal","fabio" +"19696","South Africa","ZAF","Molasses","fabio" +"19697","South Africa","ZAF","Sugar, Refined Equiv","fabio" +"19698","South Africa","ZAF","Sweeteners, Other","fabio" +"19699","South Africa","ZAF","Soyabean Oil","fabio" +"19700","South Africa","ZAF","Groundnut Oil","fabio" +"19701","South Africa","ZAF","Sunflowerseed Oil","fabio" +"19702","South Africa","ZAF","Rape and Mustard Oil","fabio" +"19703","South Africa","ZAF","Cottonseed Oil","fabio" +"19704","South Africa","ZAF","Palmkernel Oil","fabio" +"19705","South Africa","ZAF","Palm Oil","fabio" +"19706","South Africa","ZAF","Coconut Oil","fabio" +"19707","South Africa","ZAF","Sesameseed Oil","fabio" +"19708","South Africa","ZAF","Olive Oil","fabio" +"19709","South Africa","ZAF","Ricebran Oil","fabio" +"19710","South Africa","ZAF","Maize Germ Oil","fabio" +"19711","South Africa","ZAF","Oilcrops Oil, Other","fabio" +"19712","South Africa","ZAF","Soyabean Cake","fabio" +"19713","South Africa","ZAF","Groundnut Cake","fabio" +"19714","South Africa","ZAF","Sunflowerseed Cake","fabio" +"19715","South Africa","ZAF","Rape and Mustard Cake","fabio" +"19716","South Africa","ZAF","Cottonseed Cake","fabio" +"19717","South Africa","ZAF","Palmkernel Cake","fabio" +"19718","South Africa","ZAF","Copra Cake","fabio" +"19719","South Africa","ZAF","Sesameseed Cake","fabio" +"19720","South Africa","ZAF","Oilseed Cakes, Other","fabio" +"19721","South Africa","ZAF","Wine","fabio" +"19722","South Africa","ZAF","Beer","fabio" +"19723","South Africa","ZAF","Beverages, Fermented","fabio" +"19724","South Africa","ZAF","Beverages, Alcoholic","fabio" +"19725","South Africa","ZAF","Alcohol, Non-Food","fabio" +"19726","South Africa","ZAF","Cotton lint","fabio" +"19727","South Africa","ZAF","Cattle","fabio" +"19728","South Africa","ZAF","Buffaloes","fabio" +"19729","South Africa","ZAF","Sheep","fabio" +"19730","South Africa","ZAF","Goats","fabio" +"19731","South Africa","ZAF","Pigs","fabio" +"19732","South Africa","ZAF","Poultry Birds","fabio" +"19733","South Africa","ZAF","Horses","fabio" +"19734","South Africa","ZAF","Asses","fabio" +"19735","South Africa","ZAF","Mules","fabio" +"19736","South Africa","ZAF","Camels","fabio" +"19737","South Africa","ZAF","Camelids, other","fabio" +"19738","South Africa","ZAF","Rabbits and hares","fabio" +"19739","South Africa","ZAF","Rodents, other","fabio" +"19740","South Africa","ZAF","Live animals, other","fabio" +"19741","South Africa","ZAF","Milk - Excluding Butter","fabio" +"19742","South Africa","ZAF","Butter, Ghee","fabio" +"19743","South Africa","ZAF","Eggs","fabio" +"19744","South Africa","ZAF","Wool (Clean Eq.)","fabio" +"19745","South Africa","ZAF","Bovine Meat","fabio" +"19746","South Africa","ZAF","Mutton & Goat Meat","fabio" +"19747","South Africa","ZAF","Pigmeat","fabio" +"19748","South Africa","ZAF","Poultry Meat","fabio" +"19749","South Africa","ZAF","Meat, Other","fabio" +"19750","South Africa","ZAF","Offals, Edible","fabio" +"19751","South Africa","ZAF","Fats, Animals, Raw","fabio" +"19752","South Africa","ZAF","Hides and skins","fabio" +"19753","South Africa","ZAF","Meat Meal","fabio" +"19754","South Africa","ZAF","Pet food","fabio" +"19755","South Africa","ZAF","Honey","fabio" +"19756","South Africa","ZAF","Silk","fabio" +"19757","South Africa","ZAF","Fish, Seafood","fabio" +"19758","South Africa","ZAF","Wood fuel","fabio" +"19759","South Africa","ZAF","Industrial roundwood, coniferous","fabio" +"19760","South Africa","ZAF","Industrial roundwood, non-coniferous","fabio" +"19761","Spain","ESP","Rice (Milled Equivalent)","fabio" +"19762","Spain","ESP","Wheat and products","fabio" +"19763","Spain","ESP","Barley and products","fabio" +"19764","Spain","ESP","Maize and products","fabio" +"19765","Spain","ESP","Rye and products","fabio" +"19766","Spain","ESP","Oats","fabio" +"19767","Spain","ESP","Millet and products","fabio" +"19768","Spain","ESP","Sorghum and products","fabio" +"19769","Spain","ESP","Cereals, Other","fabio" +"19770","Spain","ESP","Potatoes and products","fabio" +"19771","Spain","ESP","Cassava and products","fabio" +"19772","Spain","ESP","Sweet potatoes","fabio" +"19773","Spain","ESP","Roots, Other","fabio" +"19774","Spain","ESP","Yams","fabio" +"19775","Spain","ESP","Sugar cane","fabio" +"19776","Spain","ESP","Sugar beet","fabio" +"19777","Spain","ESP","Beans","fabio" +"19778","Spain","ESP","Peas","fabio" +"19779","Spain","ESP","Pulses, Other and products","fabio" +"19780","Spain","ESP","Nuts and products","fabio" +"19781","Spain","ESP","Soyabeans","fabio" +"19782","Spain","ESP","Groundnuts (Shelled Eq)","fabio" +"19783","Spain","ESP","Sunflower seed","fabio" +"19784","Spain","ESP","Rape and Mustardseed","fabio" +"19785","Spain","ESP","Seed cotton","fabio" +"19786","Spain","ESP","Coconuts - Incl Copra","fabio" +"19787","Spain","ESP","Sesame seed","fabio" +"19788","Spain","ESP","Oil, palm fruit","fabio" +"19789","Spain","ESP","Olives (including preserved)","fabio" +"19790","Spain","ESP","Oilcrops, Other","fabio" +"19791","Spain","ESP","Tomatoes and products","fabio" +"19792","Spain","ESP","Onions","fabio" +"19793","Spain","ESP","Vegetables, Other","fabio" +"19794","Spain","ESP","Oranges, Mandarines","fabio" +"19795","Spain","ESP","Lemons, Limes and products","fabio" +"19796","Spain","ESP","Grapefruit and products","fabio" +"19797","Spain","ESP","Citrus, Other","fabio" +"19798","Spain","ESP","Bananas","fabio" +"19799","Spain","ESP","Plantains","fabio" +"19800","Spain","ESP","Apples and products","fabio" +"19801","Spain","ESP","Pineapples and products","fabio" +"19802","Spain","ESP","Dates","fabio" +"19803","Spain","ESP","Grapes and products (excl wine)","fabio" +"19804","Spain","ESP","Fruits, Other","fabio" +"19805","Spain","ESP","Coffee and products","fabio" +"19806","Spain","ESP","Cocoa Beans and products","fabio" +"19807","Spain","ESP","Tea (including mate)","fabio" +"19808","Spain","ESP","Hops","fabio" +"19809","Spain","ESP","Pepper","fabio" +"19810","Spain","ESP","Pimento","fabio" +"19811","Spain","ESP","Cloves","fabio" +"19812","Spain","ESP","Spices, Other","fabio" +"19813","Spain","ESP","Jute","fabio" +"19814","Spain","ESP","Jute-Like Fibres","fabio" +"19815","Spain","ESP","Soft-Fibres, Other","fabio" +"19816","Spain","ESP","Sisal","fabio" +"19817","Spain","ESP","Abaca","fabio" +"19818","Spain","ESP","Hard Fibres, Other","fabio" +"19819","Spain","ESP","Tobacco","fabio" +"19820","Spain","ESP","Rubber","fabio" +"19821","Spain","ESP","Fodder crops","fabio" +"19822","Spain","ESP","Grazing","fabio" +"19823","Spain","ESP","Cottonseed","fabio" +"19824","Spain","ESP","Palm kernels","fabio" +"19825","Spain","ESP","Sugar non-centrifugal","fabio" +"19826","Spain","ESP","Molasses","fabio" +"19827","Spain","ESP","Sugar, Refined Equiv","fabio" +"19828","Spain","ESP","Sweeteners, Other","fabio" +"19829","Spain","ESP","Soyabean Oil","fabio" +"19830","Spain","ESP","Groundnut Oil","fabio" +"19831","Spain","ESP","Sunflowerseed Oil","fabio" +"19832","Spain","ESP","Rape and Mustard Oil","fabio" +"19833","Spain","ESP","Cottonseed Oil","fabio" +"19834","Spain","ESP","Palmkernel Oil","fabio" +"19835","Spain","ESP","Palm Oil","fabio" +"19836","Spain","ESP","Coconut Oil","fabio" +"19837","Spain","ESP","Sesameseed Oil","fabio" +"19838","Spain","ESP","Olive Oil","fabio" +"19839","Spain","ESP","Ricebran Oil","fabio" +"19840","Spain","ESP","Maize Germ Oil","fabio" +"19841","Spain","ESP","Oilcrops Oil, Other","fabio" +"19842","Spain","ESP","Soyabean Cake","fabio" +"19843","Spain","ESP","Groundnut Cake","fabio" +"19844","Spain","ESP","Sunflowerseed Cake","fabio" +"19845","Spain","ESP","Rape and Mustard Cake","fabio" +"19846","Spain","ESP","Cottonseed Cake","fabio" +"19847","Spain","ESP","Palmkernel Cake","fabio" +"19848","Spain","ESP","Copra Cake","fabio" +"19849","Spain","ESP","Sesameseed Cake","fabio" +"19850","Spain","ESP","Oilseed Cakes, Other","fabio" +"19851","Spain","ESP","Wine","fabio" +"19852","Spain","ESP","Beer","fabio" +"19853","Spain","ESP","Beverages, Fermented","fabio" +"19854","Spain","ESP","Beverages, Alcoholic","fabio" +"19855","Spain","ESP","Alcohol, Non-Food","fabio" +"19856","Spain","ESP","Cotton lint","fabio" +"19857","Spain","ESP","Cattle","fabio" +"19858","Spain","ESP","Buffaloes","fabio" +"19859","Spain","ESP","Sheep","fabio" +"19860","Spain","ESP","Goats","fabio" +"19861","Spain","ESP","Pigs","fabio" +"19862","Spain","ESP","Poultry Birds","fabio" +"19863","Spain","ESP","Horses","fabio" +"19864","Spain","ESP","Asses","fabio" +"19865","Spain","ESP","Mules","fabio" +"19866","Spain","ESP","Camels","fabio" +"19867","Spain","ESP","Camelids, other","fabio" +"19868","Spain","ESP","Rabbits and hares","fabio" +"19869","Spain","ESP","Rodents, other","fabio" +"19870","Spain","ESP","Live animals, other","fabio" +"19871","Spain","ESP","Milk - Excluding Butter","fabio" +"19872","Spain","ESP","Butter, Ghee","fabio" +"19873","Spain","ESP","Eggs","fabio" +"19874","Spain","ESP","Wool (Clean Eq.)","fabio" +"19875","Spain","ESP","Bovine Meat","fabio" +"19876","Spain","ESP","Mutton & Goat Meat","fabio" +"19877","Spain","ESP","Pigmeat","fabio" +"19878","Spain","ESP","Poultry Meat","fabio" +"19879","Spain","ESP","Meat, Other","fabio" +"19880","Spain","ESP","Offals, Edible","fabio" +"19881","Spain","ESP","Fats, Animals, Raw","fabio" +"19882","Spain","ESP","Hides and skins","fabio" +"19883","Spain","ESP","Meat Meal","fabio" +"19884","Spain","ESP","Pet food","fabio" +"19885","Spain","ESP","Honey","fabio" +"19886","Spain","ESP","Silk","fabio" +"19887","Spain","ESP","Fish, Seafood","fabio" +"19888","Spain","ESP","Wood fuel","fabio" +"19889","Spain","ESP","Industrial roundwood, coniferous","fabio" +"19890","Spain","ESP","Industrial roundwood, non-coniferous","fabio" +"19891","Suriname","SUR","Rice (Milled Equivalent)","fabio" +"19892","Suriname","SUR","Wheat and products","fabio" +"19893","Suriname","SUR","Barley and products","fabio" +"19894","Suriname","SUR","Maize and products","fabio" +"19895","Suriname","SUR","Rye and products","fabio" +"19896","Suriname","SUR","Oats","fabio" +"19897","Suriname","SUR","Millet and products","fabio" +"19898","Suriname","SUR","Sorghum and products","fabio" +"19899","Suriname","SUR","Cereals, Other","fabio" +"19900","Suriname","SUR","Potatoes and products","fabio" +"19901","Suriname","SUR","Cassava and products","fabio" +"19902","Suriname","SUR","Sweet potatoes","fabio" +"19903","Suriname","SUR","Roots, Other","fabio" +"19904","Suriname","SUR","Yams","fabio" +"19905","Suriname","SUR","Sugar cane","fabio" +"19906","Suriname","SUR","Sugar beet","fabio" +"19907","Suriname","SUR","Beans","fabio" +"19908","Suriname","SUR","Peas","fabio" +"19909","Suriname","SUR","Pulses, Other and products","fabio" +"19910","Suriname","SUR","Nuts and products","fabio" +"19911","Suriname","SUR","Soyabeans","fabio" +"19912","Suriname","SUR","Groundnuts (Shelled Eq)","fabio" +"19913","Suriname","SUR","Sunflower seed","fabio" +"19914","Suriname","SUR","Rape and Mustardseed","fabio" +"19915","Suriname","SUR","Seed cotton","fabio" +"19916","Suriname","SUR","Coconuts - Incl Copra","fabio" +"19917","Suriname","SUR","Sesame seed","fabio" +"19918","Suriname","SUR","Oil, palm fruit","fabio" +"19919","Suriname","SUR","Olives (including preserved)","fabio" +"19920","Suriname","SUR","Oilcrops, Other","fabio" +"19921","Suriname","SUR","Tomatoes and products","fabio" +"19922","Suriname","SUR","Onions","fabio" +"19923","Suriname","SUR","Vegetables, Other","fabio" +"19924","Suriname","SUR","Oranges, Mandarines","fabio" +"19925","Suriname","SUR","Lemons, Limes and products","fabio" +"19926","Suriname","SUR","Grapefruit and products","fabio" +"19927","Suriname","SUR","Citrus, Other","fabio" +"19928","Suriname","SUR","Bananas","fabio" +"19929","Suriname","SUR","Plantains","fabio" +"19930","Suriname","SUR","Apples and products","fabio" +"19931","Suriname","SUR","Pineapples and products","fabio" +"19932","Suriname","SUR","Dates","fabio" +"19933","Suriname","SUR","Grapes and products (excl wine)","fabio" +"19934","Suriname","SUR","Fruits, Other","fabio" +"19935","Suriname","SUR","Coffee and products","fabio" +"19936","Suriname","SUR","Cocoa Beans and products","fabio" +"19937","Suriname","SUR","Tea (including mate)","fabio" +"19938","Suriname","SUR","Hops","fabio" +"19939","Suriname","SUR","Pepper","fabio" +"19940","Suriname","SUR","Pimento","fabio" +"19941","Suriname","SUR","Cloves","fabio" +"19942","Suriname","SUR","Spices, Other","fabio" +"19943","Suriname","SUR","Jute","fabio" +"19944","Suriname","SUR","Jute-Like Fibres","fabio" +"19945","Suriname","SUR","Soft-Fibres, Other","fabio" +"19946","Suriname","SUR","Sisal","fabio" +"19947","Suriname","SUR","Abaca","fabio" +"19948","Suriname","SUR","Hard Fibres, Other","fabio" +"19949","Suriname","SUR","Tobacco","fabio" +"19950","Suriname","SUR","Rubber","fabio" +"19951","Suriname","SUR","Fodder crops","fabio" +"19952","Suriname","SUR","Grazing","fabio" +"19953","Suriname","SUR","Cottonseed","fabio" +"19954","Suriname","SUR","Palm kernels","fabio" +"19955","Suriname","SUR","Sugar non-centrifugal","fabio" +"19956","Suriname","SUR","Molasses","fabio" +"19957","Suriname","SUR","Sugar, Refined Equiv","fabio" +"19958","Suriname","SUR","Sweeteners, Other","fabio" +"19959","Suriname","SUR","Soyabean Oil","fabio" +"19960","Suriname","SUR","Groundnut Oil","fabio" +"19961","Suriname","SUR","Sunflowerseed Oil","fabio" +"19962","Suriname","SUR","Rape and Mustard Oil","fabio" +"19963","Suriname","SUR","Cottonseed Oil","fabio" +"19964","Suriname","SUR","Palmkernel Oil","fabio" +"19965","Suriname","SUR","Palm Oil","fabio" +"19966","Suriname","SUR","Coconut Oil","fabio" +"19967","Suriname","SUR","Sesameseed Oil","fabio" +"19968","Suriname","SUR","Olive Oil","fabio" +"19969","Suriname","SUR","Ricebran Oil","fabio" +"19970","Suriname","SUR","Maize Germ Oil","fabio" +"19971","Suriname","SUR","Oilcrops Oil, Other","fabio" +"19972","Suriname","SUR","Soyabean Cake","fabio" +"19973","Suriname","SUR","Groundnut Cake","fabio" +"19974","Suriname","SUR","Sunflowerseed Cake","fabio" +"19975","Suriname","SUR","Rape and Mustard Cake","fabio" +"19976","Suriname","SUR","Cottonseed Cake","fabio" +"19977","Suriname","SUR","Palmkernel Cake","fabio" +"19978","Suriname","SUR","Copra Cake","fabio" +"19979","Suriname","SUR","Sesameseed Cake","fabio" +"19980","Suriname","SUR","Oilseed Cakes, Other","fabio" +"19981","Suriname","SUR","Wine","fabio" +"19982","Suriname","SUR","Beer","fabio" +"19983","Suriname","SUR","Beverages, Fermented","fabio" +"19984","Suriname","SUR","Beverages, Alcoholic","fabio" +"19985","Suriname","SUR","Alcohol, Non-Food","fabio" +"19986","Suriname","SUR","Cotton lint","fabio" +"19987","Suriname","SUR","Cattle","fabio" +"19988","Suriname","SUR","Buffaloes","fabio" +"19989","Suriname","SUR","Sheep","fabio" +"19990","Suriname","SUR","Goats","fabio" +"19991","Suriname","SUR","Pigs","fabio" +"19992","Suriname","SUR","Poultry Birds","fabio" +"19993","Suriname","SUR","Horses","fabio" +"19994","Suriname","SUR","Asses","fabio" +"19995","Suriname","SUR","Mules","fabio" +"19996","Suriname","SUR","Camels","fabio" +"19997","Suriname","SUR","Camelids, other","fabio" +"19998","Suriname","SUR","Rabbits and hares","fabio" +"19999","Suriname","SUR","Rodents, other","fabio" +"20000","Suriname","SUR","Live animals, other","fabio" +"20001","Suriname","SUR","Milk - Excluding Butter","fabio" +"20002","Suriname","SUR","Butter, Ghee","fabio" +"20003","Suriname","SUR","Eggs","fabio" +"20004","Suriname","SUR","Wool (Clean Eq.)","fabio" +"20005","Suriname","SUR","Bovine Meat","fabio" +"20006","Suriname","SUR","Mutton & Goat Meat","fabio" +"20007","Suriname","SUR","Pigmeat","fabio" +"20008","Suriname","SUR","Poultry Meat","fabio" +"20009","Suriname","SUR","Meat, Other","fabio" +"20010","Suriname","SUR","Offals, Edible","fabio" +"20011","Suriname","SUR","Fats, Animals, Raw","fabio" +"20012","Suriname","SUR","Hides and skins","fabio" +"20013","Suriname","SUR","Meat Meal","fabio" +"20014","Suriname","SUR","Pet food","fabio" +"20015","Suriname","SUR","Honey","fabio" +"20016","Suriname","SUR","Silk","fabio" +"20017","Suriname","SUR","Fish, Seafood","fabio" +"20018","Suriname","SUR","Wood fuel","fabio" +"20019","Suriname","SUR","Industrial roundwood, coniferous","fabio" +"20020","Suriname","SUR","Industrial roundwood, non-coniferous","fabio" +"20021","Tajikistan","TJK","Rice (Milled Equivalent)","fabio" +"20022","Tajikistan","TJK","Wheat and products","fabio" +"20023","Tajikistan","TJK","Barley and products","fabio" +"20024","Tajikistan","TJK","Maize and products","fabio" +"20025","Tajikistan","TJK","Rye and products","fabio" +"20026","Tajikistan","TJK","Oats","fabio" +"20027","Tajikistan","TJK","Millet and products","fabio" +"20028","Tajikistan","TJK","Sorghum and products","fabio" +"20029","Tajikistan","TJK","Cereals, Other","fabio" +"20030","Tajikistan","TJK","Potatoes and products","fabio" +"20031","Tajikistan","TJK","Cassava and products","fabio" +"20032","Tajikistan","TJK","Sweet potatoes","fabio" +"20033","Tajikistan","TJK","Roots, Other","fabio" +"20034","Tajikistan","TJK","Yams","fabio" +"20035","Tajikistan","TJK","Sugar cane","fabio" +"20036","Tajikistan","TJK","Sugar beet","fabio" +"20037","Tajikistan","TJK","Beans","fabio" +"20038","Tajikistan","TJK","Peas","fabio" +"20039","Tajikistan","TJK","Pulses, Other and products","fabio" +"20040","Tajikistan","TJK","Nuts and products","fabio" +"20041","Tajikistan","TJK","Soyabeans","fabio" +"20042","Tajikistan","TJK","Groundnuts (Shelled Eq)","fabio" +"20043","Tajikistan","TJK","Sunflower seed","fabio" +"20044","Tajikistan","TJK","Rape and Mustardseed","fabio" +"20045","Tajikistan","TJK","Seed cotton","fabio" +"20046","Tajikistan","TJK","Coconuts - Incl Copra","fabio" +"20047","Tajikistan","TJK","Sesame seed","fabio" +"20048","Tajikistan","TJK","Oil, palm fruit","fabio" +"20049","Tajikistan","TJK","Olives (including preserved)","fabio" +"20050","Tajikistan","TJK","Oilcrops, Other","fabio" +"20051","Tajikistan","TJK","Tomatoes and products","fabio" +"20052","Tajikistan","TJK","Onions","fabio" +"20053","Tajikistan","TJK","Vegetables, Other","fabio" +"20054","Tajikistan","TJK","Oranges, Mandarines","fabio" +"20055","Tajikistan","TJK","Lemons, Limes and products","fabio" +"20056","Tajikistan","TJK","Grapefruit and products","fabio" +"20057","Tajikistan","TJK","Citrus, Other","fabio" +"20058","Tajikistan","TJK","Bananas","fabio" +"20059","Tajikistan","TJK","Plantains","fabio" +"20060","Tajikistan","TJK","Apples and products","fabio" +"20061","Tajikistan","TJK","Pineapples and products","fabio" +"20062","Tajikistan","TJK","Dates","fabio" +"20063","Tajikistan","TJK","Grapes and products (excl wine)","fabio" +"20064","Tajikistan","TJK","Fruits, Other","fabio" +"20065","Tajikistan","TJK","Coffee and products","fabio" +"20066","Tajikistan","TJK","Cocoa Beans and products","fabio" +"20067","Tajikistan","TJK","Tea (including mate)","fabio" +"20068","Tajikistan","TJK","Hops","fabio" +"20069","Tajikistan","TJK","Pepper","fabio" +"20070","Tajikistan","TJK","Pimento","fabio" +"20071","Tajikistan","TJK","Cloves","fabio" +"20072","Tajikistan","TJK","Spices, Other","fabio" +"20073","Tajikistan","TJK","Jute","fabio" +"20074","Tajikistan","TJK","Jute-Like Fibres","fabio" +"20075","Tajikistan","TJK","Soft-Fibres, Other","fabio" +"20076","Tajikistan","TJK","Sisal","fabio" +"20077","Tajikistan","TJK","Abaca","fabio" +"20078","Tajikistan","TJK","Hard Fibres, Other","fabio" +"20079","Tajikistan","TJK","Tobacco","fabio" +"20080","Tajikistan","TJK","Rubber","fabio" +"20081","Tajikistan","TJK","Fodder crops","fabio" +"20082","Tajikistan","TJK","Grazing","fabio" +"20083","Tajikistan","TJK","Cottonseed","fabio" +"20084","Tajikistan","TJK","Palm kernels","fabio" +"20085","Tajikistan","TJK","Sugar non-centrifugal","fabio" +"20086","Tajikistan","TJK","Molasses","fabio" +"20087","Tajikistan","TJK","Sugar, Refined Equiv","fabio" +"20088","Tajikistan","TJK","Sweeteners, Other","fabio" +"20089","Tajikistan","TJK","Soyabean Oil","fabio" +"20090","Tajikistan","TJK","Groundnut Oil","fabio" +"20091","Tajikistan","TJK","Sunflowerseed Oil","fabio" +"20092","Tajikistan","TJK","Rape and Mustard Oil","fabio" +"20093","Tajikistan","TJK","Cottonseed Oil","fabio" +"20094","Tajikistan","TJK","Palmkernel Oil","fabio" +"20095","Tajikistan","TJK","Palm Oil","fabio" +"20096","Tajikistan","TJK","Coconut Oil","fabio" +"20097","Tajikistan","TJK","Sesameseed Oil","fabio" +"20098","Tajikistan","TJK","Olive Oil","fabio" +"20099","Tajikistan","TJK","Ricebran Oil","fabio" +"20100","Tajikistan","TJK","Maize Germ Oil","fabio" +"20101","Tajikistan","TJK","Oilcrops Oil, Other","fabio" +"20102","Tajikistan","TJK","Soyabean Cake","fabio" +"20103","Tajikistan","TJK","Groundnut Cake","fabio" +"20104","Tajikistan","TJK","Sunflowerseed Cake","fabio" +"20105","Tajikistan","TJK","Rape and Mustard Cake","fabio" +"20106","Tajikistan","TJK","Cottonseed Cake","fabio" +"20107","Tajikistan","TJK","Palmkernel Cake","fabio" +"20108","Tajikistan","TJK","Copra Cake","fabio" +"20109","Tajikistan","TJK","Sesameseed Cake","fabio" +"20110","Tajikistan","TJK","Oilseed Cakes, Other","fabio" +"20111","Tajikistan","TJK","Wine","fabio" +"20112","Tajikistan","TJK","Beer","fabio" +"20113","Tajikistan","TJK","Beverages, Fermented","fabio" +"20114","Tajikistan","TJK","Beverages, Alcoholic","fabio" +"20115","Tajikistan","TJK","Alcohol, Non-Food","fabio" +"20116","Tajikistan","TJK","Cotton lint","fabio" +"20117","Tajikistan","TJK","Cattle","fabio" +"20118","Tajikistan","TJK","Buffaloes","fabio" +"20119","Tajikistan","TJK","Sheep","fabio" +"20120","Tajikistan","TJK","Goats","fabio" +"20121","Tajikistan","TJK","Pigs","fabio" +"20122","Tajikistan","TJK","Poultry Birds","fabio" +"20123","Tajikistan","TJK","Horses","fabio" +"20124","Tajikistan","TJK","Asses","fabio" +"20125","Tajikistan","TJK","Mules","fabio" +"20126","Tajikistan","TJK","Camels","fabio" +"20127","Tajikistan","TJK","Camelids, other","fabio" +"20128","Tajikistan","TJK","Rabbits and hares","fabio" +"20129","Tajikistan","TJK","Rodents, other","fabio" +"20130","Tajikistan","TJK","Live animals, other","fabio" +"20131","Tajikistan","TJK","Milk - Excluding Butter","fabio" +"20132","Tajikistan","TJK","Butter, Ghee","fabio" +"20133","Tajikistan","TJK","Eggs","fabio" +"20134","Tajikistan","TJK","Wool (Clean Eq.)","fabio" +"20135","Tajikistan","TJK","Bovine Meat","fabio" +"20136","Tajikistan","TJK","Mutton & Goat Meat","fabio" +"20137","Tajikistan","TJK","Pigmeat","fabio" +"20138","Tajikistan","TJK","Poultry Meat","fabio" +"20139","Tajikistan","TJK","Meat, Other","fabio" +"20140","Tajikistan","TJK","Offals, Edible","fabio" +"20141","Tajikistan","TJK","Fats, Animals, Raw","fabio" +"20142","Tajikistan","TJK","Hides and skins","fabio" +"20143","Tajikistan","TJK","Meat Meal","fabio" +"20144","Tajikistan","TJK","Pet food","fabio" +"20145","Tajikistan","TJK","Honey","fabio" +"20146","Tajikistan","TJK","Silk","fabio" +"20147","Tajikistan","TJK","Fish, Seafood","fabio" +"20148","Tajikistan","TJK","Wood fuel","fabio" +"20149","Tajikistan","TJK","Industrial roundwood, coniferous","fabio" +"20150","Tajikistan","TJK","Industrial roundwood, non-coniferous","fabio" +"20151","Swaziland","SWZ","Rice (Milled Equivalent)","fabio" +"20152","Swaziland","SWZ","Wheat and products","fabio" +"20153","Swaziland","SWZ","Barley and products","fabio" +"20154","Swaziland","SWZ","Maize and products","fabio" +"20155","Swaziland","SWZ","Rye and products","fabio" +"20156","Swaziland","SWZ","Oats","fabio" +"20157","Swaziland","SWZ","Millet and products","fabio" +"20158","Swaziland","SWZ","Sorghum and products","fabio" +"20159","Swaziland","SWZ","Cereals, Other","fabio" +"20160","Swaziland","SWZ","Potatoes and products","fabio" +"20161","Swaziland","SWZ","Cassava and products","fabio" +"20162","Swaziland","SWZ","Sweet potatoes","fabio" +"20163","Swaziland","SWZ","Roots, Other","fabio" +"20164","Swaziland","SWZ","Yams","fabio" +"20165","Swaziland","SWZ","Sugar cane","fabio" +"20166","Swaziland","SWZ","Sugar beet","fabio" +"20167","Swaziland","SWZ","Beans","fabio" +"20168","Swaziland","SWZ","Peas","fabio" +"20169","Swaziland","SWZ","Pulses, Other and products","fabio" +"20170","Swaziland","SWZ","Nuts and products","fabio" +"20171","Swaziland","SWZ","Soyabeans","fabio" +"20172","Swaziland","SWZ","Groundnuts (Shelled Eq)","fabio" +"20173","Swaziland","SWZ","Sunflower seed","fabio" +"20174","Swaziland","SWZ","Rape and Mustardseed","fabio" +"20175","Swaziland","SWZ","Seed cotton","fabio" +"20176","Swaziland","SWZ","Coconuts - Incl Copra","fabio" +"20177","Swaziland","SWZ","Sesame seed","fabio" +"20178","Swaziland","SWZ","Oil, palm fruit","fabio" +"20179","Swaziland","SWZ","Olives (including preserved)","fabio" +"20180","Swaziland","SWZ","Oilcrops, Other","fabio" +"20181","Swaziland","SWZ","Tomatoes and products","fabio" +"20182","Swaziland","SWZ","Onions","fabio" +"20183","Swaziland","SWZ","Vegetables, Other","fabio" +"20184","Swaziland","SWZ","Oranges, Mandarines","fabio" +"20185","Swaziland","SWZ","Lemons, Limes and products","fabio" +"20186","Swaziland","SWZ","Grapefruit and products","fabio" +"20187","Swaziland","SWZ","Citrus, Other","fabio" +"20188","Swaziland","SWZ","Bananas","fabio" +"20189","Swaziland","SWZ","Plantains","fabio" +"20190","Swaziland","SWZ","Apples and products","fabio" +"20191","Swaziland","SWZ","Pineapples and products","fabio" +"20192","Swaziland","SWZ","Dates","fabio" +"20193","Swaziland","SWZ","Grapes and products (excl wine)","fabio" +"20194","Swaziland","SWZ","Fruits, Other","fabio" +"20195","Swaziland","SWZ","Coffee and products","fabio" +"20196","Swaziland","SWZ","Cocoa Beans and products","fabio" +"20197","Swaziland","SWZ","Tea (including mate)","fabio" +"20198","Swaziland","SWZ","Hops","fabio" +"20199","Swaziland","SWZ","Pepper","fabio" +"20200","Swaziland","SWZ","Pimento","fabio" +"20201","Swaziland","SWZ","Cloves","fabio" +"20202","Swaziland","SWZ","Spices, Other","fabio" +"20203","Swaziland","SWZ","Jute","fabio" +"20204","Swaziland","SWZ","Jute-Like Fibres","fabio" +"20205","Swaziland","SWZ","Soft-Fibres, Other","fabio" +"20206","Swaziland","SWZ","Sisal","fabio" +"20207","Swaziland","SWZ","Abaca","fabio" +"20208","Swaziland","SWZ","Hard Fibres, Other","fabio" +"20209","Swaziland","SWZ","Tobacco","fabio" +"20210","Swaziland","SWZ","Rubber","fabio" +"20211","Swaziland","SWZ","Fodder crops","fabio" +"20212","Swaziland","SWZ","Grazing","fabio" +"20213","Swaziland","SWZ","Cottonseed","fabio" +"20214","Swaziland","SWZ","Palm kernels","fabio" +"20215","Swaziland","SWZ","Sugar non-centrifugal","fabio" +"20216","Swaziland","SWZ","Molasses","fabio" +"20217","Swaziland","SWZ","Sugar, Refined Equiv","fabio" +"20218","Swaziland","SWZ","Sweeteners, Other","fabio" +"20219","Swaziland","SWZ","Soyabean Oil","fabio" +"20220","Swaziland","SWZ","Groundnut Oil","fabio" +"20221","Swaziland","SWZ","Sunflowerseed Oil","fabio" +"20222","Swaziland","SWZ","Rape and Mustard Oil","fabio" +"20223","Swaziland","SWZ","Cottonseed Oil","fabio" +"20224","Swaziland","SWZ","Palmkernel Oil","fabio" +"20225","Swaziland","SWZ","Palm Oil","fabio" +"20226","Swaziland","SWZ","Coconut Oil","fabio" +"20227","Swaziland","SWZ","Sesameseed Oil","fabio" +"20228","Swaziland","SWZ","Olive Oil","fabio" +"20229","Swaziland","SWZ","Ricebran Oil","fabio" +"20230","Swaziland","SWZ","Maize Germ Oil","fabio" +"20231","Swaziland","SWZ","Oilcrops Oil, Other","fabio" +"20232","Swaziland","SWZ","Soyabean Cake","fabio" +"20233","Swaziland","SWZ","Groundnut Cake","fabio" +"20234","Swaziland","SWZ","Sunflowerseed Cake","fabio" +"20235","Swaziland","SWZ","Rape and Mustard Cake","fabio" +"20236","Swaziland","SWZ","Cottonseed Cake","fabio" +"20237","Swaziland","SWZ","Palmkernel Cake","fabio" +"20238","Swaziland","SWZ","Copra Cake","fabio" +"20239","Swaziland","SWZ","Sesameseed Cake","fabio" +"20240","Swaziland","SWZ","Oilseed Cakes, Other","fabio" +"20241","Swaziland","SWZ","Wine","fabio" +"20242","Swaziland","SWZ","Beer","fabio" +"20243","Swaziland","SWZ","Beverages, Fermented","fabio" +"20244","Swaziland","SWZ","Beverages, Alcoholic","fabio" +"20245","Swaziland","SWZ","Alcohol, Non-Food","fabio" +"20246","Swaziland","SWZ","Cotton lint","fabio" +"20247","Swaziland","SWZ","Cattle","fabio" +"20248","Swaziland","SWZ","Buffaloes","fabio" +"20249","Swaziland","SWZ","Sheep","fabio" +"20250","Swaziland","SWZ","Goats","fabio" +"20251","Swaziland","SWZ","Pigs","fabio" +"20252","Swaziland","SWZ","Poultry Birds","fabio" +"20253","Swaziland","SWZ","Horses","fabio" +"20254","Swaziland","SWZ","Asses","fabio" +"20255","Swaziland","SWZ","Mules","fabio" +"20256","Swaziland","SWZ","Camels","fabio" +"20257","Swaziland","SWZ","Camelids, other","fabio" +"20258","Swaziland","SWZ","Rabbits and hares","fabio" +"20259","Swaziland","SWZ","Rodents, other","fabio" +"20260","Swaziland","SWZ","Live animals, other","fabio" +"20261","Swaziland","SWZ","Milk - Excluding Butter","fabio" +"20262","Swaziland","SWZ","Butter, Ghee","fabio" +"20263","Swaziland","SWZ","Eggs","fabio" +"20264","Swaziland","SWZ","Wool (Clean Eq.)","fabio" +"20265","Swaziland","SWZ","Bovine Meat","fabio" +"20266","Swaziland","SWZ","Mutton & Goat Meat","fabio" +"20267","Swaziland","SWZ","Pigmeat","fabio" +"20268","Swaziland","SWZ","Poultry Meat","fabio" +"20269","Swaziland","SWZ","Meat, Other","fabio" +"20270","Swaziland","SWZ","Offals, Edible","fabio" +"20271","Swaziland","SWZ","Fats, Animals, Raw","fabio" +"20272","Swaziland","SWZ","Hides and skins","fabio" +"20273","Swaziland","SWZ","Meat Meal","fabio" +"20274","Swaziland","SWZ","Pet food","fabio" +"20275","Swaziland","SWZ","Honey","fabio" +"20276","Swaziland","SWZ","Silk","fabio" +"20277","Swaziland","SWZ","Fish, Seafood","fabio" +"20278","Swaziland","SWZ","Wood fuel","fabio" +"20279","Swaziland","SWZ","Industrial roundwood, coniferous","fabio" +"20280","Swaziland","SWZ","Industrial roundwood, non-coniferous","fabio" +"20281","Sweden","SWE","Rice (Milled Equivalent)","fabio" +"20282","Sweden","SWE","Wheat and products","fabio" +"20283","Sweden","SWE","Barley and products","fabio" +"20284","Sweden","SWE","Maize and products","fabio" +"20285","Sweden","SWE","Rye and products","fabio" +"20286","Sweden","SWE","Oats","fabio" +"20287","Sweden","SWE","Millet and products","fabio" +"20288","Sweden","SWE","Sorghum and products","fabio" +"20289","Sweden","SWE","Cereals, Other","fabio" +"20290","Sweden","SWE","Potatoes and products","fabio" +"20291","Sweden","SWE","Cassava and products","fabio" +"20292","Sweden","SWE","Sweet potatoes","fabio" +"20293","Sweden","SWE","Roots, Other","fabio" +"20294","Sweden","SWE","Yams","fabio" +"20295","Sweden","SWE","Sugar cane","fabio" +"20296","Sweden","SWE","Sugar beet","fabio" +"20297","Sweden","SWE","Beans","fabio" +"20298","Sweden","SWE","Peas","fabio" +"20299","Sweden","SWE","Pulses, Other and products","fabio" +"20300","Sweden","SWE","Nuts and products","fabio" +"20301","Sweden","SWE","Soyabeans","fabio" +"20302","Sweden","SWE","Groundnuts (Shelled Eq)","fabio" +"20303","Sweden","SWE","Sunflower seed","fabio" +"20304","Sweden","SWE","Rape and Mustardseed","fabio" +"20305","Sweden","SWE","Seed cotton","fabio" +"20306","Sweden","SWE","Coconuts - Incl Copra","fabio" +"20307","Sweden","SWE","Sesame seed","fabio" +"20308","Sweden","SWE","Oil, palm fruit","fabio" +"20309","Sweden","SWE","Olives (including preserved)","fabio" +"20310","Sweden","SWE","Oilcrops, Other","fabio" +"20311","Sweden","SWE","Tomatoes and products","fabio" +"20312","Sweden","SWE","Onions","fabio" +"20313","Sweden","SWE","Vegetables, Other","fabio" +"20314","Sweden","SWE","Oranges, Mandarines","fabio" +"20315","Sweden","SWE","Lemons, Limes and products","fabio" +"20316","Sweden","SWE","Grapefruit and products","fabio" +"20317","Sweden","SWE","Citrus, Other","fabio" +"20318","Sweden","SWE","Bananas","fabio" +"20319","Sweden","SWE","Plantains","fabio" +"20320","Sweden","SWE","Apples and products","fabio" +"20321","Sweden","SWE","Pineapples and products","fabio" +"20322","Sweden","SWE","Dates","fabio" +"20323","Sweden","SWE","Grapes and products (excl wine)","fabio" +"20324","Sweden","SWE","Fruits, Other","fabio" +"20325","Sweden","SWE","Coffee and products","fabio" +"20326","Sweden","SWE","Cocoa Beans and products","fabio" +"20327","Sweden","SWE","Tea (including mate)","fabio" +"20328","Sweden","SWE","Hops","fabio" +"20329","Sweden","SWE","Pepper","fabio" +"20330","Sweden","SWE","Pimento","fabio" +"20331","Sweden","SWE","Cloves","fabio" +"20332","Sweden","SWE","Spices, Other","fabio" +"20333","Sweden","SWE","Jute","fabio" +"20334","Sweden","SWE","Jute-Like Fibres","fabio" +"20335","Sweden","SWE","Soft-Fibres, Other","fabio" +"20336","Sweden","SWE","Sisal","fabio" +"20337","Sweden","SWE","Abaca","fabio" +"20338","Sweden","SWE","Hard Fibres, Other","fabio" +"20339","Sweden","SWE","Tobacco","fabio" +"20340","Sweden","SWE","Rubber","fabio" +"20341","Sweden","SWE","Fodder crops","fabio" +"20342","Sweden","SWE","Grazing","fabio" +"20343","Sweden","SWE","Cottonseed","fabio" +"20344","Sweden","SWE","Palm kernels","fabio" +"20345","Sweden","SWE","Sugar non-centrifugal","fabio" +"20346","Sweden","SWE","Molasses","fabio" +"20347","Sweden","SWE","Sugar, Refined Equiv","fabio" +"20348","Sweden","SWE","Sweeteners, Other","fabio" +"20349","Sweden","SWE","Soyabean Oil","fabio" +"20350","Sweden","SWE","Groundnut Oil","fabio" +"20351","Sweden","SWE","Sunflowerseed Oil","fabio" +"20352","Sweden","SWE","Rape and Mustard Oil","fabio" +"20353","Sweden","SWE","Cottonseed Oil","fabio" +"20354","Sweden","SWE","Palmkernel Oil","fabio" +"20355","Sweden","SWE","Palm Oil","fabio" +"20356","Sweden","SWE","Coconut Oil","fabio" +"20357","Sweden","SWE","Sesameseed Oil","fabio" +"20358","Sweden","SWE","Olive Oil","fabio" +"20359","Sweden","SWE","Ricebran Oil","fabio" +"20360","Sweden","SWE","Maize Germ Oil","fabio" +"20361","Sweden","SWE","Oilcrops Oil, Other","fabio" +"20362","Sweden","SWE","Soyabean Cake","fabio" +"20363","Sweden","SWE","Groundnut Cake","fabio" +"20364","Sweden","SWE","Sunflowerseed Cake","fabio" +"20365","Sweden","SWE","Rape and Mustard Cake","fabio" +"20366","Sweden","SWE","Cottonseed Cake","fabio" +"20367","Sweden","SWE","Palmkernel Cake","fabio" +"20368","Sweden","SWE","Copra Cake","fabio" +"20369","Sweden","SWE","Sesameseed Cake","fabio" +"20370","Sweden","SWE","Oilseed Cakes, Other","fabio" +"20371","Sweden","SWE","Wine","fabio" +"20372","Sweden","SWE","Beer","fabio" +"20373","Sweden","SWE","Beverages, Fermented","fabio" +"20374","Sweden","SWE","Beverages, Alcoholic","fabio" +"20375","Sweden","SWE","Alcohol, Non-Food","fabio" +"20376","Sweden","SWE","Cotton lint","fabio" +"20377","Sweden","SWE","Cattle","fabio" +"20378","Sweden","SWE","Buffaloes","fabio" +"20379","Sweden","SWE","Sheep","fabio" +"20380","Sweden","SWE","Goats","fabio" +"20381","Sweden","SWE","Pigs","fabio" +"20382","Sweden","SWE","Poultry Birds","fabio" +"20383","Sweden","SWE","Horses","fabio" +"20384","Sweden","SWE","Asses","fabio" +"20385","Sweden","SWE","Mules","fabio" +"20386","Sweden","SWE","Camels","fabio" +"20387","Sweden","SWE","Camelids, other","fabio" +"20388","Sweden","SWE","Rabbits and hares","fabio" +"20389","Sweden","SWE","Rodents, other","fabio" +"20390","Sweden","SWE","Live animals, other","fabio" +"20391","Sweden","SWE","Milk - Excluding Butter","fabio" +"20392","Sweden","SWE","Butter, Ghee","fabio" +"20393","Sweden","SWE","Eggs","fabio" +"20394","Sweden","SWE","Wool (Clean Eq.)","fabio" +"20395","Sweden","SWE","Bovine Meat","fabio" +"20396","Sweden","SWE","Mutton & Goat Meat","fabio" +"20397","Sweden","SWE","Pigmeat","fabio" +"20398","Sweden","SWE","Poultry Meat","fabio" +"20399","Sweden","SWE","Meat, Other","fabio" +"20400","Sweden","SWE","Offals, Edible","fabio" +"20401","Sweden","SWE","Fats, Animals, Raw","fabio" +"20402","Sweden","SWE","Hides and skins","fabio" +"20403","Sweden","SWE","Meat Meal","fabio" +"20404","Sweden","SWE","Pet food","fabio" +"20405","Sweden","SWE","Honey","fabio" +"20406","Sweden","SWE","Silk","fabio" +"20407","Sweden","SWE","Fish, Seafood","fabio" +"20408","Sweden","SWE","Wood fuel","fabio" +"20409","Sweden","SWE","Industrial roundwood, coniferous","fabio" +"20410","Sweden","SWE","Industrial roundwood, non-coniferous","fabio" +"20411","Switzerland","CHE","Rice (Milled Equivalent)","fabio" +"20412","Switzerland","CHE","Wheat and products","fabio" +"20413","Switzerland","CHE","Barley and products","fabio" +"20414","Switzerland","CHE","Maize and products","fabio" +"20415","Switzerland","CHE","Rye and products","fabio" +"20416","Switzerland","CHE","Oats","fabio" +"20417","Switzerland","CHE","Millet and products","fabio" +"20418","Switzerland","CHE","Sorghum and products","fabio" +"20419","Switzerland","CHE","Cereals, Other","fabio" +"20420","Switzerland","CHE","Potatoes and products","fabio" +"20421","Switzerland","CHE","Cassava and products","fabio" +"20422","Switzerland","CHE","Sweet potatoes","fabio" +"20423","Switzerland","CHE","Roots, Other","fabio" +"20424","Switzerland","CHE","Yams","fabio" +"20425","Switzerland","CHE","Sugar cane","fabio" +"20426","Switzerland","CHE","Sugar beet","fabio" +"20427","Switzerland","CHE","Beans","fabio" +"20428","Switzerland","CHE","Peas","fabio" +"20429","Switzerland","CHE","Pulses, Other and products","fabio" +"20430","Switzerland","CHE","Nuts and products","fabio" +"20431","Switzerland","CHE","Soyabeans","fabio" +"20432","Switzerland","CHE","Groundnuts (Shelled Eq)","fabio" +"20433","Switzerland","CHE","Sunflower seed","fabio" +"20434","Switzerland","CHE","Rape and Mustardseed","fabio" +"20435","Switzerland","CHE","Seed cotton","fabio" +"20436","Switzerland","CHE","Coconuts - Incl Copra","fabio" +"20437","Switzerland","CHE","Sesame seed","fabio" +"20438","Switzerland","CHE","Oil, palm fruit","fabio" +"20439","Switzerland","CHE","Olives (including preserved)","fabio" +"20440","Switzerland","CHE","Oilcrops, Other","fabio" +"20441","Switzerland","CHE","Tomatoes and products","fabio" +"20442","Switzerland","CHE","Onions","fabio" +"20443","Switzerland","CHE","Vegetables, Other","fabio" +"20444","Switzerland","CHE","Oranges, Mandarines","fabio" +"20445","Switzerland","CHE","Lemons, Limes and products","fabio" +"20446","Switzerland","CHE","Grapefruit and products","fabio" +"20447","Switzerland","CHE","Citrus, Other","fabio" +"20448","Switzerland","CHE","Bananas","fabio" +"20449","Switzerland","CHE","Plantains","fabio" +"20450","Switzerland","CHE","Apples and products","fabio" +"20451","Switzerland","CHE","Pineapples and products","fabio" +"20452","Switzerland","CHE","Dates","fabio" +"20453","Switzerland","CHE","Grapes and products (excl wine)","fabio" +"20454","Switzerland","CHE","Fruits, Other","fabio" +"20455","Switzerland","CHE","Coffee and products","fabio" +"20456","Switzerland","CHE","Cocoa Beans and products","fabio" +"20457","Switzerland","CHE","Tea (including mate)","fabio" +"20458","Switzerland","CHE","Hops","fabio" +"20459","Switzerland","CHE","Pepper","fabio" +"20460","Switzerland","CHE","Pimento","fabio" +"20461","Switzerland","CHE","Cloves","fabio" +"20462","Switzerland","CHE","Spices, Other","fabio" +"20463","Switzerland","CHE","Jute","fabio" +"20464","Switzerland","CHE","Jute-Like Fibres","fabio" +"20465","Switzerland","CHE","Soft-Fibres, Other","fabio" +"20466","Switzerland","CHE","Sisal","fabio" +"20467","Switzerland","CHE","Abaca","fabio" +"20468","Switzerland","CHE","Hard Fibres, Other","fabio" +"20469","Switzerland","CHE","Tobacco","fabio" +"20470","Switzerland","CHE","Rubber","fabio" +"20471","Switzerland","CHE","Fodder crops","fabio" +"20472","Switzerland","CHE","Grazing","fabio" +"20473","Switzerland","CHE","Cottonseed","fabio" +"20474","Switzerland","CHE","Palm kernels","fabio" +"20475","Switzerland","CHE","Sugar non-centrifugal","fabio" +"20476","Switzerland","CHE","Molasses","fabio" +"20477","Switzerland","CHE","Sugar, Refined Equiv","fabio" +"20478","Switzerland","CHE","Sweeteners, Other","fabio" +"20479","Switzerland","CHE","Soyabean Oil","fabio" +"20480","Switzerland","CHE","Groundnut Oil","fabio" +"20481","Switzerland","CHE","Sunflowerseed Oil","fabio" +"20482","Switzerland","CHE","Rape and Mustard Oil","fabio" +"20483","Switzerland","CHE","Cottonseed Oil","fabio" +"20484","Switzerland","CHE","Palmkernel Oil","fabio" +"20485","Switzerland","CHE","Palm Oil","fabio" +"20486","Switzerland","CHE","Coconut Oil","fabio" +"20487","Switzerland","CHE","Sesameseed Oil","fabio" +"20488","Switzerland","CHE","Olive Oil","fabio" +"20489","Switzerland","CHE","Ricebran Oil","fabio" +"20490","Switzerland","CHE","Maize Germ Oil","fabio" +"20491","Switzerland","CHE","Oilcrops Oil, Other","fabio" +"20492","Switzerland","CHE","Soyabean Cake","fabio" +"20493","Switzerland","CHE","Groundnut Cake","fabio" +"20494","Switzerland","CHE","Sunflowerseed Cake","fabio" +"20495","Switzerland","CHE","Rape and Mustard Cake","fabio" +"20496","Switzerland","CHE","Cottonseed Cake","fabio" +"20497","Switzerland","CHE","Palmkernel Cake","fabio" +"20498","Switzerland","CHE","Copra Cake","fabio" +"20499","Switzerland","CHE","Sesameseed Cake","fabio" +"20500","Switzerland","CHE","Oilseed Cakes, Other","fabio" +"20501","Switzerland","CHE","Wine","fabio" +"20502","Switzerland","CHE","Beer","fabio" +"20503","Switzerland","CHE","Beverages, Fermented","fabio" +"20504","Switzerland","CHE","Beverages, Alcoholic","fabio" +"20505","Switzerland","CHE","Alcohol, Non-Food","fabio" +"20506","Switzerland","CHE","Cotton lint","fabio" +"20507","Switzerland","CHE","Cattle","fabio" +"20508","Switzerland","CHE","Buffaloes","fabio" +"20509","Switzerland","CHE","Sheep","fabio" +"20510","Switzerland","CHE","Goats","fabio" +"20511","Switzerland","CHE","Pigs","fabio" +"20512","Switzerland","CHE","Poultry Birds","fabio" +"20513","Switzerland","CHE","Horses","fabio" +"20514","Switzerland","CHE","Asses","fabio" +"20515","Switzerland","CHE","Mules","fabio" +"20516","Switzerland","CHE","Camels","fabio" +"20517","Switzerland","CHE","Camelids, other","fabio" +"20518","Switzerland","CHE","Rabbits and hares","fabio" +"20519","Switzerland","CHE","Rodents, other","fabio" +"20520","Switzerland","CHE","Live animals, other","fabio" +"20521","Switzerland","CHE","Milk - Excluding Butter","fabio" +"20522","Switzerland","CHE","Butter, Ghee","fabio" +"20523","Switzerland","CHE","Eggs","fabio" +"20524","Switzerland","CHE","Wool (Clean Eq.)","fabio" +"20525","Switzerland","CHE","Bovine Meat","fabio" +"20526","Switzerland","CHE","Mutton & Goat Meat","fabio" +"20527","Switzerland","CHE","Pigmeat","fabio" +"20528","Switzerland","CHE","Poultry Meat","fabio" +"20529","Switzerland","CHE","Meat, Other","fabio" +"20530","Switzerland","CHE","Offals, Edible","fabio" +"20531","Switzerland","CHE","Fats, Animals, Raw","fabio" +"20532","Switzerland","CHE","Hides and skins","fabio" +"20533","Switzerland","CHE","Meat Meal","fabio" +"20534","Switzerland","CHE","Pet food","fabio" +"20535","Switzerland","CHE","Honey","fabio" +"20536","Switzerland","CHE","Silk","fabio" +"20537","Switzerland","CHE","Fish, Seafood","fabio" +"20538","Switzerland","CHE","Wood fuel","fabio" +"20539","Switzerland","CHE","Industrial roundwood, coniferous","fabio" +"20540","Switzerland","CHE","Industrial roundwood, non-coniferous","fabio" +"20541","Syrian Arab Republic","SYR","Rice (Milled Equivalent)","fabio" +"20542","Syrian Arab Republic","SYR","Wheat and products","fabio" +"20543","Syrian Arab Republic","SYR","Barley and products","fabio" +"20544","Syrian Arab Republic","SYR","Maize and products","fabio" +"20545","Syrian Arab Republic","SYR","Rye and products","fabio" +"20546","Syrian Arab Republic","SYR","Oats","fabio" +"20547","Syrian Arab Republic","SYR","Millet and products","fabio" +"20548","Syrian Arab Republic","SYR","Sorghum and products","fabio" +"20549","Syrian Arab Republic","SYR","Cereals, Other","fabio" +"20550","Syrian Arab Republic","SYR","Potatoes and products","fabio" +"20551","Syrian Arab Republic","SYR","Cassava and products","fabio" +"20552","Syrian Arab Republic","SYR","Sweet potatoes","fabio" +"20553","Syrian Arab Republic","SYR","Roots, Other","fabio" +"20554","Syrian Arab Republic","SYR","Yams","fabio" +"20555","Syrian Arab Republic","SYR","Sugar cane","fabio" +"20556","Syrian Arab Republic","SYR","Sugar beet","fabio" +"20557","Syrian Arab Republic","SYR","Beans","fabio" +"20558","Syrian Arab Republic","SYR","Peas","fabio" +"20559","Syrian Arab Republic","SYR","Pulses, Other and products","fabio" +"20560","Syrian Arab Republic","SYR","Nuts and products","fabio" +"20561","Syrian Arab Republic","SYR","Soyabeans","fabio" +"20562","Syrian Arab Republic","SYR","Groundnuts (Shelled Eq)","fabio" +"20563","Syrian Arab Republic","SYR","Sunflower seed","fabio" +"20564","Syrian Arab Republic","SYR","Rape and Mustardseed","fabio" +"20565","Syrian Arab Republic","SYR","Seed cotton","fabio" +"20566","Syrian Arab Republic","SYR","Coconuts - Incl Copra","fabio" +"20567","Syrian Arab Republic","SYR","Sesame seed","fabio" +"20568","Syrian Arab Republic","SYR","Oil, palm fruit","fabio" +"20569","Syrian Arab Republic","SYR","Olives (including preserved)","fabio" +"20570","Syrian Arab Republic","SYR","Oilcrops, Other","fabio" +"20571","Syrian Arab Republic","SYR","Tomatoes and products","fabio" +"20572","Syrian Arab Republic","SYR","Onions","fabio" +"20573","Syrian Arab Republic","SYR","Vegetables, Other","fabio" +"20574","Syrian Arab Republic","SYR","Oranges, Mandarines","fabio" +"20575","Syrian Arab Republic","SYR","Lemons, Limes and products","fabio" +"20576","Syrian Arab Republic","SYR","Grapefruit and products","fabio" +"20577","Syrian Arab Republic","SYR","Citrus, Other","fabio" +"20578","Syrian Arab Republic","SYR","Bananas","fabio" +"20579","Syrian Arab Republic","SYR","Plantains","fabio" +"20580","Syrian Arab Republic","SYR","Apples and products","fabio" +"20581","Syrian Arab Republic","SYR","Pineapples and products","fabio" +"20582","Syrian Arab Republic","SYR","Dates","fabio" +"20583","Syrian Arab Republic","SYR","Grapes and products (excl wine)","fabio" +"20584","Syrian Arab Republic","SYR","Fruits, Other","fabio" +"20585","Syrian Arab Republic","SYR","Coffee and products","fabio" +"20586","Syrian Arab Republic","SYR","Cocoa Beans and products","fabio" +"20587","Syrian Arab Republic","SYR","Tea (including mate)","fabio" +"20588","Syrian Arab Republic","SYR","Hops","fabio" +"20589","Syrian Arab Republic","SYR","Pepper","fabio" +"20590","Syrian Arab Republic","SYR","Pimento","fabio" +"20591","Syrian Arab Republic","SYR","Cloves","fabio" +"20592","Syrian Arab Republic","SYR","Spices, Other","fabio" +"20593","Syrian Arab Republic","SYR","Jute","fabio" +"20594","Syrian Arab Republic","SYR","Jute-Like Fibres","fabio" +"20595","Syrian Arab Republic","SYR","Soft-Fibres, Other","fabio" +"20596","Syrian Arab Republic","SYR","Sisal","fabio" +"20597","Syrian Arab Republic","SYR","Abaca","fabio" +"20598","Syrian Arab Republic","SYR","Hard Fibres, Other","fabio" +"20599","Syrian Arab Republic","SYR","Tobacco","fabio" +"20600","Syrian Arab Republic","SYR","Rubber","fabio" +"20601","Syrian Arab Republic","SYR","Fodder crops","fabio" +"20602","Syrian Arab Republic","SYR","Grazing","fabio" +"20603","Syrian Arab Republic","SYR","Cottonseed","fabio" +"20604","Syrian Arab Republic","SYR","Palm kernels","fabio" +"20605","Syrian Arab Republic","SYR","Sugar non-centrifugal","fabio" +"20606","Syrian Arab Republic","SYR","Molasses","fabio" +"20607","Syrian Arab Republic","SYR","Sugar, Refined Equiv","fabio" +"20608","Syrian Arab Republic","SYR","Sweeteners, Other","fabio" +"20609","Syrian Arab Republic","SYR","Soyabean Oil","fabio" +"20610","Syrian Arab Republic","SYR","Groundnut Oil","fabio" +"20611","Syrian Arab Republic","SYR","Sunflowerseed Oil","fabio" +"20612","Syrian Arab Republic","SYR","Rape and Mustard Oil","fabio" +"20613","Syrian Arab Republic","SYR","Cottonseed Oil","fabio" +"20614","Syrian Arab Republic","SYR","Palmkernel Oil","fabio" +"20615","Syrian Arab Republic","SYR","Palm Oil","fabio" +"20616","Syrian Arab Republic","SYR","Coconut Oil","fabio" +"20617","Syrian Arab Republic","SYR","Sesameseed Oil","fabio" +"20618","Syrian Arab Republic","SYR","Olive Oil","fabio" +"20619","Syrian Arab Republic","SYR","Ricebran Oil","fabio" +"20620","Syrian Arab Republic","SYR","Maize Germ Oil","fabio" +"20621","Syrian Arab Republic","SYR","Oilcrops Oil, Other","fabio" +"20622","Syrian Arab Republic","SYR","Soyabean Cake","fabio" +"20623","Syrian Arab Republic","SYR","Groundnut Cake","fabio" +"20624","Syrian Arab Republic","SYR","Sunflowerseed Cake","fabio" +"20625","Syrian Arab Republic","SYR","Rape and Mustard Cake","fabio" +"20626","Syrian Arab Republic","SYR","Cottonseed Cake","fabio" +"20627","Syrian Arab Republic","SYR","Palmkernel Cake","fabio" +"20628","Syrian Arab Republic","SYR","Copra Cake","fabio" +"20629","Syrian Arab Republic","SYR","Sesameseed Cake","fabio" +"20630","Syrian Arab Republic","SYR","Oilseed Cakes, Other","fabio" +"20631","Syrian Arab Republic","SYR","Wine","fabio" +"20632","Syrian Arab Republic","SYR","Beer","fabio" +"20633","Syrian Arab Republic","SYR","Beverages, Fermented","fabio" +"20634","Syrian Arab Republic","SYR","Beverages, Alcoholic","fabio" +"20635","Syrian Arab Republic","SYR","Alcohol, Non-Food","fabio" +"20636","Syrian Arab Republic","SYR","Cotton lint","fabio" +"20637","Syrian Arab Republic","SYR","Cattle","fabio" +"20638","Syrian Arab Republic","SYR","Buffaloes","fabio" +"20639","Syrian Arab Republic","SYR","Sheep","fabio" +"20640","Syrian Arab Republic","SYR","Goats","fabio" +"20641","Syrian Arab Republic","SYR","Pigs","fabio" +"20642","Syrian Arab Republic","SYR","Poultry Birds","fabio" +"20643","Syrian Arab Republic","SYR","Horses","fabio" +"20644","Syrian Arab Republic","SYR","Asses","fabio" +"20645","Syrian Arab Republic","SYR","Mules","fabio" +"20646","Syrian Arab Republic","SYR","Camels","fabio" +"20647","Syrian Arab Republic","SYR","Camelids, other","fabio" +"20648","Syrian Arab Republic","SYR","Rabbits and hares","fabio" +"20649","Syrian Arab Republic","SYR","Rodents, other","fabio" +"20650","Syrian Arab Republic","SYR","Live animals, other","fabio" +"20651","Syrian Arab Republic","SYR","Milk - Excluding Butter","fabio" +"20652","Syrian Arab Republic","SYR","Butter, Ghee","fabio" +"20653","Syrian Arab Republic","SYR","Eggs","fabio" +"20654","Syrian Arab Republic","SYR","Wool (Clean Eq.)","fabio" +"20655","Syrian Arab Republic","SYR","Bovine Meat","fabio" +"20656","Syrian Arab Republic","SYR","Mutton & Goat Meat","fabio" +"20657","Syrian Arab Republic","SYR","Pigmeat","fabio" +"20658","Syrian Arab Republic","SYR","Poultry Meat","fabio" +"20659","Syrian Arab Republic","SYR","Meat, Other","fabio" +"20660","Syrian Arab Republic","SYR","Offals, Edible","fabio" +"20661","Syrian Arab Republic","SYR","Fats, Animals, Raw","fabio" +"20662","Syrian Arab Republic","SYR","Hides and skins","fabio" +"20663","Syrian Arab Republic","SYR","Meat Meal","fabio" +"20664","Syrian Arab Republic","SYR","Pet food","fabio" +"20665","Syrian Arab Republic","SYR","Honey","fabio" +"20666","Syrian Arab Republic","SYR","Silk","fabio" +"20667","Syrian Arab Republic","SYR","Fish, Seafood","fabio" +"20668","Syrian Arab Republic","SYR","Wood fuel","fabio" +"20669","Syrian Arab Republic","SYR","Industrial roundwood, coniferous","fabio" +"20670","Syrian Arab Republic","SYR","Industrial roundwood, non-coniferous","fabio" +"20671","Turkmenistan","TKM","Rice (Milled Equivalent)","fabio" +"20672","Turkmenistan","TKM","Wheat and products","fabio" +"20673","Turkmenistan","TKM","Barley and products","fabio" +"20674","Turkmenistan","TKM","Maize and products","fabio" +"20675","Turkmenistan","TKM","Rye and products","fabio" +"20676","Turkmenistan","TKM","Oats","fabio" +"20677","Turkmenistan","TKM","Millet and products","fabio" +"20678","Turkmenistan","TKM","Sorghum and products","fabio" +"20679","Turkmenistan","TKM","Cereals, Other","fabio" +"20680","Turkmenistan","TKM","Potatoes and products","fabio" +"20681","Turkmenistan","TKM","Cassava and products","fabio" +"20682","Turkmenistan","TKM","Sweet potatoes","fabio" +"20683","Turkmenistan","TKM","Roots, Other","fabio" +"20684","Turkmenistan","TKM","Yams","fabio" +"20685","Turkmenistan","TKM","Sugar cane","fabio" +"20686","Turkmenistan","TKM","Sugar beet","fabio" +"20687","Turkmenistan","TKM","Beans","fabio" +"20688","Turkmenistan","TKM","Peas","fabio" +"20689","Turkmenistan","TKM","Pulses, Other and products","fabio" +"20690","Turkmenistan","TKM","Nuts and products","fabio" +"20691","Turkmenistan","TKM","Soyabeans","fabio" +"20692","Turkmenistan","TKM","Groundnuts (Shelled Eq)","fabio" +"20693","Turkmenistan","TKM","Sunflower seed","fabio" +"20694","Turkmenistan","TKM","Rape and Mustardseed","fabio" +"20695","Turkmenistan","TKM","Seed cotton","fabio" +"20696","Turkmenistan","TKM","Coconuts - Incl Copra","fabio" +"20697","Turkmenistan","TKM","Sesame seed","fabio" +"20698","Turkmenistan","TKM","Oil, palm fruit","fabio" +"20699","Turkmenistan","TKM","Olives (including preserved)","fabio" +"20700","Turkmenistan","TKM","Oilcrops, Other","fabio" +"20701","Turkmenistan","TKM","Tomatoes and products","fabio" +"20702","Turkmenistan","TKM","Onions","fabio" +"20703","Turkmenistan","TKM","Vegetables, Other","fabio" +"20704","Turkmenistan","TKM","Oranges, Mandarines","fabio" +"20705","Turkmenistan","TKM","Lemons, Limes and products","fabio" +"20706","Turkmenistan","TKM","Grapefruit and products","fabio" +"20707","Turkmenistan","TKM","Citrus, Other","fabio" +"20708","Turkmenistan","TKM","Bananas","fabio" +"20709","Turkmenistan","TKM","Plantains","fabio" +"20710","Turkmenistan","TKM","Apples and products","fabio" +"20711","Turkmenistan","TKM","Pineapples and products","fabio" +"20712","Turkmenistan","TKM","Dates","fabio" +"20713","Turkmenistan","TKM","Grapes and products (excl wine)","fabio" +"20714","Turkmenistan","TKM","Fruits, Other","fabio" +"20715","Turkmenistan","TKM","Coffee and products","fabio" +"20716","Turkmenistan","TKM","Cocoa Beans and products","fabio" +"20717","Turkmenistan","TKM","Tea (including mate)","fabio" +"20718","Turkmenistan","TKM","Hops","fabio" +"20719","Turkmenistan","TKM","Pepper","fabio" +"20720","Turkmenistan","TKM","Pimento","fabio" +"20721","Turkmenistan","TKM","Cloves","fabio" +"20722","Turkmenistan","TKM","Spices, Other","fabio" +"20723","Turkmenistan","TKM","Jute","fabio" +"20724","Turkmenistan","TKM","Jute-Like Fibres","fabio" +"20725","Turkmenistan","TKM","Soft-Fibres, Other","fabio" +"20726","Turkmenistan","TKM","Sisal","fabio" +"20727","Turkmenistan","TKM","Abaca","fabio" +"20728","Turkmenistan","TKM","Hard Fibres, Other","fabio" +"20729","Turkmenistan","TKM","Tobacco","fabio" +"20730","Turkmenistan","TKM","Rubber","fabio" +"20731","Turkmenistan","TKM","Fodder crops","fabio" +"20732","Turkmenistan","TKM","Grazing","fabio" +"20733","Turkmenistan","TKM","Cottonseed","fabio" +"20734","Turkmenistan","TKM","Palm kernels","fabio" +"20735","Turkmenistan","TKM","Sugar non-centrifugal","fabio" +"20736","Turkmenistan","TKM","Molasses","fabio" +"20737","Turkmenistan","TKM","Sugar, Refined Equiv","fabio" +"20738","Turkmenistan","TKM","Sweeteners, Other","fabio" +"20739","Turkmenistan","TKM","Soyabean Oil","fabio" +"20740","Turkmenistan","TKM","Groundnut Oil","fabio" +"20741","Turkmenistan","TKM","Sunflowerseed Oil","fabio" +"20742","Turkmenistan","TKM","Rape and Mustard Oil","fabio" +"20743","Turkmenistan","TKM","Cottonseed Oil","fabio" +"20744","Turkmenistan","TKM","Palmkernel Oil","fabio" +"20745","Turkmenistan","TKM","Palm Oil","fabio" +"20746","Turkmenistan","TKM","Coconut Oil","fabio" +"20747","Turkmenistan","TKM","Sesameseed Oil","fabio" +"20748","Turkmenistan","TKM","Olive Oil","fabio" +"20749","Turkmenistan","TKM","Ricebran Oil","fabio" +"20750","Turkmenistan","TKM","Maize Germ Oil","fabio" +"20751","Turkmenistan","TKM","Oilcrops Oil, Other","fabio" +"20752","Turkmenistan","TKM","Soyabean Cake","fabio" +"20753","Turkmenistan","TKM","Groundnut Cake","fabio" +"20754","Turkmenistan","TKM","Sunflowerseed Cake","fabio" +"20755","Turkmenistan","TKM","Rape and Mustard Cake","fabio" +"20756","Turkmenistan","TKM","Cottonseed Cake","fabio" +"20757","Turkmenistan","TKM","Palmkernel Cake","fabio" +"20758","Turkmenistan","TKM","Copra Cake","fabio" +"20759","Turkmenistan","TKM","Sesameseed Cake","fabio" +"20760","Turkmenistan","TKM","Oilseed Cakes, Other","fabio" +"20761","Turkmenistan","TKM","Wine","fabio" +"20762","Turkmenistan","TKM","Beer","fabio" +"20763","Turkmenistan","TKM","Beverages, Fermented","fabio" +"20764","Turkmenistan","TKM","Beverages, Alcoholic","fabio" +"20765","Turkmenistan","TKM","Alcohol, Non-Food","fabio" +"20766","Turkmenistan","TKM","Cotton lint","fabio" +"20767","Turkmenistan","TKM","Cattle","fabio" +"20768","Turkmenistan","TKM","Buffaloes","fabio" +"20769","Turkmenistan","TKM","Sheep","fabio" +"20770","Turkmenistan","TKM","Goats","fabio" +"20771","Turkmenistan","TKM","Pigs","fabio" +"20772","Turkmenistan","TKM","Poultry Birds","fabio" +"20773","Turkmenistan","TKM","Horses","fabio" +"20774","Turkmenistan","TKM","Asses","fabio" +"20775","Turkmenistan","TKM","Mules","fabio" +"20776","Turkmenistan","TKM","Camels","fabio" +"20777","Turkmenistan","TKM","Camelids, other","fabio" +"20778","Turkmenistan","TKM","Rabbits and hares","fabio" +"20779","Turkmenistan","TKM","Rodents, other","fabio" +"20780","Turkmenistan","TKM","Live animals, other","fabio" +"20781","Turkmenistan","TKM","Milk - Excluding Butter","fabio" +"20782","Turkmenistan","TKM","Butter, Ghee","fabio" +"20783","Turkmenistan","TKM","Eggs","fabio" +"20784","Turkmenistan","TKM","Wool (Clean Eq.)","fabio" +"20785","Turkmenistan","TKM","Bovine Meat","fabio" +"20786","Turkmenistan","TKM","Mutton & Goat Meat","fabio" +"20787","Turkmenistan","TKM","Pigmeat","fabio" +"20788","Turkmenistan","TKM","Poultry Meat","fabio" +"20789","Turkmenistan","TKM","Meat, Other","fabio" +"20790","Turkmenistan","TKM","Offals, Edible","fabio" +"20791","Turkmenistan","TKM","Fats, Animals, Raw","fabio" +"20792","Turkmenistan","TKM","Hides and skins","fabio" +"20793","Turkmenistan","TKM","Meat Meal","fabio" +"20794","Turkmenistan","TKM","Pet food","fabio" +"20795","Turkmenistan","TKM","Honey","fabio" +"20796","Turkmenistan","TKM","Silk","fabio" +"20797","Turkmenistan","TKM","Fish, Seafood","fabio" +"20798","Turkmenistan","TKM","Wood fuel","fabio" +"20799","Turkmenistan","TKM","Industrial roundwood, coniferous","fabio" +"20800","Turkmenistan","TKM","Industrial roundwood, non-coniferous","fabio" +"20801","China, Taiwan Province of","TWN","Rice (Milled Equivalent)","fabio" +"20802","China, Taiwan Province of","TWN","Wheat and products","fabio" +"20803","China, Taiwan Province of","TWN","Barley and products","fabio" +"20804","China, Taiwan Province of","TWN","Maize and products","fabio" +"20805","China, Taiwan Province of","TWN","Rye and products","fabio" +"20806","China, Taiwan Province of","TWN","Oats","fabio" +"20807","China, Taiwan Province of","TWN","Millet and products","fabio" +"20808","China, Taiwan Province of","TWN","Sorghum and products","fabio" +"20809","China, Taiwan Province of","TWN","Cereals, Other","fabio" +"20810","China, Taiwan Province of","TWN","Potatoes and products","fabio" +"20811","China, Taiwan Province of","TWN","Cassava and products","fabio" +"20812","China, Taiwan Province of","TWN","Sweet potatoes","fabio" +"20813","China, Taiwan Province of","TWN","Roots, Other","fabio" +"20814","China, Taiwan Province of","TWN","Yams","fabio" +"20815","China, Taiwan Province of","TWN","Sugar cane","fabio" +"20816","China, Taiwan Province of","TWN","Sugar beet","fabio" +"20817","China, Taiwan Province of","TWN","Beans","fabio" +"20818","China, Taiwan Province of","TWN","Peas","fabio" +"20819","China, Taiwan Province of","TWN","Pulses, Other and products","fabio" +"20820","China, Taiwan Province of","TWN","Nuts and products","fabio" +"20821","China, Taiwan Province of","TWN","Soyabeans","fabio" +"20822","China, Taiwan Province of","TWN","Groundnuts (Shelled Eq)","fabio" +"20823","China, Taiwan Province of","TWN","Sunflower seed","fabio" +"20824","China, Taiwan Province of","TWN","Rape and Mustardseed","fabio" +"20825","China, Taiwan Province of","TWN","Seed cotton","fabio" +"20826","China, Taiwan Province of","TWN","Coconuts - Incl Copra","fabio" +"20827","China, Taiwan Province of","TWN","Sesame seed","fabio" +"20828","China, Taiwan Province of","TWN","Oil, palm fruit","fabio" +"20829","China, Taiwan Province of","TWN","Olives (including preserved)","fabio" +"20830","China, Taiwan Province of","TWN","Oilcrops, Other","fabio" +"20831","China, Taiwan Province of","TWN","Tomatoes and products","fabio" +"20832","China, Taiwan Province of","TWN","Onions","fabio" +"20833","China, Taiwan Province of","TWN","Vegetables, Other","fabio" +"20834","China, Taiwan Province of","TWN","Oranges, Mandarines","fabio" +"20835","China, Taiwan Province of","TWN","Lemons, Limes and products","fabio" +"20836","China, Taiwan Province of","TWN","Grapefruit and products","fabio" +"20837","China, Taiwan Province of","TWN","Citrus, Other","fabio" +"20838","China, Taiwan Province of","TWN","Bananas","fabio" +"20839","China, Taiwan Province of","TWN","Plantains","fabio" +"20840","China, Taiwan Province of","TWN","Apples and products","fabio" +"20841","China, Taiwan Province of","TWN","Pineapples and products","fabio" +"20842","China, Taiwan Province of","TWN","Dates","fabio" +"20843","China, Taiwan Province of","TWN","Grapes and products (excl wine)","fabio" +"20844","China, Taiwan Province of","TWN","Fruits, Other","fabio" +"20845","China, Taiwan Province of","TWN","Coffee and products","fabio" +"20846","China, Taiwan Province of","TWN","Cocoa Beans and products","fabio" +"20847","China, Taiwan Province of","TWN","Tea (including mate)","fabio" +"20848","China, Taiwan Province of","TWN","Hops","fabio" +"20849","China, Taiwan Province of","TWN","Pepper","fabio" +"20850","China, Taiwan Province of","TWN","Pimento","fabio" +"20851","China, Taiwan Province of","TWN","Cloves","fabio" +"20852","China, Taiwan Province of","TWN","Spices, Other","fabio" +"20853","China, Taiwan Province of","TWN","Jute","fabio" +"20854","China, Taiwan Province of","TWN","Jute-Like Fibres","fabio" +"20855","China, Taiwan Province of","TWN","Soft-Fibres, Other","fabio" +"20856","China, Taiwan Province of","TWN","Sisal","fabio" +"20857","China, Taiwan Province of","TWN","Abaca","fabio" +"20858","China, Taiwan Province of","TWN","Hard Fibres, Other","fabio" +"20859","China, Taiwan Province of","TWN","Tobacco","fabio" +"20860","China, Taiwan Province of","TWN","Rubber","fabio" +"20861","China, Taiwan Province of","TWN","Fodder crops","fabio" +"20862","China, Taiwan Province of","TWN","Grazing","fabio" +"20863","China, Taiwan Province of","TWN","Cottonseed","fabio" +"20864","China, Taiwan Province of","TWN","Palm kernels","fabio" +"20865","China, Taiwan Province of","TWN","Sugar non-centrifugal","fabio" +"20866","China, Taiwan Province of","TWN","Molasses","fabio" +"20867","China, Taiwan Province of","TWN","Sugar, Refined Equiv","fabio" +"20868","China, Taiwan Province of","TWN","Sweeteners, Other","fabio" +"20869","China, Taiwan Province of","TWN","Soyabean Oil","fabio" +"20870","China, Taiwan Province of","TWN","Groundnut Oil","fabio" +"20871","China, Taiwan Province of","TWN","Sunflowerseed Oil","fabio" +"20872","China, Taiwan Province of","TWN","Rape and Mustard Oil","fabio" +"20873","China, Taiwan Province of","TWN","Cottonseed Oil","fabio" +"20874","China, Taiwan Province of","TWN","Palmkernel Oil","fabio" +"20875","China, Taiwan Province of","TWN","Palm Oil","fabio" +"20876","China, Taiwan Province of","TWN","Coconut Oil","fabio" +"20877","China, Taiwan Province of","TWN","Sesameseed Oil","fabio" +"20878","China, Taiwan Province of","TWN","Olive Oil","fabio" +"20879","China, Taiwan Province of","TWN","Ricebran Oil","fabio" +"20880","China, Taiwan Province of","TWN","Maize Germ Oil","fabio" +"20881","China, Taiwan Province of","TWN","Oilcrops Oil, Other","fabio" +"20882","China, Taiwan Province of","TWN","Soyabean Cake","fabio" +"20883","China, Taiwan Province of","TWN","Groundnut Cake","fabio" +"20884","China, Taiwan Province of","TWN","Sunflowerseed Cake","fabio" +"20885","China, Taiwan Province of","TWN","Rape and Mustard Cake","fabio" +"20886","China, Taiwan Province of","TWN","Cottonseed Cake","fabio" +"20887","China, Taiwan Province of","TWN","Palmkernel Cake","fabio" +"20888","China, Taiwan Province of","TWN","Copra Cake","fabio" +"20889","China, Taiwan Province of","TWN","Sesameseed Cake","fabio" +"20890","China, Taiwan Province of","TWN","Oilseed Cakes, Other","fabio" +"20891","China, Taiwan Province of","TWN","Wine","fabio" +"20892","China, Taiwan Province of","TWN","Beer","fabio" +"20893","China, Taiwan Province of","TWN","Beverages, Fermented","fabio" +"20894","China, Taiwan Province of","TWN","Beverages, Alcoholic","fabio" +"20895","China, Taiwan Province of","TWN","Alcohol, Non-Food","fabio" +"20896","China, Taiwan Province of","TWN","Cotton lint","fabio" +"20897","China, Taiwan Province of","TWN","Cattle","fabio" +"20898","China, Taiwan Province of","TWN","Buffaloes","fabio" +"20899","China, Taiwan Province of","TWN","Sheep","fabio" +"20900","China, Taiwan Province of","TWN","Goats","fabio" +"20901","China, Taiwan Province of","TWN","Pigs","fabio" +"20902","China, Taiwan Province of","TWN","Poultry Birds","fabio" +"20903","China, Taiwan Province of","TWN","Horses","fabio" +"20904","China, Taiwan Province of","TWN","Asses","fabio" +"20905","China, Taiwan Province of","TWN","Mules","fabio" +"20906","China, Taiwan Province of","TWN","Camels","fabio" +"20907","China, Taiwan Province of","TWN","Camelids, other","fabio" +"20908","China, Taiwan Province of","TWN","Rabbits and hares","fabio" +"20909","China, Taiwan Province of","TWN","Rodents, other","fabio" +"20910","China, Taiwan Province of","TWN","Live animals, other","fabio" +"20911","China, Taiwan Province of","TWN","Milk - Excluding Butter","fabio" +"20912","China, Taiwan Province of","TWN","Butter, Ghee","fabio" +"20913","China, Taiwan Province of","TWN","Eggs","fabio" +"20914","China, Taiwan Province of","TWN","Wool (Clean Eq.)","fabio" +"20915","China, Taiwan Province of","TWN","Bovine Meat","fabio" +"20916","China, Taiwan Province of","TWN","Mutton & Goat Meat","fabio" +"20917","China, Taiwan Province of","TWN","Pigmeat","fabio" +"20918","China, Taiwan Province of","TWN","Poultry Meat","fabio" +"20919","China, Taiwan Province of","TWN","Meat, Other","fabio" +"20920","China, Taiwan Province of","TWN","Offals, Edible","fabio" +"20921","China, Taiwan Province of","TWN","Fats, Animals, Raw","fabio" +"20922","China, Taiwan Province of","TWN","Hides and skins","fabio" +"20923","China, Taiwan Province of","TWN","Meat Meal","fabio" +"20924","China, Taiwan Province of","TWN","Pet food","fabio" +"20925","China, Taiwan Province of","TWN","Honey","fabio" +"20926","China, Taiwan Province of","TWN","Silk","fabio" +"20927","China, Taiwan Province of","TWN","Fish, Seafood","fabio" +"20928","China, Taiwan Province of","TWN","Wood fuel","fabio" +"20929","China, Taiwan Province of","TWN","Industrial roundwood, coniferous","fabio" +"20930","China, Taiwan Province of","TWN","Industrial roundwood, non-coniferous","fabio" +"20931","United Republic of Tanzania","TZA","Rice (Milled Equivalent)","fabio" +"20932","United Republic of Tanzania","TZA","Wheat and products","fabio" +"20933","United Republic of Tanzania","TZA","Barley and products","fabio" +"20934","United Republic of Tanzania","TZA","Maize and products","fabio" +"20935","United Republic of Tanzania","TZA","Rye and products","fabio" +"20936","United Republic of Tanzania","TZA","Oats","fabio" +"20937","United Republic of Tanzania","TZA","Millet and products","fabio" +"20938","United Republic of Tanzania","TZA","Sorghum and products","fabio" +"20939","United Republic of Tanzania","TZA","Cereals, Other","fabio" +"20940","United Republic of Tanzania","TZA","Potatoes and products","fabio" +"20941","United Republic of Tanzania","TZA","Cassava and products","fabio" +"20942","United Republic of Tanzania","TZA","Sweet potatoes","fabio" +"20943","United Republic of Tanzania","TZA","Roots, Other","fabio" +"20944","United Republic of Tanzania","TZA","Yams","fabio" +"20945","United Republic of Tanzania","TZA","Sugar cane","fabio" +"20946","United Republic of Tanzania","TZA","Sugar beet","fabio" +"20947","United Republic of Tanzania","TZA","Beans","fabio" +"20948","United Republic of Tanzania","TZA","Peas","fabio" +"20949","United Republic of Tanzania","TZA","Pulses, Other and products","fabio" +"20950","United Republic of Tanzania","TZA","Nuts and products","fabio" +"20951","United Republic of Tanzania","TZA","Soyabeans","fabio" +"20952","United Republic of Tanzania","TZA","Groundnuts (Shelled Eq)","fabio" +"20953","United Republic of Tanzania","TZA","Sunflower seed","fabio" +"20954","United Republic of Tanzania","TZA","Rape and Mustardseed","fabio" +"20955","United Republic of Tanzania","TZA","Seed cotton","fabio" +"20956","United Republic of Tanzania","TZA","Coconuts - Incl Copra","fabio" +"20957","United Republic of Tanzania","TZA","Sesame seed","fabio" +"20958","United Republic of Tanzania","TZA","Oil, palm fruit","fabio" +"20959","United Republic of Tanzania","TZA","Olives (including preserved)","fabio" +"20960","United Republic of Tanzania","TZA","Oilcrops, Other","fabio" +"20961","United Republic of Tanzania","TZA","Tomatoes and products","fabio" +"20962","United Republic of Tanzania","TZA","Onions","fabio" +"20963","United Republic of Tanzania","TZA","Vegetables, Other","fabio" +"20964","United Republic of Tanzania","TZA","Oranges, Mandarines","fabio" +"20965","United Republic of Tanzania","TZA","Lemons, Limes and products","fabio" +"20966","United Republic of Tanzania","TZA","Grapefruit and products","fabio" +"20967","United Republic of Tanzania","TZA","Citrus, Other","fabio" +"20968","United Republic of Tanzania","TZA","Bananas","fabio" +"20969","United Republic of Tanzania","TZA","Plantains","fabio" +"20970","United Republic of Tanzania","TZA","Apples and products","fabio" +"20971","United Republic of Tanzania","TZA","Pineapples and products","fabio" +"20972","United Republic of Tanzania","TZA","Dates","fabio" +"20973","United Republic of Tanzania","TZA","Grapes and products (excl wine)","fabio" +"20974","United Republic of Tanzania","TZA","Fruits, Other","fabio" +"20975","United Republic of Tanzania","TZA","Coffee and products","fabio" +"20976","United Republic of Tanzania","TZA","Cocoa Beans and products","fabio" +"20977","United Republic of Tanzania","TZA","Tea (including mate)","fabio" +"20978","United Republic of Tanzania","TZA","Hops","fabio" +"20979","United Republic of Tanzania","TZA","Pepper","fabio" +"20980","United Republic of Tanzania","TZA","Pimento","fabio" +"20981","United Republic of Tanzania","TZA","Cloves","fabio" +"20982","United Republic of Tanzania","TZA","Spices, Other","fabio" +"20983","United Republic of Tanzania","TZA","Jute","fabio" +"20984","United Republic of Tanzania","TZA","Jute-Like Fibres","fabio" +"20985","United Republic of Tanzania","TZA","Soft-Fibres, Other","fabio" +"20986","United Republic of Tanzania","TZA","Sisal","fabio" +"20987","United Republic of Tanzania","TZA","Abaca","fabio" +"20988","United Republic of Tanzania","TZA","Hard Fibres, Other","fabio" +"20989","United Republic of Tanzania","TZA","Tobacco","fabio" +"20990","United Republic of Tanzania","TZA","Rubber","fabio" +"20991","United Republic of Tanzania","TZA","Fodder crops","fabio" +"20992","United Republic of Tanzania","TZA","Grazing","fabio" +"20993","United Republic of Tanzania","TZA","Cottonseed","fabio" +"20994","United Republic of Tanzania","TZA","Palm kernels","fabio" +"20995","United Republic of Tanzania","TZA","Sugar non-centrifugal","fabio" +"20996","United Republic of Tanzania","TZA","Molasses","fabio" +"20997","United Republic of Tanzania","TZA","Sugar, Refined Equiv","fabio" +"20998","United Republic of Tanzania","TZA","Sweeteners, Other","fabio" +"20999","United Republic of Tanzania","TZA","Soyabean Oil","fabio" +"21000","United Republic of Tanzania","TZA","Groundnut Oil","fabio" +"21001","United Republic of Tanzania","TZA","Sunflowerseed Oil","fabio" +"21002","United Republic of Tanzania","TZA","Rape and Mustard Oil","fabio" +"21003","United Republic of Tanzania","TZA","Cottonseed Oil","fabio" +"21004","United Republic of Tanzania","TZA","Palmkernel Oil","fabio" +"21005","United Republic of Tanzania","TZA","Palm Oil","fabio" +"21006","United Republic of Tanzania","TZA","Coconut Oil","fabio" +"21007","United Republic of Tanzania","TZA","Sesameseed Oil","fabio" +"21008","United Republic of Tanzania","TZA","Olive Oil","fabio" +"21009","United Republic of Tanzania","TZA","Ricebran Oil","fabio" +"21010","United Republic of Tanzania","TZA","Maize Germ Oil","fabio" +"21011","United Republic of Tanzania","TZA","Oilcrops Oil, Other","fabio" +"21012","United Republic of Tanzania","TZA","Soyabean Cake","fabio" +"21013","United Republic of Tanzania","TZA","Groundnut Cake","fabio" +"21014","United Republic of Tanzania","TZA","Sunflowerseed Cake","fabio" +"21015","United Republic of Tanzania","TZA","Rape and Mustard Cake","fabio" +"21016","United Republic of Tanzania","TZA","Cottonseed Cake","fabio" +"21017","United Republic of Tanzania","TZA","Palmkernel Cake","fabio" +"21018","United Republic of Tanzania","TZA","Copra Cake","fabio" +"21019","United Republic of Tanzania","TZA","Sesameseed Cake","fabio" +"21020","United Republic of Tanzania","TZA","Oilseed Cakes, Other","fabio" +"21021","United Republic of Tanzania","TZA","Wine","fabio" +"21022","United Republic of Tanzania","TZA","Beer","fabio" +"21023","United Republic of Tanzania","TZA","Beverages, Fermented","fabio" +"21024","United Republic of Tanzania","TZA","Beverages, Alcoholic","fabio" +"21025","United Republic of Tanzania","TZA","Alcohol, Non-Food","fabio" +"21026","United Republic of Tanzania","TZA","Cotton lint","fabio" +"21027","United Republic of Tanzania","TZA","Cattle","fabio" +"21028","United Republic of Tanzania","TZA","Buffaloes","fabio" +"21029","United Republic of Tanzania","TZA","Sheep","fabio" +"21030","United Republic of Tanzania","TZA","Goats","fabio" +"21031","United Republic of Tanzania","TZA","Pigs","fabio" +"21032","United Republic of Tanzania","TZA","Poultry Birds","fabio" +"21033","United Republic of Tanzania","TZA","Horses","fabio" +"21034","United Republic of Tanzania","TZA","Asses","fabio" +"21035","United Republic of Tanzania","TZA","Mules","fabio" +"21036","United Republic of Tanzania","TZA","Camels","fabio" +"21037","United Republic of Tanzania","TZA","Camelids, other","fabio" +"21038","United Republic of Tanzania","TZA","Rabbits and hares","fabio" +"21039","United Republic of Tanzania","TZA","Rodents, other","fabio" +"21040","United Republic of Tanzania","TZA","Live animals, other","fabio" +"21041","United Republic of Tanzania","TZA","Milk - Excluding Butter","fabio" +"21042","United Republic of Tanzania","TZA","Butter, Ghee","fabio" +"21043","United Republic of Tanzania","TZA","Eggs","fabio" +"21044","United Republic of Tanzania","TZA","Wool (Clean Eq.)","fabio" +"21045","United Republic of Tanzania","TZA","Bovine Meat","fabio" +"21046","United Republic of Tanzania","TZA","Mutton & Goat Meat","fabio" +"21047","United Republic of Tanzania","TZA","Pigmeat","fabio" +"21048","United Republic of Tanzania","TZA","Poultry Meat","fabio" +"21049","United Republic of Tanzania","TZA","Meat, Other","fabio" +"21050","United Republic of Tanzania","TZA","Offals, Edible","fabio" +"21051","United Republic of Tanzania","TZA","Fats, Animals, Raw","fabio" +"21052","United Republic of Tanzania","TZA","Hides and skins","fabio" +"21053","United Republic of Tanzania","TZA","Meat Meal","fabio" +"21054","United Republic of Tanzania","TZA","Pet food","fabio" +"21055","United Republic of Tanzania","TZA","Honey","fabio" +"21056","United Republic of Tanzania","TZA","Silk","fabio" +"21057","United Republic of Tanzania","TZA","Fish, Seafood","fabio" +"21058","United Republic of Tanzania","TZA","Wood fuel","fabio" +"21059","United Republic of Tanzania","TZA","Industrial roundwood, coniferous","fabio" +"21060","United Republic of Tanzania","TZA","Industrial roundwood, non-coniferous","fabio" +"21061","Thailand","THA","Rice (Milled Equivalent)","fabio" +"21062","Thailand","THA","Wheat and products","fabio" +"21063","Thailand","THA","Barley and products","fabio" +"21064","Thailand","THA","Maize and products","fabio" +"21065","Thailand","THA","Rye and products","fabio" +"21066","Thailand","THA","Oats","fabio" +"21067","Thailand","THA","Millet and products","fabio" +"21068","Thailand","THA","Sorghum and products","fabio" +"21069","Thailand","THA","Cereals, Other","fabio" +"21070","Thailand","THA","Potatoes and products","fabio" +"21071","Thailand","THA","Cassava and products","fabio" +"21072","Thailand","THA","Sweet potatoes","fabio" +"21073","Thailand","THA","Roots, Other","fabio" +"21074","Thailand","THA","Yams","fabio" +"21075","Thailand","THA","Sugar cane","fabio" +"21076","Thailand","THA","Sugar beet","fabio" +"21077","Thailand","THA","Beans","fabio" +"21078","Thailand","THA","Peas","fabio" +"21079","Thailand","THA","Pulses, Other and products","fabio" +"21080","Thailand","THA","Nuts and products","fabio" +"21081","Thailand","THA","Soyabeans","fabio" +"21082","Thailand","THA","Groundnuts (Shelled Eq)","fabio" +"21083","Thailand","THA","Sunflower seed","fabio" +"21084","Thailand","THA","Rape and Mustardseed","fabio" +"21085","Thailand","THA","Seed cotton","fabio" +"21086","Thailand","THA","Coconuts - Incl Copra","fabio" +"21087","Thailand","THA","Sesame seed","fabio" +"21088","Thailand","THA","Oil, palm fruit","fabio" +"21089","Thailand","THA","Olives (including preserved)","fabio" +"21090","Thailand","THA","Oilcrops, Other","fabio" +"21091","Thailand","THA","Tomatoes and products","fabio" +"21092","Thailand","THA","Onions","fabio" +"21093","Thailand","THA","Vegetables, Other","fabio" +"21094","Thailand","THA","Oranges, Mandarines","fabio" +"21095","Thailand","THA","Lemons, Limes and products","fabio" +"21096","Thailand","THA","Grapefruit and products","fabio" +"21097","Thailand","THA","Citrus, Other","fabio" +"21098","Thailand","THA","Bananas","fabio" +"21099","Thailand","THA","Plantains","fabio" +"21100","Thailand","THA","Apples and products","fabio" +"21101","Thailand","THA","Pineapples and products","fabio" +"21102","Thailand","THA","Dates","fabio" +"21103","Thailand","THA","Grapes and products (excl wine)","fabio" +"21104","Thailand","THA","Fruits, Other","fabio" +"21105","Thailand","THA","Coffee and products","fabio" +"21106","Thailand","THA","Cocoa Beans and products","fabio" +"21107","Thailand","THA","Tea (including mate)","fabio" +"21108","Thailand","THA","Hops","fabio" +"21109","Thailand","THA","Pepper","fabio" +"21110","Thailand","THA","Pimento","fabio" +"21111","Thailand","THA","Cloves","fabio" +"21112","Thailand","THA","Spices, Other","fabio" +"21113","Thailand","THA","Jute","fabio" +"21114","Thailand","THA","Jute-Like Fibres","fabio" +"21115","Thailand","THA","Soft-Fibres, Other","fabio" +"21116","Thailand","THA","Sisal","fabio" +"21117","Thailand","THA","Abaca","fabio" +"21118","Thailand","THA","Hard Fibres, Other","fabio" +"21119","Thailand","THA","Tobacco","fabio" +"21120","Thailand","THA","Rubber","fabio" +"21121","Thailand","THA","Fodder crops","fabio" +"21122","Thailand","THA","Grazing","fabio" +"21123","Thailand","THA","Cottonseed","fabio" +"21124","Thailand","THA","Palm kernels","fabio" +"21125","Thailand","THA","Sugar non-centrifugal","fabio" +"21126","Thailand","THA","Molasses","fabio" +"21127","Thailand","THA","Sugar, Refined Equiv","fabio" +"21128","Thailand","THA","Sweeteners, Other","fabio" +"21129","Thailand","THA","Soyabean Oil","fabio" +"21130","Thailand","THA","Groundnut Oil","fabio" +"21131","Thailand","THA","Sunflowerseed Oil","fabio" +"21132","Thailand","THA","Rape and Mustard Oil","fabio" +"21133","Thailand","THA","Cottonseed Oil","fabio" +"21134","Thailand","THA","Palmkernel Oil","fabio" +"21135","Thailand","THA","Palm Oil","fabio" +"21136","Thailand","THA","Coconut Oil","fabio" +"21137","Thailand","THA","Sesameseed Oil","fabio" +"21138","Thailand","THA","Olive Oil","fabio" +"21139","Thailand","THA","Ricebran Oil","fabio" +"21140","Thailand","THA","Maize Germ Oil","fabio" +"21141","Thailand","THA","Oilcrops Oil, Other","fabio" +"21142","Thailand","THA","Soyabean Cake","fabio" +"21143","Thailand","THA","Groundnut Cake","fabio" +"21144","Thailand","THA","Sunflowerseed Cake","fabio" +"21145","Thailand","THA","Rape and Mustard Cake","fabio" +"21146","Thailand","THA","Cottonseed Cake","fabio" +"21147","Thailand","THA","Palmkernel Cake","fabio" +"21148","Thailand","THA","Copra Cake","fabio" +"21149","Thailand","THA","Sesameseed Cake","fabio" +"21150","Thailand","THA","Oilseed Cakes, Other","fabio" +"21151","Thailand","THA","Wine","fabio" +"21152","Thailand","THA","Beer","fabio" +"21153","Thailand","THA","Beverages, Fermented","fabio" +"21154","Thailand","THA","Beverages, Alcoholic","fabio" +"21155","Thailand","THA","Alcohol, Non-Food","fabio" +"21156","Thailand","THA","Cotton lint","fabio" +"21157","Thailand","THA","Cattle","fabio" +"21158","Thailand","THA","Buffaloes","fabio" +"21159","Thailand","THA","Sheep","fabio" +"21160","Thailand","THA","Goats","fabio" +"21161","Thailand","THA","Pigs","fabio" +"21162","Thailand","THA","Poultry Birds","fabio" +"21163","Thailand","THA","Horses","fabio" +"21164","Thailand","THA","Asses","fabio" +"21165","Thailand","THA","Mules","fabio" +"21166","Thailand","THA","Camels","fabio" +"21167","Thailand","THA","Camelids, other","fabio" +"21168","Thailand","THA","Rabbits and hares","fabio" +"21169","Thailand","THA","Rodents, other","fabio" +"21170","Thailand","THA","Live animals, other","fabio" +"21171","Thailand","THA","Milk - Excluding Butter","fabio" +"21172","Thailand","THA","Butter, Ghee","fabio" +"21173","Thailand","THA","Eggs","fabio" +"21174","Thailand","THA","Wool (Clean Eq.)","fabio" +"21175","Thailand","THA","Bovine Meat","fabio" +"21176","Thailand","THA","Mutton & Goat Meat","fabio" +"21177","Thailand","THA","Pigmeat","fabio" +"21178","Thailand","THA","Poultry Meat","fabio" +"21179","Thailand","THA","Meat, Other","fabio" +"21180","Thailand","THA","Offals, Edible","fabio" +"21181","Thailand","THA","Fats, Animals, Raw","fabio" +"21182","Thailand","THA","Hides and skins","fabio" +"21183","Thailand","THA","Meat Meal","fabio" +"21184","Thailand","THA","Pet food","fabio" +"21185","Thailand","THA","Honey","fabio" +"21186","Thailand","THA","Silk","fabio" +"21187","Thailand","THA","Fish, Seafood","fabio" +"21188","Thailand","THA","Wood fuel","fabio" +"21189","Thailand","THA","Industrial roundwood, coniferous","fabio" +"21190","Thailand","THA","Industrial roundwood, non-coniferous","fabio" +"21191","Togo","TGO","Rice (Milled Equivalent)","fabio" +"21192","Togo","TGO","Wheat and products","fabio" +"21193","Togo","TGO","Barley and products","fabio" +"21194","Togo","TGO","Maize and products","fabio" +"21195","Togo","TGO","Rye and products","fabio" +"21196","Togo","TGO","Oats","fabio" +"21197","Togo","TGO","Millet and products","fabio" +"21198","Togo","TGO","Sorghum and products","fabio" +"21199","Togo","TGO","Cereals, Other","fabio" +"21200","Togo","TGO","Potatoes and products","fabio" +"21201","Togo","TGO","Cassava and products","fabio" +"21202","Togo","TGO","Sweet potatoes","fabio" +"21203","Togo","TGO","Roots, Other","fabio" +"21204","Togo","TGO","Yams","fabio" +"21205","Togo","TGO","Sugar cane","fabio" +"21206","Togo","TGO","Sugar beet","fabio" +"21207","Togo","TGO","Beans","fabio" +"21208","Togo","TGO","Peas","fabio" +"21209","Togo","TGO","Pulses, Other and products","fabio" +"21210","Togo","TGO","Nuts and products","fabio" +"21211","Togo","TGO","Soyabeans","fabio" +"21212","Togo","TGO","Groundnuts (Shelled Eq)","fabio" +"21213","Togo","TGO","Sunflower seed","fabio" +"21214","Togo","TGO","Rape and Mustardseed","fabio" +"21215","Togo","TGO","Seed cotton","fabio" +"21216","Togo","TGO","Coconuts - Incl Copra","fabio" +"21217","Togo","TGO","Sesame seed","fabio" +"21218","Togo","TGO","Oil, palm fruit","fabio" +"21219","Togo","TGO","Olives (including preserved)","fabio" +"21220","Togo","TGO","Oilcrops, Other","fabio" +"21221","Togo","TGO","Tomatoes and products","fabio" +"21222","Togo","TGO","Onions","fabio" +"21223","Togo","TGO","Vegetables, Other","fabio" +"21224","Togo","TGO","Oranges, Mandarines","fabio" +"21225","Togo","TGO","Lemons, Limes and products","fabio" +"21226","Togo","TGO","Grapefruit and products","fabio" +"21227","Togo","TGO","Citrus, Other","fabio" +"21228","Togo","TGO","Bananas","fabio" +"21229","Togo","TGO","Plantains","fabio" +"21230","Togo","TGO","Apples and products","fabio" +"21231","Togo","TGO","Pineapples and products","fabio" +"21232","Togo","TGO","Dates","fabio" +"21233","Togo","TGO","Grapes and products (excl wine)","fabio" +"21234","Togo","TGO","Fruits, Other","fabio" +"21235","Togo","TGO","Coffee and products","fabio" +"21236","Togo","TGO","Cocoa Beans and products","fabio" +"21237","Togo","TGO","Tea (including mate)","fabio" +"21238","Togo","TGO","Hops","fabio" +"21239","Togo","TGO","Pepper","fabio" +"21240","Togo","TGO","Pimento","fabio" +"21241","Togo","TGO","Cloves","fabio" +"21242","Togo","TGO","Spices, Other","fabio" +"21243","Togo","TGO","Jute","fabio" +"21244","Togo","TGO","Jute-Like Fibres","fabio" +"21245","Togo","TGO","Soft-Fibres, Other","fabio" +"21246","Togo","TGO","Sisal","fabio" +"21247","Togo","TGO","Abaca","fabio" +"21248","Togo","TGO","Hard Fibres, Other","fabio" +"21249","Togo","TGO","Tobacco","fabio" +"21250","Togo","TGO","Rubber","fabio" +"21251","Togo","TGO","Fodder crops","fabio" +"21252","Togo","TGO","Grazing","fabio" +"21253","Togo","TGO","Cottonseed","fabio" +"21254","Togo","TGO","Palm kernels","fabio" +"21255","Togo","TGO","Sugar non-centrifugal","fabio" +"21256","Togo","TGO","Molasses","fabio" +"21257","Togo","TGO","Sugar, Refined Equiv","fabio" +"21258","Togo","TGO","Sweeteners, Other","fabio" +"21259","Togo","TGO","Soyabean Oil","fabio" +"21260","Togo","TGO","Groundnut Oil","fabio" +"21261","Togo","TGO","Sunflowerseed Oil","fabio" +"21262","Togo","TGO","Rape and Mustard Oil","fabio" +"21263","Togo","TGO","Cottonseed Oil","fabio" +"21264","Togo","TGO","Palmkernel Oil","fabio" +"21265","Togo","TGO","Palm Oil","fabio" +"21266","Togo","TGO","Coconut Oil","fabio" +"21267","Togo","TGO","Sesameseed Oil","fabio" +"21268","Togo","TGO","Olive Oil","fabio" +"21269","Togo","TGO","Ricebran Oil","fabio" +"21270","Togo","TGO","Maize Germ Oil","fabio" +"21271","Togo","TGO","Oilcrops Oil, Other","fabio" +"21272","Togo","TGO","Soyabean Cake","fabio" +"21273","Togo","TGO","Groundnut Cake","fabio" +"21274","Togo","TGO","Sunflowerseed Cake","fabio" +"21275","Togo","TGO","Rape and Mustard Cake","fabio" +"21276","Togo","TGO","Cottonseed Cake","fabio" +"21277","Togo","TGO","Palmkernel Cake","fabio" +"21278","Togo","TGO","Copra Cake","fabio" +"21279","Togo","TGO","Sesameseed Cake","fabio" +"21280","Togo","TGO","Oilseed Cakes, Other","fabio" +"21281","Togo","TGO","Wine","fabio" +"21282","Togo","TGO","Beer","fabio" +"21283","Togo","TGO","Beverages, Fermented","fabio" +"21284","Togo","TGO","Beverages, Alcoholic","fabio" +"21285","Togo","TGO","Alcohol, Non-Food","fabio" +"21286","Togo","TGO","Cotton lint","fabio" +"21287","Togo","TGO","Cattle","fabio" +"21288","Togo","TGO","Buffaloes","fabio" +"21289","Togo","TGO","Sheep","fabio" +"21290","Togo","TGO","Goats","fabio" +"21291","Togo","TGO","Pigs","fabio" +"21292","Togo","TGO","Poultry Birds","fabio" +"21293","Togo","TGO","Horses","fabio" +"21294","Togo","TGO","Asses","fabio" +"21295","Togo","TGO","Mules","fabio" +"21296","Togo","TGO","Camels","fabio" +"21297","Togo","TGO","Camelids, other","fabio" +"21298","Togo","TGO","Rabbits and hares","fabio" +"21299","Togo","TGO","Rodents, other","fabio" +"21300","Togo","TGO","Live animals, other","fabio" +"21301","Togo","TGO","Milk - Excluding Butter","fabio" +"21302","Togo","TGO","Butter, Ghee","fabio" +"21303","Togo","TGO","Eggs","fabio" +"21304","Togo","TGO","Wool (Clean Eq.)","fabio" +"21305","Togo","TGO","Bovine Meat","fabio" +"21306","Togo","TGO","Mutton & Goat Meat","fabio" +"21307","Togo","TGO","Pigmeat","fabio" +"21308","Togo","TGO","Poultry Meat","fabio" +"21309","Togo","TGO","Meat, Other","fabio" +"21310","Togo","TGO","Offals, Edible","fabio" +"21311","Togo","TGO","Fats, Animals, Raw","fabio" +"21312","Togo","TGO","Hides and skins","fabio" +"21313","Togo","TGO","Meat Meal","fabio" +"21314","Togo","TGO","Pet food","fabio" +"21315","Togo","TGO","Honey","fabio" +"21316","Togo","TGO","Silk","fabio" +"21317","Togo","TGO","Fish, Seafood","fabio" +"21318","Togo","TGO","Wood fuel","fabio" +"21319","Togo","TGO","Industrial roundwood, coniferous","fabio" +"21320","Togo","TGO","Industrial roundwood, non-coniferous","fabio" +"21321","Trinidad and Tobago","TTO","Rice (Milled Equivalent)","fabio" +"21322","Trinidad and Tobago","TTO","Wheat and products","fabio" +"21323","Trinidad and Tobago","TTO","Barley and products","fabio" +"21324","Trinidad and Tobago","TTO","Maize and products","fabio" +"21325","Trinidad and Tobago","TTO","Rye and products","fabio" +"21326","Trinidad and Tobago","TTO","Oats","fabio" +"21327","Trinidad and Tobago","TTO","Millet and products","fabio" +"21328","Trinidad and Tobago","TTO","Sorghum and products","fabio" +"21329","Trinidad and Tobago","TTO","Cereals, Other","fabio" +"21330","Trinidad and Tobago","TTO","Potatoes and products","fabio" +"21331","Trinidad and Tobago","TTO","Cassava and products","fabio" +"21332","Trinidad and Tobago","TTO","Sweet potatoes","fabio" +"21333","Trinidad and Tobago","TTO","Roots, Other","fabio" +"21334","Trinidad and Tobago","TTO","Yams","fabio" +"21335","Trinidad and Tobago","TTO","Sugar cane","fabio" +"21336","Trinidad and Tobago","TTO","Sugar beet","fabio" +"21337","Trinidad and Tobago","TTO","Beans","fabio" +"21338","Trinidad and Tobago","TTO","Peas","fabio" +"21339","Trinidad and Tobago","TTO","Pulses, Other and products","fabio" +"21340","Trinidad and Tobago","TTO","Nuts and products","fabio" +"21341","Trinidad and Tobago","TTO","Soyabeans","fabio" +"21342","Trinidad and Tobago","TTO","Groundnuts (Shelled Eq)","fabio" +"21343","Trinidad and Tobago","TTO","Sunflower seed","fabio" +"21344","Trinidad and Tobago","TTO","Rape and Mustardseed","fabio" +"21345","Trinidad and Tobago","TTO","Seed cotton","fabio" +"21346","Trinidad and Tobago","TTO","Coconuts - Incl Copra","fabio" +"21347","Trinidad and Tobago","TTO","Sesame seed","fabio" +"21348","Trinidad and Tobago","TTO","Oil, palm fruit","fabio" +"21349","Trinidad and Tobago","TTO","Olives (including preserved)","fabio" +"21350","Trinidad and Tobago","TTO","Oilcrops, Other","fabio" +"21351","Trinidad and Tobago","TTO","Tomatoes and products","fabio" +"21352","Trinidad and Tobago","TTO","Onions","fabio" +"21353","Trinidad and Tobago","TTO","Vegetables, Other","fabio" +"21354","Trinidad and Tobago","TTO","Oranges, Mandarines","fabio" +"21355","Trinidad and Tobago","TTO","Lemons, Limes and products","fabio" +"21356","Trinidad and Tobago","TTO","Grapefruit and products","fabio" +"21357","Trinidad and Tobago","TTO","Citrus, Other","fabio" +"21358","Trinidad and Tobago","TTO","Bananas","fabio" +"21359","Trinidad and Tobago","TTO","Plantains","fabio" +"21360","Trinidad and Tobago","TTO","Apples and products","fabio" +"21361","Trinidad and Tobago","TTO","Pineapples and products","fabio" +"21362","Trinidad and Tobago","TTO","Dates","fabio" +"21363","Trinidad and Tobago","TTO","Grapes and products (excl wine)","fabio" +"21364","Trinidad and Tobago","TTO","Fruits, Other","fabio" +"21365","Trinidad and Tobago","TTO","Coffee and products","fabio" +"21366","Trinidad and Tobago","TTO","Cocoa Beans and products","fabio" +"21367","Trinidad and Tobago","TTO","Tea (including mate)","fabio" +"21368","Trinidad and Tobago","TTO","Hops","fabio" +"21369","Trinidad and Tobago","TTO","Pepper","fabio" +"21370","Trinidad and Tobago","TTO","Pimento","fabio" +"21371","Trinidad and Tobago","TTO","Cloves","fabio" +"21372","Trinidad and Tobago","TTO","Spices, Other","fabio" +"21373","Trinidad and Tobago","TTO","Jute","fabio" +"21374","Trinidad and Tobago","TTO","Jute-Like Fibres","fabio" +"21375","Trinidad and Tobago","TTO","Soft-Fibres, Other","fabio" +"21376","Trinidad and Tobago","TTO","Sisal","fabio" +"21377","Trinidad and Tobago","TTO","Abaca","fabio" +"21378","Trinidad and Tobago","TTO","Hard Fibres, Other","fabio" +"21379","Trinidad and Tobago","TTO","Tobacco","fabio" +"21380","Trinidad and Tobago","TTO","Rubber","fabio" +"21381","Trinidad and Tobago","TTO","Fodder crops","fabio" +"21382","Trinidad and Tobago","TTO","Grazing","fabio" +"21383","Trinidad and Tobago","TTO","Cottonseed","fabio" +"21384","Trinidad and Tobago","TTO","Palm kernels","fabio" +"21385","Trinidad and Tobago","TTO","Sugar non-centrifugal","fabio" +"21386","Trinidad and Tobago","TTO","Molasses","fabio" +"21387","Trinidad and Tobago","TTO","Sugar, Refined Equiv","fabio" +"21388","Trinidad and Tobago","TTO","Sweeteners, Other","fabio" +"21389","Trinidad and Tobago","TTO","Soyabean Oil","fabio" +"21390","Trinidad and Tobago","TTO","Groundnut Oil","fabio" +"21391","Trinidad and Tobago","TTO","Sunflowerseed Oil","fabio" +"21392","Trinidad and Tobago","TTO","Rape and Mustard Oil","fabio" +"21393","Trinidad and Tobago","TTO","Cottonseed Oil","fabio" +"21394","Trinidad and Tobago","TTO","Palmkernel Oil","fabio" +"21395","Trinidad and Tobago","TTO","Palm Oil","fabio" +"21396","Trinidad and Tobago","TTO","Coconut Oil","fabio" +"21397","Trinidad and Tobago","TTO","Sesameseed Oil","fabio" +"21398","Trinidad and Tobago","TTO","Olive Oil","fabio" +"21399","Trinidad and Tobago","TTO","Ricebran Oil","fabio" +"21400","Trinidad and Tobago","TTO","Maize Germ Oil","fabio" +"21401","Trinidad and Tobago","TTO","Oilcrops Oil, Other","fabio" +"21402","Trinidad and Tobago","TTO","Soyabean Cake","fabio" +"21403","Trinidad and Tobago","TTO","Groundnut Cake","fabio" +"21404","Trinidad and Tobago","TTO","Sunflowerseed Cake","fabio" +"21405","Trinidad and Tobago","TTO","Rape and Mustard Cake","fabio" +"21406","Trinidad and Tobago","TTO","Cottonseed Cake","fabio" +"21407","Trinidad and Tobago","TTO","Palmkernel Cake","fabio" +"21408","Trinidad and Tobago","TTO","Copra Cake","fabio" +"21409","Trinidad and Tobago","TTO","Sesameseed Cake","fabio" +"21410","Trinidad and Tobago","TTO","Oilseed Cakes, Other","fabio" +"21411","Trinidad and Tobago","TTO","Wine","fabio" +"21412","Trinidad and Tobago","TTO","Beer","fabio" +"21413","Trinidad and Tobago","TTO","Beverages, Fermented","fabio" +"21414","Trinidad and Tobago","TTO","Beverages, Alcoholic","fabio" +"21415","Trinidad and Tobago","TTO","Alcohol, Non-Food","fabio" +"21416","Trinidad and Tobago","TTO","Cotton lint","fabio" +"21417","Trinidad and Tobago","TTO","Cattle","fabio" +"21418","Trinidad and Tobago","TTO","Buffaloes","fabio" +"21419","Trinidad and Tobago","TTO","Sheep","fabio" +"21420","Trinidad and Tobago","TTO","Goats","fabio" +"21421","Trinidad and Tobago","TTO","Pigs","fabio" +"21422","Trinidad and Tobago","TTO","Poultry Birds","fabio" +"21423","Trinidad and Tobago","TTO","Horses","fabio" +"21424","Trinidad and Tobago","TTO","Asses","fabio" +"21425","Trinidad and Tobago","TTO","Mules","fabio" +"21426","Trinidad and Tobago","TTO","Camels","fabio" +"21427","Trinidad and Tobago","TTO","Camelids, other","fabio" +"21428","Trinidad and Tobago","TTO","Rabbits and hares","fabio" +"21429","Trinidad and Tobago","TTO","Rodents, other","fabio" +"21430","Trinidad and Tobago","TTO","Live animals, other","fabio" +"21431","Trinidad and Tobago","TTO","Milk - Excluding Butter","fabio" +"21432","Trinidad and Tobago","TTO","Butter, Ghee","fabio" +"21433","Trinidad and Tobago","TTO","Eggs","fabio" +"21434","Trinidad and Tobago","TTO","Wool (Clean Eq.)","fabio" +"21435","Trinidad and Tobago","TTO","Bovine Meat","fabio" +"21436","Trinidad and Tobago","TTO","Mutton & Goat Meat","fabio" +"21437","Trinidad and Tobago","TTO","Pigmeat","fabio" +"21438","Trinidad and Tobago","TTO","Poultry Meat","fabio" +"21439","Trinidad and Tobago","TTO","Meat, Other","fabio" +"21440","Trinidad and Tobago","TTO","Offals, Edible","fabio" +"21441","Trinidad and Tobago","TTO","Fats, Animals, Raw","fabio" +"21442","Trinidad and Tobago","TTO","Hides and skins","fabio" +"21443","Trinidad and Tobago","TTO","Meat Meal","fabio" +"21444","Trinidad and Tobago","TTO","Pet food","fabio" +"21445","Trinidad and Tobago","TTO","Honey","fabio" +"21446","Trinidad and Tobago","TTO","Silk","fabio" +"21447","Trinidad and Tobago","TTO","Fish, Seafood","fabio" +"21448","Trinidad and Tobago","TTO","Wood fuel","fabio" +"21449","Trinidad and Tobago","TTO","Industrial roundwood, coniferous","fabio" +"21450","Trinidad and Tobago","TTO","Industrial roundwood, non-coniferous","fabio" +"21451","Oman","OMN","Rice (Milled Equivalent)","fabio" +"21452","Oman","OMN","Wheat and products","fabio" +"21453","Oman","OMN","Barley and products","fabio" +"21454","Oman","OMN","Maize and products","fabio" +"21455","Oman","OMN","Rye and products","fabio" +"21456","Oman","OMN","Oats","fabio" +"21457","Oman","OMN","Millet and products","fabio" +"21458","Oman","OMN","Sorghum and products","fabio" +"21459","Oman","OMN","Cereals, Other","fabio" +"21460","Oman","OMN","Potatoes and products","fabio" +"21461","Oman","OMN","Cassava and products","fabio" +"21462","Oman","OMN","Sweet potatoes","fabio" +"21463","Oman","OMN","Roots, Other","fabio" +"21464","Oman","OMN","Yams","fabio" +"21465","Oman","OMN","Sugar cane","fabio" +"21466","Oman","OMN","Sugar beet","fabio" +"21467","Oman","OMN","Beans","fabio" +"21468","Oman","OMN","Peas","fabio" +"21469","Oman","OMN","Pulses, Other and products","fabio" +"21470","Oman","OMN","Nuts and products","fabio" +"21471","Oman","OMN","Soyabeans","fabio" +"21472","Oman","OMN","Groundnuts (Shelled Eq)","fabio" +"21473","Oman","OMN","Sunflower seed","fabio" +"21474","Oman","OMN","Rape and Mustardseed","fabio" +"21475","Oman","OMN","Seed cotton","fabio" +"21476","Oman","OMN","Coconuts - Incl Copra","fabio" +"21477","Oman","OMN","Sesame seed","fabio" +"21478","Oman","OMN","Oil, palm fruit","fabio" +"21479","Oman","OMN","Olives (including preserved)","fabio" +"21480","Oman","OMN","Oilcrops, Other","fabio" +"21481","Oman","OMN","Tomatoes and products","fabio" +"21482","Oman","OMN","Onions","fabio" +"21483","Oman","OMN","Vegetables, Other","fabio" +"21484","Oman","OMN","Oranges, Mandarines","fabio" +"21485","Oman","OMN","Lemons, Limes and products","fabio" +"21486","Oman","OMN","Grapefruit and products","fabio" +"21487","Oman","OMN","Citrus, Other","fabio" +"21488","Oman","OMN","Bananas","fabio" +"21489","Oman","OMN","Plantains","fabio" +"21490","Oman","OMN","Apples and products","fabio" +"21491","Oman","OMN","Pineapples and products","fabio" +"21492","Oman","OMN","Dates","fabio" +"21493","Oman","OMN","Grapes and products (excl wine)","fabio" +"21494","Oman","OMN","Fruits, Other","fabio" +"21495","Oman","OMN","Coffee and products","fabio" +"21496","Oman","OMN","Cocoa Beans and products","fabio" +"21497","Oman","OMN","Tea (including mate)","fabio" +"21498","Oman","OMN","Hops","fabio" +"21499","Oman","OMN","Pepper","fabio" +"21500","Oman","OMN","Pimento","fabio" +"21501","Oman","OMN","Cloves","fabio" +"21502","Oman","OMN","Spices, Other","fabio" +"21503","Oman","OMN","Jute","fabio" +"21504","Oman","OMN","Jute-Like Fibres","fabio" +"21505","Oman","OMN","Soft-Fibres, Other","fabio" +"21506","Oman","OMN","Sisal","fabio" +"21507","Oman","OMN","Abaca","fabio" +"21508","Oman","OMN","Hard Fibres, Other","fabio" +"21509","Oman","OMN","Tobacco","fabio" +"21510","Oman","OMN","Rubber","fabio" +"21511","Oman","OMN","Fodder crops","fabio" +"21512","Oman","OMN","Grazing","fabio" +"21513","Oman","OMN","Cottonseed","fabio" +"21514","Oman","OMN","Palm kernels","fabio" +"21515","Oman","OMN","Sugar non-centrifugal","fabio" +"21516","Oman","OMN","Molasses","fabio" +"21517","Oman","OMN","Sugar, Refined Equiv","fabio" +"21518","Oman","OMN","Sweeteners, Other","fabio" +"21519","Oman","OMN","Soyabean Oil","fabio" +"21520","Oman","OMN","Groundnut Oil","fabio" +"21521","Oman","OMN","Sunflowerseed Oil","fabio" +"21522","Oman","OMN","Rape and Mustard Oil","fabio" +"21523","Oman","OMN","Cottonseed Oil","fabio" +"21524","Oman","OMN","Palmkernel Oil","fabio" +"21525","Oman","OMN","Palm Oil","fabio" +"21526","Oman","OMN","Coconut Oil","fabio" +"21527","Oman","OMN","Sesameseed Oil","fabio" +"21528","Oman","OMN","Olive Oil","fabio" +"21529","Oman","OMN","Ricebran Oil","fabio" +"21530","Oman","OMN","Maize Germ Oil","fabio" +"21531","Oman","OMN","Oilcrops Oil, Other","fabio" +"21532","Oman","OMN","Soyabean Cake","fabio" +"21533","Oman","OMN","Groundnut Cake","fabio" +"21534","Oman","OMN","Sunflowerseed Cake","fabio" +"21535","Oman","OMN","Rape and Mustard Cake","fabio" +"21536","Oman","OMN","Cottonseed Cake","fabio" +"21537","Oman","OMN","Palmkernel Cake","fabio" +"21538","Oman","OMN","Copra Cake","fabio" +"21539","Oman","OMN","Sesameseed Cake","fabio" +"21540","Oman","OMN","Oilseed Cakes, Other","fabio" +"21541","Oman","OMN","Wine","fabio" +"21542","Oman","OMN","Beer","fabio" +"21543","Oman","OMN","Beverages, Fermented","fabio" +"21544","Oman","OMN","Beverages, Alcoholic","fabio" +"21545","Oman","OMN","Alcohol, Non-Food","fabio" +"21546","Oman","OMN","Cotton lint","fabio" +"21547","Oman","OMN","Cattle","fabio" +"21548","Oman","OMN","Buffaloes","fabio" +"21549","Oman","OMN","Sheep","fabio" +"21550","Oman","OMN","Goats","fabio" +"21551","Oman","OMN","Pigs","fabio" +"21552","Oman","OMN","Poultry Birds","fabio" +"21553","Oman","OMN","Horses","fabio" +"21554","Oman","OMN","Asses","fabio" +"21555","Oman","OMN","Mules","fabio" +"21556","Oman","OMN","Camels","fabio" +"21557","Oman","OMN","Camelids, other","fabio" +"21558","Oman","OMN","Rabbits and hares","fabio" +"21559","Oman","OMN","Rodents, other","fabio" +"21560","Oman","OMN","Live animals, other","fabio" +"21561","Oman","OMN","Milk - Excluding Butter","fabio" +"21562","Oman","OMN","Butter, Ghee","fabio" +"21563","Oman","OMN","Eggs","fabio" +"21564","Oman","OMN","Wool (Clean Eq.)","fabio" +"21565","Oman","OMN","Bovine Meat","fabio" +"21566","Oman","OMN","Mutton & Goat Meat","fabio" +"21567","Oman","OMN","Pigmeat","fabio" +"21568","Oman","OMN","Poultry Meat","fabio" +"21569","Oman","OMN","Meat, Other","fabio" +"21570","Oman","OMN","Offals, Edible","fabio" +"21571","Oman","OMN","Fats, Animals, Raw","fabio" +"21572","Oman","OMN","Hides and skins","fabio" +"21573","Oman","OMN","Meat Meal","fabio" +"21574","Oman","OMN","Pet food","fabio" +"21575","Oman","OMN","Honey","fabio" +"21576","Oman","OMN","Silk","fabio" +"21577","Oman","OMN","Fish, Seafood","fabio" +"21578","Oman","OMN","Wood fuel","fabio" +"21579","Oman","OMN","Industrial roundwood, coniferous","fabio" +"21580","Oman","OMN","Industrial roundwood, non-coniferous","fabio" +"21581","Tunisia","TUN","Rice (Milled Equivalent)","fabio" +"21582","Tunisia","TUN","Wheat and products","fabio" +"21583","Tunisia","TUN","Barley and products","fabio" +"21584","Tunisia","TUN","Maize and products","fabio" +"21585","Tunisia","TUN","Rye and products","fabio" +"21586","Tunisia","TUN","Oats","fabio" +"21587","Tunisia","TUN","Millet and products","fabio" +"21588","Tunisia","TUN","Sorghum and products","fabio" +"21589","Tunisia","TUN","Cereals, Other","fabio" +"21590","Tunisia","TUN","Potatoes and products","fabio" +"21591","Tunisia","TUN","Cassava and products","fabio" +"21592","Tunisia","TUN","Sweet potatoes","fabio" +"21593","Tunisia","TUN","Roots, Other","fabio" +"21594","Tunisia","TUN","Yams","fabio" +"21595","Tunisia","TUN","Sugar cane","fabio" +"21596","Tunisia","TUN","Sugar beet","fabio" +"21597","Tunisia","TUN","Beans","fabio" +"21598","Tunisia","TUN","Peas","fabio" +"21599","Tunisia","TUN","Pulses, Other and products","fabio" +"21600","Tunisia","TUN","Nuts and products","fabio" +"21601","Tunisia","TUN","Soyabeans","fabio" +"21602","Tunisia","TUN","Groundnuts (Shelled Eq)","fabio" +"21603","Tunisia","TUN","Sunflower seed","fabio" +"21604","Tunisia","TUN","Rape and Mustardseed","fabio" +"21605","Tunisia","TUN","Seed cotton","fabio" +"21606","Tunisia","TUN","Coconuts - Incl Copra","fabio" +"21607","Tunisia","TUN","Sesame seed","fabio" +"21608","Tunisia","TUN","Oil, palm fruit","fabio" +"21609","Tunisia","TUN","Olives (including preserved)","fabio" +"21610","Tunisia","TUN","Oilcrops, Other","fabio" +"21611","Tunisia","TUN","Tomatoes and products","fabio" +"21612","Tunisia","TUN","Onions","fabio" +"21613","Tunisia","TUN","Vegetables, Other","fabio" +"21614","Tunisia","TUN","Oranges, Mandarines","fabio" +"21615","Tunisia","TUN","Lemons, Limes and products","fabio" +"21616","Tunisia","TUN","Grapefruit and products","fabio" +"21617","Tunisia","TUN","Citrus, Other","fabio" +"21618","Tunisia","TUN","Bananas","fabio" +"21619","Tunisia","TUN","Plantains","fabio" +"21620","Tunisia","TUN","Apples and products","fabio" +"21621","Tunisia","TUN","Pineapples and products","fabio" +"21622","Tunisia","TUN","Dates","fabio" +"21623","Tunisia","TUN","Grapes and products (excl wine)","fabio" +"21624","Tunisia","TUN","Fruits, Other","fabio" +"21625","Tunisia","TUN","Coffee and products","fabio" +"21626","Tunisia","TUN","Cocoa Beans and products","fabio" +"21627","Tunisia","TUN","Tea (including mate)","fabio" +"21628","Tunisia","TUN","Hops","fabio" +"21629","Tunisia","TUN","Pepper","fabio" +"21630","Tunisia","TUN","Pimento","fabio" +"21631","Tunisia","TUN","Cloves","fabio" +"21632","Tunisia","TUN","Spices, Other","fabio" +"21633","Tunisia","TUN","Jute","fabio" +"21634","Tunisia","TUN","Jute-Like Fibres","fabio" +"21635","Tunisia","TUN","Soft-Fibres, Other","fabio" +"21636","Tunisia","TUN","Sisal","fabio" +"21637","Tunisia","TUN","Abaca","fabio" +"21638","Tunisia","TUN","Hard Fibres, Other","fabio" +"21639","Tunisia","TUN","Tobacco","fabio" +"21640","Tunisia","TUN","Rubber","fabio" +"21641","Tunisia","TUN","Fodder crops","fabio" +"21642","Tunisia","TUN","Grazing","fabio" +"21643","Tunisia","TUN","Cottonseed","fabio" +"21644","Tunisia","TUN","Palm kernels","fabio" +"21645","Tunisia","TUN","Sugar non-centrifugal","fabio" +"21646","Tunisia","TUN","Molasses","fabio" +"21647","Tunisia","TUN","Sugar, Refined Equiv","fabio" +"21648","Tunisia","TUN","Sweeteners, Other","fabio" +"21649","Tunisia","TUN","Soyabean Oil","fabio" +"21650","Tunisia","TUN","Groundnut Oil","fabio" +"21651","Tunisia","TUN","Sunflowerseed Oil","fabio" +"21652","Tunisia","TUN","Rape and Mustard Oil","fabio" +"21653","Tunisia","TUN","Cottonseed Oil","fabio" +"21654","Tunisia","TUN","Palmkernel Oil","fabio" +"21655","Tunisia","TUN","Palm Oil","fabio" +"21656","Tunisia","TUN","Coconut Oil","fabio" +"21657","Tunisia","TUN","Sesameseed Oil","fabio" +"21658","Tunisia","TUN","Olive Oil","fabio" +"21659","Tunisia","TUN","Ricebran Oil","fabio" +"21660","Tunisia","TUN","Maize Germ Oil","fabio" +"21661","Tunisia","TUN","Oilcrops Oil, Other","fabio" +"21662","Tunisia","TUN","Soyabean Cake","fabio" +"21663","Tunisia","TUN","Groundnut Cake","fabio" +"21664","Tunisia","TUN","Sunflowerseed Cake","fabio" +"21665","Tunisia","TUN","Rape and Mustard Cake","fabio" +"21666","Tunisia","TUN","Cottonseed Cake","fabio" +"21667","Tunisia","TUN","Palmkernel Cake","fabio" +"21668","Tunisia","TUN","Copra Cake","fabio" +"21669","Tunisia","TUN","Sesameseed Cake","fabio" +"21670","Tunisia","TUN","Oilseed Cakes, Other","fabio" +"21671","Tunisia","TUN","Wine","fabio" +"21672","Tunisia","TUN","Beer","fabio" +"21673","Tunisia","TUN","Beverages, Fermented","fabio" +"21674","Tunisia","TUN","Beverages, Alcoholic","fabio" +"21675","Tunisia","TUN","Alcohol, Non-Food","fabio" +"21676","Tunisia","TUN","Cotton lint","fabio" +"21677","Tunisia","TUN","Cattle","fabio" +"21678","Tunisia","TUN","Buffaloes","fabio" +"21679","Tunisia","TUN","Sheep","fabio" +"21680","Tunisia","TUN","Goats","fabio" +"21681","Tunisia","TUN","Pigs","fabio" +"21682","Tunisia","TUN","Poultry Birds","fabio" +"21683","Tunisia","TUN","Horses","fabio" +"21684","Tunisia","TUN","Asses","fabio" +"21685","Tunisia","TUN","Mules","fabio" +"21686","Tunisia","TUN","Camels","fabio" +"21687","Tunisia","TUN","Camelids, other","fabio" +"21688","Tunisia","TUN","Rabbits and hares","fabio" +"21689","Tunisia","TUN","Rodents, other","fabio" +"21690","Tunisia","TUN","Live animals, other","fabio" +"21691","Tunisia","TUN","Milk - Excluding Butter","fabio" +"21692","Tunisia","TUN","Butter, Ghee","fabio" +"21693","Tunisia","TUN","Eggs","fabio" +"21694","Tunisia","TUN","Wool (Clean Eq.)","fabio" +"21695","Tunisia","TUN","Bovine Meat","fabio" +"21696","Tunisia","TUN","Mutton & Goat Meat","fabio" +"21697","Tunisia","TUN","Pigmeat","fabio" +"21698","Tunisia","TUN","Poultry Meat","fabio" +"21699","Tunisia","TUN","Meat, Other","fabio" +"21700","Tunisia","TUN","Offals, Edible","fabio" +"21701","Tunisia","TUN","Fats, Animals, Raw","fabio" +"21702","Tunisia","TUN","Hides and skins","fabio" +"21703","Tunisia","TUN","Meat Meal","fabio" +"21704","Tunisia","TUN","Pet food","fabio" +"21705","Tunisia","TUN","Honey","fabio" +"21706","Tunisia","TUN","Silk","fabio" +"21707","Tunisia","TUN","Fish, Seafood","fabio" +"21708","Tunisia","TUN","Wood fuel","fabio" +"21709","Tunisia","TUN","Industrial roundwood, coniferous","fabio" +"21710","Tunisia","TUN","Industrial roundwood, non-coniferous","fabio" +"21711","Turkey","TUR","Rice (Milled Equivalent)","fabio" +"21712","Turkey","TUR","Wheat and products","fabio" +"21713","Turkey","TUR","Barley and products","fabio" +"21714","Turkey","TUR","Maize and products","fabio" +"21715","Turkey","TUR","Rye and products","fabio" +"21716","Turkey","TUR","Oats","fabio" +"21717","Turkey","TUR","Millet and products","fabio" +"21718","Turkey","TUR","Sorghum and products","fabio" +"21719","Turkey","TUR","Cereals, Other","fabio" +"21720","Turkey","TUR","Potatoes and products","fabio" +"21721","Turkey","TUR","Cassava and products","fabio" +"21722","Turkey","TUR","Sweet potatoes","fabio" +"21723","Turkey","TUR","Roots, Other","fabio" +"21724","Turkey","TUR","Yams","fabio" +"21725","Turkey","TUR","Sugar cane","fabio" +"21726","Turkey","TUR","Sugar beet","fabio" +"21727","Turkey","TUR","Beans","fabio" +"21728","Turkey","TUR","Peas","fabio" +"21729","Turkey","TUR","Pulses, Other and products","fabio" +"21730","Turkey","TUR","Nuts and products","fabio" +"21731","Turkey","TUR","Soyabeans","fabio" +"21732","Turkey","TUR","Groundnuts (Shelled Eq)","fabio" +"21733","Turkey","TUR","Sunflower seed","fabio" +"21734","Turkey","TUR","Rape and Mustardseed","fabio" +"21735","Turkey","TUR","Seed cotton","fabio" +"21736","Turkey","TUR","Coconuts - Incl Copra","fabio" +"21737","Turkey","TUR","Sesame seed","fabio" +"21738","Turkey","TUR","Oil, palm fruit","fabio" +"21739","Turkey","TUR","Olives (including preserved)","fabio" +"21740","Turkey","TUR","Oilcrops, Other","fabio" +"21741","Turkey","TUR","Tomatoes and products","fabio" +"21742","Turkey","TUR","Onions","fabio" +"21743","Turkey","TUR","Vegetables, Other","fabio" +"21744","Turkey","TUR","Oranges, Mandarines","fabio" +"21745","Turkey","TUR","Lemons, Limes and products","fabio" +"21746","Turkey","TUR","Grapefruit and products","fabio" +"21747","Turkey","TUR","Citrus, Other","fabio" +"21748","Turkey","TUR","Bananas","fabio" +"21749","Turkey","TUR","Plantains","fabio" +"21750","Turkey","TUR","Apples and products","fabio" +"21751","Turkey","TUR","Pineapples and products","fabio" +"21752","Turkey","TUR","Dates","fabio" +"21753","Turkey","TUR","Grapes and products (excl wine)","fabio" +"21754","Turkey","TUR","Fruits, Other","fabio" +"21755","Turkey","TUR","Coffee and products","fabio" +"21756","Turkey","TUR","Cocoa Beans and products","fabio" +"21757","Turkey","TUR","Tea (including mate)","fabio" +"21758","Turkey","TUR","Hops","fabio" +"21759","Turkey","TUR","Pepper","fabio" +"21760","Turkey","TUR","Pimento","fabio" +"21761","Turkey","TUR","Cloves","fabio" +"21762","Turkey","TUR","Spices, Other","fabio" +"21763","Turkey","TUR","Jute","fabio" +"21764","Turkey","TUR","Jute-Like Fibres","fabio" +"21765","Turkey","TUR","Soft-Fibres, Other","fabio" +"21766","Turkey","TUR","Sisal","fabio" +"21767","Turkey","TUR","Abaca","fabio" +"21768","Turkey","TUR","Hard Fibres, Other","fabio" +"21769","Turkey","TUR","Tobacco","fabio" +"21770","Turkey","TUR","Rubber","fabio" +"21771","Turkey","TUR","Fodder crops","fabio" +"21772","Turkey","TUR","Grazing","fabio" +"21773","Turkey","TUR","Cottonseed","fabio" +"21774","Turkey","TUR","Palm kernels","fabio" +"21775","Turkey","TUR","Sugar non-centrifugal","fabio" +"21776","Turkey","TUR","Molasses","fabio" +"21777","Turkey","TUR","Sugar, Refined Equiv","fabio" +"21778","Turkey","TUR","Sweeteners, Other","fabio" +"21779","Turkey","TUR","Soyabean Oil","fabio" +"21780","Turkey","TUR","Groundnut Oil","fabio" +"21781","Turkey","TUR","Sunflowerseed Oil","fabio" +"21782","Turkey","TUR","Rape and Mustard Oil","fabio" +"21783","Turkey","TUR","Cottonseed Oil","fabio" +"21784","Turkey","TUR","Palmkernel Oil","fabio" +"21785","Turkey","TUR","Palm Oil","fabio" +"21786","Turkey","TUR","Coconut Oil","fabio" +"21787","Turkey","TUR","Sesameseed Oil","fabio" +"21788","Turkey","TUR","Olive Oil","fabio" +"21789","Turkey","TUR","Ricebran Oil","fabio" +"21790","Turkey","TUR","Maize Germ Oil","fabio" +"21791","Turkey","TUR","Oilcrops Oil, Other","fabio" +"21792","Turkey","TUR","Soyabean Cake","fabio" +"21793","Turkey","TUR","Groundnut Cake","fabio" +"21794","Turkey","TUR","Sunflowerseed Cake","fabio" +"21795","Turkey","TUR","Rape and Mustard Cake","fabio" +"21796","Turkey","TUR","Cottonseed Cake","fabio" +"21797","Turkey","TUR","Palmkernel Cake","fabio" +"21798","Turkey","TUR","Copra Cake","fabio" +"21799","Turkey","TUR","Sesameseed Cake","fabio" +"21800","Turkey","TUR","Oilseed Cakes, Other","fabio" +"21801","Turkey","TUR","Wine","fabio" +"21802","Turkey","TUR","Beer","fabio" +"21803","Turkey","TUR","Beverages, Fermented","fabio" +"21804","Turkey","TUR","Beverages, Alcoholic","fabio" +"21805","Turkey","TUR","Alcohol, Non-Food","fabio" +"21806","Turkey","TUR","Cotton lint","fabio" +"21807","Turkey","TUR","Cattle","fabio" +"21808","Turkey","TUR","Buffaloes","fabio" +"21809","Turkey","TUR","Sheep","fabio" +"21810","Turkey","TUR","Goats","fabio" +"21811","Turkey","TUR","Pigs","fabio" +"21812","Turkey","TUR","Poultry Birds","fabio" +"21813","Turkey","TUR","Horses","fabio" +"21814","Turkey","TUR","Asses","fabio" +"21815","Turkey","TUR","Mules","fabio" +"21816","Turkey","TUR","Camels","fabio" +"21817","Turkey","TUR","Camelids, other","fabio" +"21818","Turkey","TUR","Rabbits and hares","fabio" +"21819","Turkey","TUR","Rodents, other","fabio" +"21820","Turkey","TUR","Live animals, other","fabio" +"21821","Turkey","TUR","Milk - Excluding Butter","fabio" +"21822","Turkey","TUR","Butter, Ghee","fabio" +"21823","Turkey","TUR","Eggs","fabio" +"21824","Turkey","TUR","Wool (Clean Eq.)","fabio" +"21825","Turkey","TUR","Bovine Meat","fabio" +"21826","Turkey","TUR","Mutton & Goat Meat","fabio" +"21827","Turkey","TUR","Pigmeat","fabio" +"21828","Turkey","TUR","Poultry Meat","fabio" +"21829","Turkey","TUR","Meat, Other","fabio" +"21830","Turkey","TUR","Offals, Edible","fabio" +"21831","Turkey","TUR","Fats, Animals, Raw","fabio" +"21832","Turkey","TUR","Hides and skins","fabio" +"21833","Turkey","TUR","Meat Meal","fabio" +"21834","Turkey","TUR","Pet food","fabio" +"21835","Turkey","TUR","Honey","fabio" +"21836","Turkey","TUR","Silk","fabio" +"21837","Turkey","TUR","Fish, Seafood","fabio" +"21838","Turkey","TUR","Wood fuel","fabio" +"21839","Turkey","TUR","Industrial roundwood, coniferous","fabio" +"21840","Turkey","TUR","Industrial roundwood, non-coniferous","fabio" +"21841","United Arab Emirates","ARE","Rice (Milled Equivalent)","fabio" +"21842","United Arab Emirates","ARE","Wheat and products","fabio" +"21843","United Arab Emirates","ARE","Barley and products","fabio" +"21844","United Arab Emirates","ARE","Maize and products","fabio" +"21845","United Arab Emirates","ARE","Rye and products","fabio" +"21846","United Arab Emirates","ARE","Oats","fabio" +"21847","United Arab Emirates","ARE","Millet and products","fabio" +"21848","United Arab Emirates","ARE","Sorghum and products","fabio" +"21849","United Arab Emirates","ARE","Cereals, Other","fabio" +"21850","United Arab Emirates","ARE","Potatoes and products","fabio" +"21851","United Arab Emirates","ARE","Cassava and products","fabio" +"21852","United Arab Emirates","ARE","Sweet potatoes","fabio" +"21853","United Arab Emirates","ARE","Roots, Other","fabio" +"21854","United Arab Emirates","ARE","Yams","fabio" +"21855","United Arab Emirates","ARE","Sugar cane","fabio" +"21856","United Arab Emirates","ARE","Sugar beet","fabio" +"21857","United Arab Emirates","ARE","Beans","fabio" +"21858","United Arab Emirates","ARE","Peas","fabio" +"21859","United Arab Emirates","ARE","Pulses, Other and products","fabio" +"21860","United Arab Emirates","ARE","Nuts and products","fabio" +"21861","United Arab Emirates","ARE","Soyabeans","fabio" +"21862","United Arab Emirates","ARE","Groundnuts (Shelled Eq)","fabio" +"21863","United Arab Emirates","ARE","Sunflower seed","fabio" +"21864","United Arab Emirates","ARE","Rape and Mustardseed","fabio" +"21865","United Arab Emirates","ARE","Seed cotton","fabio" +"21866","United Arab Emirates","ARE","Coconuts - Incl Copra","fabio" +"21867","United Arab Emirates","ARE","Sesame seed","fabio" +"21868","United Arab Emirates","ARE","Oil, palm fruit","fabio" +"21869","United Arab Emirates","ARE","Olives (including preserved)","fabio" +"21870","United Arab Emirates","ARE","Oilcrops, Other","fabio" +"21871","United Arab Emirates","ARE","Tomatoes and products","fabio" +"21872","United Arab Emirates","ARE","Onions","fabio" +"21873","United Arab Emirates","ARE","Vegetables, Other","fabio" +"21874","United Arab Emirates","ARE","Oranges, Mandarines","fabio" +"21875","United Arab Emirates","ARE","Lemons, Limes and products","fabio" +"21876","United Arab Emirates","ARE","Grapefruit and products","fabio" +"21877","United Arab Emirates","ARE","Citrus, Other","fabio" +"21878","United Arab Emirates","ARE","Bananas","fabio" +"21879","United Arab Emirates","ARE","Plantains","fabio" +"21880","United Arab Emirates","ARE","Apples and products","fabio" +"21881","United Arab Emirates","ARE","Pineapples and products","fabio" +"21882","United Arab Emirates","ARE","Dates","fabio" +"21883","United Arab Emirates","ARE","Grapes and products (excl wine)","fabio" +"21884","United Arab Emirates","ARE","Fruits, Other","fabio" +"21885","United Arab Emirates","ARE","Coffee and products","fabio" +"21886","United Arab Emirates","ARE","Cocoa Beans and products","fabio" +"21887","United Arab Emirates","ARE","Tea (including mate)","fabio" +"21888","United Arab Emirates","ARE","Hops","fabio" +"21889","United Arab Emirates","ARE","Pepper","fabio" +"21890","United Arab Emirates","ARE","Pimento","fabio" +"21891","United Arab Emirates","ARE","Cloves","fabio" +"21892","United Arab Emirates","ARE","Spices, Other","fabio" +"21893","United Arab Emirates","ARE","Jute","fabio" +"21894","United Arab Emirates","ARE","Jute-Like Fibres","fabio" +"21895","United Arab Emirates","ARE","Soft-Fibres, Other","fabio" +"21896","United Arab Emirates","ARE","Sisal","fabio" +"21897","United Arab Emirates","ARE","Abaca","fabio" +"21898","United Arab Emirates","ARE","Hard Fibres, Other","fabio" +"21899","United Arab Emirates","ARE","Tobacco","fabio" +"21900","United Arab Emirates","ARE","Rubber","fabio" +"21901","United Arab Emirates","ARE","Fodder crops","fabio" +"21902","United Arab Emirates","ARE","Grazing","fabio" +"21903","United Arab Emirates","ARE","Cottonseed","fabio" +"21904","United Arab Emirates","ARE","Palm kernels","fabio" +"21905","United Arab Emirates","ARE","Sugar non-centrifugal","fabio" +"21906","United Arab Emirates","ARE","Molasses","fabio" +"21907","United Arab Emirates","ARE","Sugar, Refined Equiv","fabio" +"21908","United Arab Emirates","ARE","Sweeteners, Other","fabio" +"21909","United Arab Emirates","ARE","Soyabean Oil","fabio" +"21910","United Arab Emirates","ARE","Groundnut Oil","fabio" +"21911","United Arab Emirates","ARE","Sunflowerseed Oil","fabio" +"21912","United Arab Emirates","ARE","Rape and Mustard Oil","fabio" +"21913","United Arab Emirates","ARE","Cottonseed Oil","fabio" +"21914","United Arab Emirates","ARE","Palmkernel Oil","fabio" +"21915","United Arab Emirates","ARE","Palm Oil","fabio" +"21916","United Arab Emirates","ARE","Coconut Oil","fabio" +"21917","United Arab Emirates","ARE","Sesameseed Oil","fabio" +"21918","United Arab Emirates","ARE","Olive Oil","fabio" +"21919","United Arab Emirates","ARE","Ricebran Oil","fabio" +"21920","United Arab Emirates","ARE","Maize Germ Oil","fabio" +"21921","United Arab Emirates","ARE","Oilcrops Oil, Other","fabio" +"21922","United Arab Emirates","ARE","Soyabean Cake","fabio" +"21923","United Arab Emirates","ARE","Groundnut Cake","fabio" +"21924","United Arab Emirates","ARE","Sunflowerseed Cake","fabio" +"21925","United Arab Emirates","ARE","Rape and Mustard Cake","fabio" +"21926","United Arab Emirates","ARE","Cottonseed Cake","fabio" +"21927","United Arab Emirates","ARE","Palmkernel Cake","fabio" +"21928","United Arab Emirates","ARE","Copra Cake","fabio" +"21929","United Arab Emirates","ARE","Sesameseed Cake","fabio" +"21930","United Arab Emirates","ARE","Oilseed Cakes, Other","fabio" +"21931","United Arab Emirates","ARE","Wine","fabio" +"21932","United Arab Emirates","ARE","Beer","fabio" +"21933","United Arab Emirates","ARE","Beverages, Fermented","fabio" +"21934","United Arab Emirates","ARE","Beverages, Alcoholic","fabio" +"21935","United Arab Emirates","ARE","Alcohol, Non-Food","fabio" +"21936","United Arab Emirates","ARE","Cotton lint","fabio" +"21937","United Arab Emirates","ARE","Cattle","fabio" +"21938","United Arab Emirates","ARE","Buffaloes","fabio" +"21939","United Arab Emirates","ARE","Sheep","fabio" +"21940","United Arab Emirates","ARE","Goats","fabio" +"21941","United Arab Emirates","ARE","Pigs","fabio" +"21942","United Arab Emirates","ARE","Poultry Birds","fabio" +"21943","United Arab Emirates","ARE","Horses","fabio" +"21944","United Arab Emirates","ARE","Asses","fabio" +"21945","United Arab Emirates","ARE","Mules","fabio" +"21946","United Arab Emirates","ARE","Camels","fabio" +"21947","United Arab Emirates","ARE","Camelids, other","fabio" +"21948","United Arab Emirates","ARE","Rabbits and hares","fabio" +"21949","United Arab Emirates","ARE","Rodents, other","fabio" +"21950","United Arab Emirates","ARE","Live animals, other","fabio" +"21951","United Arab Emirates","ARE","Milk - Excluding Butter","fabio" +"21952","United Arab Emirates","ARE","Butter, Ghee","fabio" +"21953","United Arab Emirates","ARE","Eggs","fabio" +"21954","United Arab Emirates","ARE","Wool (Clean Eq.)","fabio" +"21955","United Arab Emirates","ARE","Bovine Meat","fabio" +"21956","United Arab Emirates","ARE","Mutton & Goat Meat","fabio" +"21957","United Arab Emirates","ARE","Pigmeat","fabio" +"21958","United Arab Emirates","ARE","Poultry Meat","fabio" +"21959","United Arab Emirates","ARE","Meat, Other","fabio" +"21960","United Arab Emirates","ARE","Offals, Edible","fabio" +"21961","United Arab Emirates","ARE","Fats, Animals, Raw","fabio" +"21962","United Arab Emirates","ARE","Hides and skins","fabio" +"21963","United Arab Emirates","ARE","Meat Meal","fabio" +"21964","United Arab Emirates","ARE","Pet food","fabio" +"21965","United Arab Emirates","ARE","Honey","fabio" +"21966","United Arab Emirates","ARE","Silk","fabio" +"21967","United Arab Emirates","ARE","Fish, Seafood","fabio" +"21968","United Arab Emirates","ARE","Wood fuel","fabio" +"21969","United Arab Emirates","ARE","Industrial roundwood, coniferous","fabio" +"21970","United Arab Emirates","ARE","Industrial roundwood, non-coniferous","fabio" +"21971","Uganda","UGA","Rice (Milled Equivalent)","fabio" +"21972","Uganda","UGA","Wheat and products","fabio" +"21973","Uganda","UGA","Barley and products","fabio" +"21974","Uganda","UGA","Maize and products","fabio" +"21975","Uganda","UGA","Rye and products","fabio" +"21976","Uganda","UGA","Oats","fabio" +"21977","Uganda","UGA","Millet and products","fabio" +"21978","Uganda","UGA","Sorghum and products","fabio" +"21979","Uganda","UGA","Cereals, Other","fabio" +"21980","Uganda","UGA","Potatoes and products","fabio" +"21981","Uganda","UGA","Cassava and products","fabio" +"21982","Uganda","UGA","Sweet potatoes","fabio" +"21983","Uganda","UGA","Roots, Other","fabio" +"21984","Uganda","UGA","Yams","fabio" +"21985","Uganda","UGA","Sugar cane","fabio" +"21986","Uganda","UGA","Sugar beet","fabio" +"21987","Uganda","UGA","Beans","fabio" +"21988","Uganda","UGA","Peas","fabio" +"21989","Uganda","UGA","Pulses, Other and products","fabio" +"21990","Uganda","UGA","Nuts and products","fabio" +"21991","Uganda","UGA","Soyabeans","fabio" +"21992","Uganda","UGA","Groundnuts (Shelled Eq)","fabio" +"21993","Uganda","UGA","Sunflower seed","fabio" +"21994","Uganda","UGA","Rape and Mustardseed","fabio" +"21995","Uganda","UGA","Seed cotton","fabio" +"21996","Uganda","UGA","Coconuts - Incl Copra","fabio" +"21997","Uganda","UGA","Sesame seed","fabio" +"21998","Uganda","UGA","Oil, palm fruit","fabio" +"21999","Uganda","UGA","Olives (including preserved)","fabio" +"22000","Uganda","UGA","Oilcrops, Other","fabio" +"22001","Uganda","UGA","Tomatoes and products","fabio" +"22002","Uganda","UGA","Onions","fabio" +"22003","Uganda","UGA","Vegetables, Other","fabio" +"22004","Uganda","UGA","Oranges, Mandarines","fabio" +"22005","Uganda","UGA","Lemons, Limes and products","fabio" +"22006","Uganda","UGA","Grapefruit and products","fabio" +"22007","Uganda","UGA","Citrus, Other","fabio" +"22008","Uganda","UGA","Bananas","fabio" +"22009","Uganda","UGA","Plantains","fabio" +"22010","Uganda","UGA","Apples and products","fabio" +"22011","Uganda","UGA","Pineapples and products","fabio" +"22012","Uganda","UGA","Dates","fabio" +"22013","Uganda","UGA","Grapes and products (excl wine)","fabio" +"22014","Uganda","UGA","Fruits, Other","fabio" +"22015","Uganda","UGA","Coffee and products","fabio" +"22016","Uganda","UGA","Cocoa Beans and products","fabio" +"22017","Uganda","UGA","Tea (including mate)","fabio" +"22018","Uganda","UGA","Hops","fabio" +"22019","Uganda","UGA","Pepper","fabio" +"22020","Uganda","UGA","Pimento","fabio" +"22021","Uganda","UGA","Cloves","fabio" +"22022","Uganda","UGA","Spices, Other","fabio" +"22023","Uganda","UGA","Jute","fabio" +"22024","Uganda","UGA","Jute-Like Fibres","fabio" +"22025","Uganda","UGA","Soft-Fibres, Other","fabio" +"22026","Uganda","UGA","Sisal","fabio" +"22027","Uganda","UGA","Abaca","fabio" +"22028","Uganda","UGA","Hard Fibres, Other","fabio" +"22029","Uganda","UGA","Tobacco","fabio" +"22030","Uganda","UGA","Rubber","fabio" +"22031","Uganda","UGA","Fodder crops","fabio" +"22032","Uganda","UGA","Grazing","fabio" +"22033","Uganda","UGA","Cottonseed","fabio" +"22034","Uganda","UGA","Palm kernels","fabio" +"22035","Uganda","UGA","Sugar non-centrifugal","fabio" +"22036","Uganda","UGA","Molasses","fabio" +"22037","Uganda","UGA","Sugar, Refined Equiv","fabio" +"22038","Uganda","UGA","Sweeteners, Other","fabio" +"22039","Uganda","UGA","Soyabean Oil","fabio" +"22040","Uganda","UGA","Groundnut Oil","fabio" +"22041","Uganda","UGA","Sunflowerseed Oil","fabio" +"22042","Uganda","UGA","Rape and Mustard Oil","fabio" +"22043","Uganda","UGA","Cottonseed Oil","fabio" +"22044","Uganda","UGA","Palmkernel Oil","fabio" +"22045","Uganda","UGA","Palm Oil","fabio" +"22046","Uganda","UGA","Coconut Oil","fabio" +"22047","Uganda","UGA","Sesameseed Oil","fabio" +"22048","Uganda","UGA","Olive Oil","fabio" +"22049","Uganda","UGA","Ricebran Oil","fabio" +"22050","Uganda","UGA","Maize Germ Oil","fabio" +"22051","Uganda","UGA","Oilcrops Oil, Other","fabio" +"22052","Uganda","UGA","Soyabean Cake","fabio" +"22053","Uganda","UGA","Groundnut Cake","fabio" +"22054","Uganda","UGA","Sunflowerseed Cake","fabio" +"22055","Uganda","UGA","Rape and Mustard Cake","fabio" +"22056","Uganda","UGA","Cottonseed Cake","fabio" +"22057","Uganda","UGA","Palmkernel Cake","fabio" +"22058","Uganda","UGA","Copra Cake","fabio" +"22059","Uganda","UGA","Sesameseed Cake","fabio" +"22060","Uganda","UGA","Oilseed Cakes, Other","fabio" +"22061","Uganda","UGA","Wine","fabio" +"22062","Uganda","UGA","Beer","fabio" +"22063","Uganda","UGA","Beverages, Fermented","fabio" +"22064","Uganda","UGA","Beverages, Alcoholic","fabio" +"22065","Uganda","UGA","Alcohol, Non-Food","fabio" +"22066","Uganda","UGA","Cotton lint","fabio" +"22067","Uganda","UGA","Cattle","fabio" +"22068","Uganda","UGA","Buffaloes","fabio" +"22069","Uganda","UGA","Sheep","fabio" +"22070","Uganda","UGA","Goats","fabio" +"22071","Uganda","UGA","Pigs","fabio" +"22072","Uganda","UGA","Poultry Birds","fabio" +"22073","Uganda","UGA","Horses","fabio" +"22074","Uganda","UGA","Asses","fabio" +"22075","Uganda","UGA","Mules","fabio" +"22076","Uganda","UGA","Camels","fabio" +"22077","Uganda","UGA","Camelids, other","fabio" +"22078","Uganda","UGA","Rabbits and hares","fabio" +"22079","Uganda","UGA","Rodents, other","fabio" +"22080","Uganda","UGA","Live animals, other","fabio" +"22081","Uganda","UGA","Milk - Excluding Butter","fabio" +"22082","Uganda","UGA","Butter, Ghee","fabio" +"22083","Uganda","UGA","Eggs","fabio" +"22084","Uganda","UGA","Wool (Clean Eq.)","fabio" +"22085","Uganda","UGA","Bovine Meat","fabio" +"22086","Uganda","UGA","Mutton & Goat Meat","fabio" +"22087","Uganda","UGA","Pigmeat","fabio" +"22088","Uganda","UGA","Poultry Meat","fabio" +"22089","Uganda","UGA","Meat, Other","fabio" +"22090","Uganda","UGA","Offals, Edible","fabio" +"22091","Uganda","UGA","Fats, Animals, Raw","fabio" +"22092","Uganda","UGA","Hides and skins","fabio" +"22093","Uganda","UGA","Meat Meal","fabio" +"22094","Uganda","UGA","Pet food","fabio" +"22095","Uganda","UGA","Honey","fabio" +"22096","Uganda","UGA","Silk","fabio" +"22097","Uganda","UGA","Fish, Seafood","fabio" +"22098","Uganda","UGA","Wood fuel","fabio" +"22099","Uganda","UGA","Industrial roundwood, coniferous","fabio" +"22100","Uganda","UGA","Industrial roundwood, non-coniferous","fabio" +"22101","USSR","SUN","Rice (Milled Equivalent)","fabio" +"22102","USSR","SUN","Wheat and products","fabio" +"22103","USSR","SUN","Barley and products","fabio" +"22104","USSR","SUN","Maize and products","fabio" +"22105","USSR","SUN","Rye and products","fabio" +"22106","USSR","SUN","Oats","fabio" +"22107","USSR","SUN","Millet and products","fabio" +"22108","USSR","SUN","Sorghum and products","fabio" +"22109","USSR","SUN","Cereals, Other","fabio" +"22110","USSR","SUN","Potatoes and products","fabio" +"22111","USSR","SUN","Cassava and products","fabio" +"22112","USSR","SUN","Sweet potatoes","fabio" +"22113","USSR","SUN","Roots, Other","fabio" +"22114","USSR","SUN","Yams","fabio" +"22115","USSR","SUN","Sugar cane","fabio" +"22116","USSR","SUN","Sugar beet","fabio" +"22117","USSR","SUN","Beans","fabio" +"22118","USSR","SUN","Peas","fabio" +"22119","USSR","SUN","Pulses, Other and products","fabio" +"22120","USSR","SUN","Nuts and products","fabio" +"22121","USSR","SUN","Soyabeans","fabio" +"22122","USSR","SUN","Groundnuts (Shelled Eq)","fabio" +"22123","USSR","SUN","Sunflower seed","fabio" +"22124","USSR","SUN","Rape and Mustardseed","fabio" +"22125","USSR","SUN","Seed cotton","fabio" +"22126","USSR","SUN","Coconuts - Incl Copra","fabio" +"22127","USSR","SUN","Sesame seed","fabio" +"22128","USSR","SUN","Oil, palm fruit","fabio" +"22129","USSR","SUN","Olives (including preserved)","fabio" +"22130","USSR","SUN","Oilcrops, Other","fabio" +"22131","USSR","SUN","Tomatoes and products","fabio" +"22132","USSR","SUN","Onions","fabio" +"22133","USSR","SUN","Vegetables, Other","fabio" +"22134","USSR","SUN","Oranges, Mandarines","fabio" +"22135","USSR","SUN","Lemons, Limes and products","fabio" +"22136","USSR","SUN","Grapefruit and products","fabio" +"22137","USSR","SUN","Citrus, Other","fabio" +"22138","USSR","SUN","Bananas","fabio" +"22139","USSR","SUN","Plantains","fabio" +"22140","USSR","SUN","Apples and products","fabio" +"22141","USSR","SUN","Pineapples and products","fabio" +"22142","USSR","SUN","Dates","fabio" +"22143","USSR","SUN","Grapes and products (excl wine)","fabio" +"22144","USSR","SUN","Fruits, Other","fabio" +"22145","USSR","SUN","Coffee and products","fabio" +"22146","USSR","SUN","Cocoa Beans and products","fabio" +"22147","USSR","SUN","Tea (including mate)","fabio" +"22148","USSR","SUN","Hops","fabio" +"22149","USSR","SUN","Pepper","fabio" +"22150","USSR","SUN","Pimento","fabio" +"22151","USSR","SUN","Cloves","fabio" +"22152","USSR","SUN","Spices, Other","fabio" +"22153","USSR","SUN","Jute","fabio" +"22154","USSR","SUN","Jute-Like Fibres","fabio" +"22155","USSR","SUN","Soft-Fibres, Other","fabio" +"22156","USSR","SUN","Sisal","fabio" +"22157","USSR","SUN","Abaca","fabio" +"22158","USSR","SUN","Hard Fibres, Other","fabio" +"22159","USSR","SUN","Tobacco","fabio" +"22160","USSR","SUN","Rubber","fabio" +"22161","USSR","SUN","Fodder crops","fabio" +"22162","USSR","SUN","Grazing","fabio" +"22163","USSR","SUN","Cottonseed","fabio" +"22164","USSR","SUN","Palm kernels","fabio" +"22165","USSR","SUN","Sugar non-centrifugal","fabio" +"22166","USSR","SUN","Molasses","fabio" +"22167","USSR","SUN","Sugar, Refined Equiv","fabio" +"22168","USSR","SUN","Sweeteners, Other","fabio" +"22169","USSR","SUN","Soyabean Oil","fabio" +"22170","USSR","SUN","Groundnut Oil","fabio" +"22171","USSR","SUN","Sunflowerseed Oil","fabio" +"22172","USSR","SUN","Rape and Mustard Oil","fabio" +"22173","USSR","SUN","Cottonseed Oil","fabio" +"22174","USSR","SUN","Palmkernel Oil","fabio" +"22175","USSR","SUN","Palm Oil","fabio" +"22176","USSR","SUN","Coconut Oil","fabio" +"22177","USSR","SUN","Sesameseed Oil","fabio" +"22178","USSR","SUN","Olive Oil","fabio" +"22179","USSR","SUN","Ricebran Oil","fabio" +"22180","USSR","SUN","Maize Germ Oil","fabio" +"22181","USSR","SUN","Oilcrops Oil, Other","fabio" +"22182","USSR","SUN","Soyabean Cake","fabio" +"22183","USSR","SUN","Groundnut Cake","fabio" +"22184","USSR","SUN","Sunflowerseed Cake","fabio" +"22185","USSR","SUN","Rape and Mustard Cake","fabio" +"22186","USSR","SUN","Cottonseed Cake","fabio" +"22187","USSR","SUN","Palmkernel Cake","fabio" +"22188","USSR","SUN","Copra Cake","fabio" +"22189","USSR","SUN","Sesameseed Cake","fabio" +"22190","USSR","SUN","Oilseed Cakes, Other","fabio" +"22191","USSR","SUN","Wine","fabio" +"22192","USSR","SUN","Beer","fabio" +"22193","USSR","SUN","Beverages, Fermented","fabio" +"22194","USSR","SUN","Beverages, Alcoholic","fabio" +"22195","USSR","SUN","Alcohol, Non-Food","fabio" +"22196","USSR","SUN","Cotton lint","fabio" +"22197","USSR","SUN","Cattle","fabio" +"22198","USSR","SUN","Buffaloes","fabio" +"22199","USSR","SUN","Sheep","fabio" +"22200","USSR","SUN","Goats","fabio" +"22201","USSR","SUN","Pigs","fabio" +"22202","USSR","SUN","Poultry Birds","fabio" +"22203","USSR","SUN","Horses","fabio" +"22204","USSR","SUN","Asses","fabio" +"22205","USSR","SUN","Mules","fabio" +"22206","USSR","SUN","Camels","fabio" +"22207","USSR","SUN","Camelids, other","fabio" +"22208","USSR","SUN","Rabbits and hares","fabio" +"22209","USSR","SUN","Rodents, other","fabio" +"22210","USSR","SUN","Live animals, other","fabio" +"22211","USSR","SUN","Milk - Excluding Butter","fabio" +"22212","USSR","SUN","Butter, Ghee","fabio" +"22213","USSR","SUN","Eggs","fabio" +"22214","USSR","SUN","Wool (Clean Eq.)","fabio" +"22215","USSR","SUN","Bovine Meat","fabio" +"22216","USSR","SUN","Mutton & Goat Meat","fabio" +"22217","USSR","SUN","Pigmeat","fabio" +"22218","USSR","SUN","Poultry Meat","fabio" +"22219","USSR","SUN","Meat, Other","fabio" +"22220","USSR","SUN","Offals, Edible","fabio" +"22221","USSR","SUN","Fats, Animals, Raw","fabio" +"22222","USSR","SUN","Hides and skins","fabio" +"22223","USSR","SUN","Meat Meal","fabio" +"22224","USSR","SUN","Pet food","fabio" +"22225","USSR","SUN","Honey","fabio" +"22226","USSR","SUN","Silk","fabio" +"22227","USSR","SUN","Fish, Seafood","fabio" +"22228","USSR","SUN","Wood fuel","fabio" +"22229","USSR","SUN","Industrial roundwood, coniferous","fabio" +"22230","USSR","SUN","Industrial roundwood, non-coniferous","fabio" +"22231","United Kingdom","GBR","Rice (Milled Equivalent)","fabio" +"22232","United Kingdom","GBR","Wheat and products","fabio" +"22233","United Kingdom","GBR","Barley and products","fabio" +"22234","United Kingdom","GBR","Maize and products","fabio" +"22235","United Kingdom","GBR","Rye and products","fabio" +"22236","United Kingdom","GBR","Oats","fabio" +"22237","United Kingdom","GBR","Millet and products","fabio" +"22238","United Kingdom","GBR","Sorghum and products","fabio" +"22239","United Kingdom","GBR","Cereals, Other","fabio" +"22240","United Kingdom","GBR","Potatoes and products","fabio" +"22241","United Kingdom","GBR","Cassava and products","fabio" +"22242","United Kingdom","GBR","Sweet potatoes","fabio" +"22243","United Kingdom","GBR","Roots, Other","fabio" +"22244","United Kingdom","GBR","Yams","fabio" +"22245","United Kingdom","GBR","Sugar cane","fabio" +"22246","United Kingdom","GBR","Sugar beet","fabio" +"22247","United Kingdom","GBR","Beans","fabio" +"22248","United Kingdom","GBR","Peas","fabio" +"22249","United Kingdom","GBR","Pulses, Other and products","fabio" +"22250","United Kingdom","GBR","Nuts and products","fabio" +"22251","United Kingdom","GBR","Soyabeans","fabio" +"22252","United Kingdom","GBR","Groundnuts (Shelled Eq)","fabio" +"22253","United Kingdom","GBR","Sunflower seed","fabio" +"22254","United Kingdom","GBR","Rape and Mustardseed","fabio" +"22255","United Kingdom","GBR","Seed cotton","fabio" +"22256","United Kingdom","GBR","Coconuts - Incl Copra","fabio" +"22257","United Kingdom","GBR","Sesame seed","fabio" +"22258","United Kingdom","GBR","Oil, palm fruit","fabio" +"22259","United Kingdom","GBR","Olives (including preserved)","fabio" +"22260","United Kingdom","GBR","Oilcrops, Other","fabio" +"22261","United Kingdom","GBR","Tomatoes and products","fabio" +"22262","United Kingdom","GBR","Onions","fabio" +"22263","United Kingdom","GBR","Vegetables, Other","fabio" +"22264","United Kingdom","GBR","Oranges, Mandarines","fabio" +"22265","United Kingdom","GBR","Lemons, Limes and products","fabio" +"22266","United Kingdom","GBR","Grapefruit and products","fabio" +"22267","United Kingdom","GBR","Citrus, Other","fabio" +"22268","United Kingdom","GBR","Bananas","fabio" +"22269","United Kingdom","GBR","Plantains","fabio" +"22270","United Kingdom","GBR","Apples and products","fabio" +"22271","United Kingdom","GBR","Pineapples and products","fabio" +"22272","United Kingdom","GBR","Dates","fabio" +"22273","United Kingdom","GBR","Grapes and products (excl wine)","fabio" +"22274","United Kingdom","GBR","Fruits, Other","fabio" +"22275","United Kingdom","GBR","Coffee and products","fabio" +"22276","United Kingdom","GBR","Cocoa Beans and products","fabio" +"22277","United Kingdom","GBR","Tea (including mate)","fabio" +"22278","United Kingdom","GBR","Hops","fabio" +"22279","United Kingdom","GBR","Pepper","fabio" +"22280","United Kingdom","GBR","Pimento","fabio" +"22281","United Kingdom","GBR","Cloves","fabio" +"22282","United Kingdom","GBR","Spices, Other","fabio" +"22283","United Kingdom","GBR","Jute","fabio" +"22284","United Kingdom","GBR","Jute-Like Fibres","fabio" +"22285","United Kingdom","GBR","Soft-Fibres, Other","fabio" +"22286","United Kingdom","GBR","Sisal","fabio" +"22287","United Kingdom","GBR","Abaca","fabio" +"22288","United Kingdom","GBR","Hard Fibres, Other","fabio" +"22289","United Kingdom","GBR","Tobacco","fabio" +"22290","United Kingdom","GBR","Rubber","fabio" +"22291","United Kingdom","GBR","Fodder crops","fabio" +"22292","United Kingdom","GBR","Grazing","fabio" +"22293","United Kingdom","GBR","Cottonseed","fabio" +"22294","United Kingdom","GBR","Palm kernels","fabio" +"22295","United Kingdom","GBR","Sugar non-centrifugal","fabio" +"22296","United Kingdom","GBR","Molasses","fabio" +"22297","United Kingdom","GBR","Sugar, Refined Equiv","fabio" +"22298","United Kingdom","GBR","Sweeteners, Other","fabio" +"22299","United Kingdom","GBR","Soyabean Oil","fabio" +"22300","United Kingdom","GBR","Groundnut Oil","fabio" +"22301","United Kingdom","GBR","Sunflowerseed Oil","fabio" +"22302","United Kingdom","GBR","Rape and Mustard Oil","fabio" +"22303","United Kingdom","GBR","Cottonseed Oil","fabio" +"22304","United Kingdom","GBR","Palmkernel Oil","fabio" +"22305","United Kingdom","GBR","Palm Oil","fabio" +"22306","United Kingdom","GBR","Coconut Oil","fabio" +"22307","United Kingdom","GBR","Sesameseed Oil","fabio" +"22308","United Kingdom","GBR","Olive Oil","fabio" +"22309","United Kingdom","GBR","Ricebran Oil","fabio" +"22310","United Kingdom","GBR","Maize Germ Oil","fabio" +"22311","United Kingdom","GBR","Oilcrops Oil, Other","fabio" +"22312","United Kingdom","GBR","Soyabean Cake","fabio" +"22313","United Kingdom","GBR","Groundnut Cake","fabio" +"22314","United Kingdom","GBR","Sunflowerseed Cake","fabio" +"22315","United Kingdom","GBR","Rape and Mustard Cake","fabio" +"22316","United Kingdom","GBR","Cottonseed Cake","fabio" +"22317","United Kingdom","GBR","Palmkernel Cake","fabio" +"22318","United Kingdom","GBR","Copra Cake","fabio" +"22319","United Kingdom","GBR","Sesameseed Cake","fabio" +"22320","United Kingdom","GBR","Oilseed Cakes, Other","fabio" +"22321","United Kingdom","GBR","Wine","fabio" +"22322","United Kingdom","GBR","Beer","fabio" +"22323","United Kingdom","GBR","Beverages, Fermented","fabio" +"22324","United Kingdom","GBR","Beverages, Alcoholic","fabio" +"22325","United Kingdom","GBR","Alcohol, Non-Food","fabio" +"22326","United Kingdom","GBR","Cotton lint","fabio" +"22327","United Kingdom","GBR","Cattle","fabio" +"22328","United Kingdom","GBR","Buffaloes","fabio" +"22329","United Kingdom","GBR","Sheep","fabio" +"22330","United Kingdom","GBR","Goats","fabio" +"22331","United Kingdom","GBR","Pigs","fabio" +"22332","United Kingdom","GBR","Poultry Birds","fabio" +"22333","United Kingdom","GBR","Horses","fabio" +"22334","United Kingdom","GBR","Asses","fabio" +"22335","United Kingdom","GBR","Mules","fabio" +"22336","United Kingdom","GBR","Camels","fabio" +"22337","United Kingdom","GBR","Camelids, other","fabio" +"22338","United Kingdom","GBR","Rabbits and hares","fabio" +"22339","United Kingdom","GBR","Rodents, other","fabio" +"22340","United Kingdom","GBR","Live animals, other","fabio" +"22341","United Kingdom","GBR","Milk - Excluding Butter","fabio" +"22342","United Kingdom","GBR","Butter, Ghee","fabio" +"22343","United Kingdom","GBR","Eggs","fabio" +"22344","United Kingdom","GBR","Wool (Clean Eq.)","fabio" +"22345","United Kingdom","GBR","Bovine Meat","fabio" +"22346","United Kingdom","GBR","Mutton & Goat Meat","fabio" +"22347","United Kingdom","GBR","Pigmeat","fabio" +"22348","United Kingdom","GBR","Poultry Meat","fabio" +"22349","United Kingdom","GBR","Meat, Other","fabio" +"22350","United Kingdom","GBR","Offals, Edible","fabio" +"22351","United Kingdom","GBR","Fats, Animals, Raw","fabio" +"22352","United Kingdom","GBR","Hides and skins","fabio" +"22353","United Kingdom","GBR","Meat Meal","fabio" +"22354","United Kingdom","GBR","Pet food","fabio" +"22355","United Kingdom","GBR","Honey","fabio" +"22356","United Kingdom","GBR","Silk","fabio" +"22357","United Kingdom","GBR","Fish, Seafood","fabio" +"22358","United Kingdom","GBR","Wood fuel","fabio" +"22359","United Kingdom","GBR","Industrial roundwood, coniferous","fabio" +"22360","United Kingdom","GBR","Industrial roundwood, non-coniferous","fabio" +"22361","Ukraine","UKR","Rice (Milled Equivalent)","fabio" +"22362","Ukraine","UKR","Wheat and products","fabio" +"22363","Ukraine","UKR","Barley and products","fabio" +"22364","Ukraine","UKR","Maize and products","fabio" +"22365","Ukraine","UKR","Rye and products","fabio" +"22366","Ukraine","UKR","Oats","fabio" +"22367","Ukraine","UKR","Millet and products","fabio" +"22368","Ukraine","UKR","Sorghum and products","fabio" +"22369","Ukraine","UKR","Cereals, Other","fabio" +"22370","Ukraine","UKR","Potatoes and products","fabio" +"22371","Ukraine","UKR","Cassava and products","fabio" +"22372","Ukraine","UKR","Sweet potatoes","fabio" +"22373","Ukraine","UKR","Roots, Other","fabio" +"22374","Ukraine","UKR","Yams","fabio" +"22375","Ukraine","UKR","Sugar cane","fabio" +"22376","Ukraine","UKR","Sugar beet","fabio" +"22377","Ukraine","UKR","Beans","fabio" +"22378","Ukraine","UKR","Peas","fabio" +"22379","Ukraine","UKR","Pulses, Other and products","fabio" +"22380","Ukraine","UKR","Nuts and products","fabio" +"22381","Ukraine","UKR","Soyabeans","fabio" +"22382","Ukraine","UKR","Groundnuts (Shelled Eq)","fabio" +"22383","Ukraine","UKR","Sunflower seed","fabio" +"22384","Ukraine","UKR","Rape and Mustardseed","fabio" +"22385","Ukraine","UKR","Seed cotton","fabio" +"22386","Ukraine","UKR","Coconuts - Incl Copra","fabio" +"22387","Ukraine","UKR","Sesame seed","fabio" +"22388","Ukraine","UKR","Oil, palm fruit","fabio" +"22389","Ukraine","UKR","Olives (including preserved)","fabio" +"22390","Ukraine","UKR","Oilcrops, Other","fabio" +"22391","Ukraine","UKR","Tomatoes and products","fabio" +"22392","Ukraine","UKR","Onions","fabio" +"22393","Ukraine","UKR","Vegetables, Other","fabio" +"22394","Ukraine","UKR","Oranges, Mandarines","fabio" +"22395","Ukraine","UKR","Lemons, Limes and products","fabio" +"22396","Ukraine","UKR","Grapefruit and products","fabio" +"22397","Ukraine","UKR","Citrus, Other","fabio" +"22398","Ukraine","UKR","Bananas","fabio" +"22399","Ukraine","UKR","Plantains","fabio" +"22400","Ukraine","UKR","Apples and products","fabio" +"22401","Ukraine","UKR","Pineapples and products","fabio" +"22402","Ukraine","UKR","Dates","fabio" +"22403","Ukraine","UKR","Grapes and products (excl wine)","fabio" +"22404","Ukraine","UKR","Fruits, Other","fabio" +"22405","Ukraine","UKR","Coffee and products","fabio" +"22406","Ukraine","UKR","Cocoa Beans and products","fabio" +"22407","Ukraine","UKR","Tea (including mate)","fabio" +"22408","Ukraine","UKR","Hops","fabio" +"22409","Ukraine","UKR","Pepper","fabio" +"22410","Ukraine","UKR","Pimento","fabio" +"22411","Ukraine","UKR","Cloves","fabio" +"22412","Ukraine","UKR","Spices, Other","fabio" +"22413","Ukraine","UKR","Jute","fabio" +"22414","Ukraine","UKR","Jute-Like Fibres","fabio" +"22415","Ukraine","UKR","Soft-Fibres, Other","fabio" +"22416","Ukraine","UKR","Sisal","fabio" +"22417","Ukraine","UKR","Abaca","fabio" +"22418","Ukraine","UKR","Hard Fibres, Other","fabio" +"22419","Ukraine","UKR","Tobacco","fabio" +"22420","Ukraine","UKR","Rubber","fabio" +"22421","Ukraine","UKR","Fodder crops","fabio" +"22422","Ukraine","UKR","Grazing","fabio" +"22423","Ukraine","UKR","Cottonseed","fabio" +"22424","Ukraine","UKR","Palm kernels","fabio" +"22425","Ukraine","UKR","Sugar non-centrifugal","fabio" +"22426","Ukraine","UKR","Molasses","fabio" +"22427","Ukraine","UKR","Sugar, Refined Equiv","fabio" +"22428","Ukraine","UKR","Sweeteners, Other","fabio" +"22429","Ukraine","UKR","Soyabean Oil","fabio" +"22430","Ukraine","UKR","Groundnut Oil","fabio" +"22431","Ukraine","UKR","Sunflowerseed Oil","fabio" +"22432","Ukraine","UKR","Rape and Mustard Oil","fabio" +"22433","Ukraine","UKR","Cottonseed Oil","fabio" +"22434","Ukraine","UKR","Palmkernel Oil","fabio" +"22435","Ukraine","UKR","Palm Oil","fabio" +"22436","Ukraine","UKR","Coconut Oil","fabio" +"22437","Ukraine","UKR","Sesameseed Oil","fabio" +"22438","Ukraine","UKR","Olive Oil","fabio" +"22439","Ukraine","UKR","Ricebran Oil","fabio" +"22440","Ukraine","UKR","Maize Germ Oil","fabio" +"22441","Ukraine","UKR","Oilcrops Oil, Other","fabio" +"22442","Ukraine","UKR","Soyabean Cake","fabio" +"22443","Ukraine","UKR","Groundnut Cake","fabio" +"22444","Ukraine","UKR","Sunflowerseed Cake","fabio" +"22445","Ukraine","UKR","Rape and Mustard Cake","fabio" +"22446","Ukraine","UKR","Cottonseed Cake","fabio" +"22447","Ukraine","UKR","Palmkernel Cake","fabio" +"22448","Ukraine","UKR","Copra Cake","fabio" +"22449","Ukraine","UKR","Sesameseed Cake","fabio" +"22450","Ukraine","UKR","Oilseed Cakes, Other","fabio" +"22451","Ukraine","UKR","Wine","fabio" +"22452","Ukraine","UKR","Beer","fabio" +"22453","Ukraine","UKR","Beverages, Fermented","fabio" +"22454","Ukraine","UKR","Beverages, Alcoholic","fabio" +"22455","Ukraine","UKR","Alcohol, Non-Food","fabio" +"22456","Ukraine","UKR","Cotton lint","fabio" +"22457","Ukraine","UKR","Cattle","fabio" +"22458","Ukraine","UKR","Buffaloes","fabio" +"22459","Ukraine","UKR","Sheep","fabio" +"22460","Ukraine","UKR","Goats","fabio" +"22461","Ukraine","UKR","Pigs","fabio" +"22462","Ukraine","UKR","Poultry Birds","fabio" +"22463","Ukraine","UKR","Horses","fabio" +"22464","Ukraine","UKR","Asses","fabio" +"22465","Ukraine","UKR","Mules","fabio" +"22466","Ukraine","UKR","Camels","fabio" +"22467","Ukraine","UKR","Camelids, other","fabio" +"22468","Ukraine","UKR","Rabbits and hares","fabio" +"22469","Ukraine","UKR","Rodents, other","fabio" +"22470","Ukraine","UKR","Live animals, other","fabio" +"22471","Ukraine","UKR","Milk - Excluding Butter","fabio" +"22472","Ukraine","UKR","Butter, Ghee","fabio" +"22473","Ukraine","UKR","Eggs","fabio" +"22474","Ukraine","UKR","Wool (Clean Eq.)","fabio" +"22475","Ukraine","UKR","Bovine Meat","fabio" +"22476","Ukraine","UKR","Mutton & Goat Meat","fabio" +"22477","Ukraine","UKR","Pigmeat","fabio" +"22478","Ukraine","UKR","Poultry Meat","fabio" +"22479","Ukraine","UKR","Meat, Other","fabio" +"22480","Ukraine","UKR","Offals, Edible","fabio" +"22481","Ukraine","UKR","Fats, Animals, Raw","fabio" +"22482","Ukraine","UKR","Hides and skins","fabio" +"22483","Ukraine","UKR","Meat Meal","fabio" +"22484","Ukraine","UKR","Pet food","fabio" +"22485","Ukraine","UKR","Honey","fabio" +"22486","Ukraine","UKR","Silk","fabio" +"22487","Ukraine","UKR","Fish, Seafood","fabio" +"22488","Ukraine","UKR","Wood fuel","fabio" +"22489","Ukraine","UKR","Industrial roundwood, coniferous","fabio" +"22490","Ukraine","UKR","Industrial roundwood, non-coniferous","fabio" +"22491","United States of America","USA","Rice (Milled Equivalent)","fabio" +"22492","United States of America","USA","Wheat and products","fabio" +"22493","United States of America","USA","Barley and products","fabio" +"22494","United States of America","USA","Maize and products","fabio" +"22495","United States of America","USA","Rye and products","fabio" +"22496","United States of America","USA","Oats","fabio" +"22497","United States of America","USA","Millet and products","fabio" +"22498","United States of America","USA","Sorghum and products","fabio" +"22499","United States of America","USA","Cereals, Other","fabio" +"22500","United States of America","USA","Potatoes and products","fabio" +"22501","United States of America","USA","Cassava and products","fabio" +"22502","United States of America","USA","Sweet potatoes","fabio" +"22503","United States of America","USA","Roots, Other","fabio" +"22504","United States of America","USA","Yams","fabio" +"22505","United States of America","USA","Sugar cane","fabio" +"22506","United States of America","USA","Sugar beet","fabio" +"22507","United States of America","USA","Beans","fabio" +"22508","United States of America","USA","Peas","fabio" +"22509","United States of America","USA","Pulses, Other and products","fabio" +"22510","United States of America","USA","Nuts and products","fabio" +"22511","United States of America","USA","Soyabeans","fabio" +"22512","United States of America","USA","Groundnuts (Shelled Eq)","fabio" +"22513","United States of America","USA","Sunflower seed","fabio" +"22514","United States of America","USA","Rape and Mustardseed","fabio" +"22515","United States of America","USA","Seed cotton","fabio" +"22516","United States of America","USA","Coconuts - Incl Copra","fabio" +"22517","United States of America","USA","Sesame seed","fabio" +"22518","United States of America","USA","Oil, palm fruit","fabio" +"22519","United States of America","USA","Olives (including preserved)","fabio" +"22520","United States of America","USA","Oilcrops, Other","fabio" +"22521","United States of America","USA","Tomatoes and products","fabio" +"22522","United States of America","USA","Onions","fabio" +"22523","United States of America","USA","Vegetables, Other","fabio" +"22524","United States of America","USA","Oranges, Mandarines","fabio" +"22525","United States of America","USA","Lemons, Limes and products","fabio" +"22526","United States of America","USA","Grapefruit and products","fabio" +"22527","United States of America","USA","Citrus, Other","fabio" +"22528","United States of America","USA","Bananas","fabio" +"22529","United States of America","USA","Plantains","fabio" +"22530","United States of America","USA","Apples and products","fabio" +"22531","United States of America","USA","Pineapples and products","fabio" +"22532","United States of America","USA","Dates","fabio" +"22533","United States of America","USA","Grapes and products (excl wine)","fabio" +"22534","United States of America","USA","Fruits, Other","fabio" +"22535","United States of America","USA","Coffee and products","fabio" +"22536","United States of America","USA","Cocoa Beans and products","fabio" +"22537","United States of America","USA","Tea (including mate)","fabio" +"22538","United States of America","USA","Hops","fabio" +"22539","United States of America","USA","Pepper","fabio" +"22540","United States of America","USA","Pimento","fabio" +"22541","United States of America","USA","Cloves","fabio" +"22542","United States of America","USA","Spices, Other","fabio" +"22543","United States of America","USA","Jute","fabio" +"22544","United States of America","USA","Jute-Like Fibres","fabio" +"22545","United States of America","USA","Soft-Fibres, Other","fabio" +"22546","United States of America","USA","Sisal","fabio" +"22547","United States of America","USA","Abaca","fabio" +"22548","United States of America","USA","Hard Fibres, Other","fabio" +"22549","United States of America","USA","Tobacco","fabio" +"22550","United States of America","USA","Rubber","fabio" +"22551","United States of America","USA","Fodder crops","fabio" +"22552","United States of America","USA","Grazing","fabio" +"22553","United States of America","USA","Cottonseed","fabio" +"22554","United States of America","USA","Palm kernels","fabio" +"22555","United States of America","USA","Sugar non-centrifugal","fabio" +"22556","United States of America","USA","Molasses","fabio" +"22557","United States of America","USA","Sugar, Refined Equiv","fabio" +"22558","United States of America","USA","Sweeteners, Other","fabio" +"22559","United States of America","USA","Soyabean Oil","fabio" +"22560","United States of America","USA","Groundnut Oil","fabio" +"22561","United States of America","USA","Sunflowerseed Oil","fabio" +"22562","United States of America","USA","Rape and Mustard Oil","fabio" +"22563","United States of America","USA","Cottonseed Oil","fabio" +"22564","United States of America","USA","Palmkernel Oil","fabio" +"22565","United States of America","USA","Palm Oil","fabio" +"22566","United States of America","USA","Coconut Oil","fabio" +"22567","United States of America","USA","Sesameseed Oil","fabio" +"22568","United States of America","USA","Olive Oil","fabio" +"22569","United States of America","USA","Ricebran Oil","fabio" +"22570","United States of America","USA","Maize Germ Oil","fabio" +"22571","United States of America","USA","Oilcrops Oil, Other","fabio" +"22572","United States of America","USA","Soyabean Cake","fabio" +"22573","United States of America","USA","Groundnut Cake","fabio" +"22574","United States of America","USA","Sunflowerseed Cake","fabio" +"22575","United States of America","USA","Rape and Mustard Cake","fabio" +"22576","United States of America","USA","Cottonseed Cake","fabio" +"22577","United States of America","USA","Palmkernel Cake","fabio" +"22578","United States of America","USA","Copra Cake","fabio" +"22579","United States of America","USA","Sesameseed Cake","fabio" +"22580","United States of America","USA","Oilseed Cakes, Other","fabio" +"22581","United States of America","USA","Wine","fabio" +"22582","United States of America","USA","Beer","fabio" +"22583","United States of America","USA","Beverages, Fermented","fabio" +"22584","United States of America","USA","Beverages, Alcoholic","fabio" +"22585","United States of America","USA","Alcohol, Non-Food","fabio" +"22586","United States of America","USA","Cotton lint","fabio" +"22587","United States of America","USA","Cattle","fabio" +"22588","United States of America","USA","Buffaloes","fabio" +"22589","United States of America","USA","Sheep","fabio" +"22590","United States of America","USA","Goats","fabio" +"22591","United States of America","USA","Pigs","fabio" +"22592","United States of America","USA","Poultry Birds","fabio" +"22593","United States of America","USA","Horses","fabio" +"22594","United States of America","USA","Asses","fabio" +"22595","United States of America","USA","Mules","fabio" +"22596","United States of America","USA","Camels","fabio" +"22597","United States of America","USA","Camelids, other","fabio" +"22598","United States of America","USA","Rabbits and hares","fabio" +"22599","United States of America","USA","Rodents, other","fabio" +"22600","United States of America","USA","Live animals, other","fabio" +"22601","United States of America","USA","Milk - Excluding Butter","fabio" +"22602","United States of America","USA","Butter, Ghee","fabio" +"22603","United States of America","USA","Eggs","fabio" +"22604","United States of America","USA","Wool (Clean Eq.)","fabio" +"22605","United States of America","USA","Bovine Meat","fabio" +"22606","United States of America","USA","Mutton & Goat Meat","fabio" +"22607","United States of America","USA","Pigmeat","fabio" +"22608","United States of America","USA","Poultry Meat","fabio" +"22609","United States of America","USA","Meat, Other","fabio" +"22610","United States of America","USA","Offals, Edible","fabio" +"22611","United States of America","USA","Fats, Animals, Raw","fabio" +"22612","United States of America","USA","Hides and skins","fabio" +"22613","United States of America","USA","Meat Meal","fabio" +"22614","United States of America","USA","Pet food","fabio" +"22615","United States of America","USA","Honey","fabio" +"22616","United States of America","USA","Silk","fabio" +"22617","United States of America","USA","Fish, Seafood","fabio" +"22618","United States of America","USA","Wood fuel","fabio" +"22619","United States of America","USA","Industrial roundwood, coniferous","fabio" +"22620","United States of America","USA","Industrial roundwood, non-coniferous","fabio" +"22621","Burkina Faso","BFA","Rice (Milled Equivalent)","fabio" +"22622","Burkina Faso","BFA","Wheat and products","fabio" +"22623","Burkina Faso","BFA","Barley and products","fabio" +"22624","Burkina Faso","BFA","Maize and products","fabio" +"22625","Burkina Faso","BFA","Rye and products","fabio" +"22626","Burkina Faso","BFA","Oats","fabio" +"22627","Burkina Faso","BFA","Millet and products","fabio" +"22628","Burkina Faso","BFA","Sorghum and products","fabio" +"22629","Burkina Faso","BFA","Cereals, Other","fabio" +"22630","Burkina Faso","BFA","Potatoes and products","fabio" +"22631","Burkina Faso","BFA","Cassava and products","fabio" +"22632","Burkina Faso","BFA","Sweet potatoes","fabio" +"22633","Burkina Faso","BFA","Roots, Other","fabio" +"22634","Burkina Faso","BFA","Yams","fabio" +"22635","Burkina Faso","BFA","Sugar cane","fabio" +"22636","Burkina Faso","BFA","Sugar beet","fabio" +"22637","Burkina Faso","BFA","Beans","fabio" +"22638","Burkina Faso","BFA","Peas","fabio" +"22639","Burkina Faso","BFA","Pulses, Other and products","fabio" +"22640","Burkina Faso","BFA","Nuts and products","fabio" +"22641","Burkina Faso","BFA","Soyabeans","fabio" +"22642","Burkina Faso","BFA","Groundnuts (Shelled Eq)","fabio" +"22643","Burkina Faso","BFA","Sunflower seed","fabio" +"22644","Burkina Faso","BFA","Rape and Mustardseed","fabio" +"22645","Burkina Faso","BFA","Seed cotton","fabio" +"22646","Burkina Faso","BFA","Coconuts - Incl Copra","fabio" +"22647","Burkina Faso","BFA","Sesame seed","fabio" +"22648","Burkina Faso","BFA","Oil, palm fruit","fabio" +"22649","Burkina Faso","BFA","Olives (including preserved)","fabio" +"22650","Burkina Faso","BFA","Oilcrops, Other","fabio" +"22651","Burkina Faso","BFA","Tomatoes and products","fabio" +"22652","Burkina Faso","BFA","Onions","fabio" +"22653","Burkina Faso","BFA","Vegetables, Other","fabio" +"22654","Burkina Faso","BFA","Oranges, Mandarines","fabio" +"22655","Burkina Faso","BFA","Lemons, Limes and products","fabio" +"22656","Burkina Faso","BFA","Grapefruit and products","fabio" +"22657","Burkina Faso","BFA","Citrus, Other","fabio" +"22658","Burkina Faso","BFA","Bananas","fabio" +"22659","Burkina Faso","BFA","Plantains","fabio" +"22660","Burkina Faso","BFA","Apples and products","fabio" +"22661","Burkina Faso","BFA","Pineapples and products","fabio" +"22662","Burkina Faso","BFA","Dates","fabio" +"22663","Burkina Faso","BFA","Grapes and products (excl wine)","fabio" +"22664","Burkina Faso","BFA","Fruits, Other","fabio" +"22665","Burkina Faso","BFA","Coffee and products","fabio" +"22666","Burkina Faso","BFA","Cocoa Beans and products","fabio" +"22667","Burkina Faso","BFA","Tea (including mate)","fabio" +"22668","Burkina Faso","BFA","Hops","fabio" +"22669","Burkina Faso","BFA","Pepper","fabio" +"22670","Burkina Faso","BFA","Pimento","fabio" +"22671","Burkina Faso","BFA","Cloves","fabio" +"22672","Burkina Faso","BFA","Spices, Other","fabio" +"22673","Burkina Faso","BFA","Jute","fabio" +"22674","Burkina Faso","BFA","Jute-Like Fibres","fabio" +"22675","Burkina Faso","BFA","Soft-Fibres, Other","fabio" +"22676","Burkina Faso","BFA","Sisal","fabio" +"22677","Burkina Faso","BFA","Abaca","fabio" +"22678","Burkina Faso","BFA","Hard Fibres, Other","fabio" +"22679","Burkina Faso","BFA","Tobacco","fabio" +"22680","Burkina Faso","BFA","Rubber","fabio" +"22681","Burkina Faso","BFA","Fodder crops","fabio" +"22682","Burkina Faso","BFA","Grazing","fabio" +"22683","Burkina Faso","BFA","Cottonseed","fabio" +"22684","Burkina Faso","BFA","Palm kernels","fabio" +"22685","Burkina Faso","BFA","Sugar non-centrifugal","fabio" +"22686","Burkina Faso","BFA","Molasses","fabio" +"22687","Burkina Faso","BFA","Sugar, Refined Equiv","fabio" +"22688","Burkina Faso","BFA","Sweeteners, Other","fabio" +"22689","Burkina Faso","BFA","Soyabean Oil","fabio" +"22690","Burkina Faso","BFA","Groundnut Oil","fabio" +"22691","Burkina Faso","BFA","Sunflowerseed Oil","fabio" +"22692","Burkina Faso","BFA","Rape and Mustard Oil","fabio" +"22693","Burkina Faso","BFA","Cottonseed Oil","fabio" +"22694","Burkina Faso","BFA","Palmkernel Oil","fabio" +"22695","Burkina Faso","BFA","Palm Oil","fabio" +"22696","Burkina Faso","BFA","Coconut Oil","fabio" +"22697","Burkina Faso","BFA","Sesameseed Oil","fabio" +"22698","Burkina Faso","BFA","Olive Oil","fabio" +"22699","Burkina Faso","BFA","Ricebran Oil","fabio" +"22700","Burkina Faso","BFA","Maize Germ Oil","fabio" +"22701","Burkina Faso","BFA","Oilcrops Oil, Other","fabio" +"22702","Burkina Faso","BFA","Soyabean Cake","fabio" +"22703","Burkina Faso","BFA","Groundnut Cake","fabio" +"22704","Burkina Faso","BFA","Sunflowerseed Cake","fabio" +"22705","Burkina Faso","BFA","Rape and Mustard Cake","fabio" +"22706","Burkina Faso","BFA","Cottonseed Cake","fabio" +"22707","Burkina Faso","BFA","Palmkernel Cake","fabio" +"22708","Burkina Faso","BFA","Copra Cake","fabio" +"22709","Burkina Faso","BFA","Sesameseed Cake","fabio" +"22710","Burkina Faso","BFA","Oilseed Cakes, Other","fabio" +"22711","Burkina Faso","BFA","Wine","fabio" +"22712","Burkina Faso","BFA","Beer","fabio" +"22713","Burkina Faso","BFA","Beverages, Fermented","fabio" +"22714","Burkina Faso","BFA","Beverages, Alcoholic","fabio" +"22715","Burkina Faso","BFA","Alcohol, Non-Food","fabio" +"22716","Burkina Faso","BFA","Cotton lint","fabio" +"22717","Burkina Faso","BFA","Cattle","fabio" +"22718","Burkina Faso","BFA","Buffaloes","fabio" +"22719","Burkina Faso","BFA","Sheep","fabio" +"22720","Burkina Faso","BFA","Goats","fabio" +"22721","Burkina Faso","BFA","Pigs","fabio" +"22722","Burkina Faso","BFA","Poultry Birds","fabio" +"22723","Burkina Faso","BFA","Horses","fabio" +"22724","Burkina Faso","BFA","Asses","fabio" +"22725","Burkina Faso","BFA","Mules","fabio" +"22726","Burkina Faso","BFA","Camels","fabio" +"22727","Burkina Faso","BFA","Camelids, other","fabio" +"22728","Burkina Faso","BFA","Rabbits and hares","fabio" +"22729","Burkina Faso","BFA","Rodents, other","fabio" +"22730","Burkina Faso","BFA","Live animals, other","fabio" +"22731","Burkina Faso","BFA","Milk - Excluding Butter","fabio" +"22732","Burkina Faso","BFA","Butter, Ghee","fabio" +"22733","Burkina Faso","BFA","Eggs","fabio" +"22734","Burkina Faso","BFA","Wool (Clean Eq.)","fabio" +"22735","Burkina Faso","BFA","Bovine Meat","fabio" +"22736","Burkina Faso","BFA","Mutton & Goat Meat","fabio" +"22737","Burkina Faso","BFA","Pigmeat","fabio" +"22738","Burkina Faso","BFA","Poultry Meat","fabio" +"22739","Burkina Faso","BFA","Meat, Other","fabio" +"22740","Burkina Faso","BFA","Offals, Edible","fabio" +"22741","Burkina Faso","BFA","Fats, Animals, Raw","fabio" +"22742","Burkina Faso","BFA","Hides and skins","fabio" +"22743","Burkina Faso","BFA","Meat Meal","fabio" +"22744","Burkina Faso","BFA","Pet food","fabio" +"22745","Burkina Faso","BFA","Honey","fabio" +"22746","Burkina Faso","BFA","Silk","fabio" +"22747","Burkina Faso","BFA","Fish, Seafood","fabio" +"22748","Burkina Faso","BFA","Wood fuel","fabio" +"22749","Burkina Faso","BFA","Industrial roundwood, coniferous","fabio" +"22750","Burkina Faso","BFA","Industrial roundwood, non-coniferous","fabio" +"22751","Uruguay","URY","Rice (Milled Equivalent)","fabio" +"22752","Uruguay","URY","Wheat and products","fabio" +"22753","Uruguay","URY","Barley and products","fabio" +"22754","Uruguay","URY","Maize and products","fabio" +"22755","Uruguay","URY","Rye and products","fabio" +"22756","Uruguay","URY","Oats","fabio" +"22757","Uruguay","URY","Millet and products","fabio" +"22758","Uruguay","URY","Sorghum and products","fabio" +"22759","Uruguay","URY","Cereals, Other","fabio" +"22760","Uruguay","URY","Potatoes and products","fabio" +"22761","Uruguay","URY","Cassava and products","fabio" +"22762","Uruguay","URY","Sweet potatoes","fabio" +"22763","Uruguay","URY","Roots, Other","fabio" +"22764","Uruguay","URY","Yams","fabio" +"22765","Uruguay","URY","Sugar cane","fabio" +"22766","Uruguay","URY","Sugar beet","fabio" +"22767","Uruguay","URY","Beans","fabio" +"22768","Uruguay","URY","Peas","fabio" +"22769","Uruguay","URY","Pulses, Other and products","fabio" +"22770","Uruguay","URY","Nuts and products","fabio" +"22771","Uruguay","URY","Soyabeans","fabio" +"22772","Uruguay","URY","Groundnuts (Shelled Eq)","fabio" +"22773","Uruguay","URY","Sunflower seed","fabio" +"22774","Uruguay","URY","Rape and Mustardseed","fabio" +"22775","Uruguay","URY","Seed cotton","fabio" +"22776","Uruguay","URY","Coconuts - Incl Copra","fabio" +"22777","Uruguay","URY","Sesame seed","fabio" +"22778","Uruguay","URY","Oil, palm fruit","fabio" +"22779","Uruguay","URY","Olives (including preserved)","fabio" +"22780","Uruguay","URY","Oilcrops, Other","fabio" +"22781","Uruguay","URY","Tomatoes and products","fabio" +"22782","Uruguay","URY","Onions","fabio" +"22783","Uruguay","URY","Vegetables, Other","fabio" +"22784","Uruguay","URY","Oranges, Mandarines","fabio" +"22785","Uruguay","URY","Lemons, Limes and products","fabio" +"22786","Uruguay","URY","Grapefruit and products","fabio" +"22787","Uruguay","URY","Citrus, Other","fabio" +"22788","Uruguay","URY","Bananas","fabio" +"22789","Uruguay","URY","Plantains","fabio" +"22790","Uruguay","URY","Apples and products","fabio" +"22791","Uruguay","URY","Pineapples and products","fabio" +"22792","Uruguay","URY","Dates","fabio" +"22793","Uruguay","URY","Grapes and products (excl wine)","fabio" +"22794","Uruguay","URY","Fruits, Other","fabio" +"22795","Uruguay","URY","Coffee and products","fabio" +"22796","Uruguay","URY","Cocoa Beans and products","fabio" +"22797","Uruguay","URY","Tea (including mate)","fabio" +"22798","Uruguay","URY","Hops","fabio" +"22799","Uruguay","URY","Pepper","fabio" +"22800","Uruguay","URY","Pimento","fabio" +"22801","Uruguay","URY","Cloves","fabio" +"22802","Uruguay","URY","Spices, Other","fabio" +"22803","Uruguay","URY","Jute","fabio" +"22804","Uruguay","URY","Jute-Like Fibres","fabio" +"22805","Uruguay","URY","Soft-Fibres, Other","fabio" +"22806","Uruguay","URY","Sisal","fabio" +"22807","Uruguay","URY","Abaca","fabio" +"22808","Uruguay","URY","Hard Fibres, Other","fabio" +"22809","Uruguay","URY","Tobacco","fabio" +"22810","Uruguay","URY","Rubber","fabio" +"22811","Uruguay","URY","Fodder crops","fabio" +"22812","Uruguay","URY","Grazing","fabio" +"22813","Uruguay","URY","Cottonseed","fabio" +"22814","Uruguay","URY","Palm kernels","fabio" +"22815","Uruguay","URY","Sugar non-centrifugal","fabio" +"22816","Uruguay","URY","Molasses","fabio" +"22817","Uruguay","URY","Sugar, Refined Equiv","fabio" +"22818","Uruguay","URY","Sweeteners, Other","fabio" +"22819","Uruguay","URY","Soyabean Oil","fabio" +"22820","Uruguay","URY","Groundnut Oil","fabio" +"22821","Uruguay","URY","Sunflowerseed Oil","fabio" +"22822","Uruguay","URY","Rape and Mustard Oil","fabio" +"22823","Uruguay","URY","Cottonseed Oil","fabio" +"22824","Uruguay","URY","Palmkernel Oil","fabio" +"22825","Uruguay","URY","Palm Oil","fabio" +"22826","Uruguay","URY","Coconut Oil","fabio" +"22827","Uruguay","URY","Sesameseed Oil","fabio" +"22828","Uruguay","URY","Olive Oil","fabio" +"22829","Uruguay","URY","Ricebran Oil","fabio" +"22830","Uruguay","URY","Maize Germ Oil","fabio" +"22831","Uruguay","URY","Oilcrops Oil, Other","fabio" +"22832","Uruguay","URY","Soyabean Cake","fabio" +"22833","Uruguay","URY","Groundnut Cake","fabio" +"22834","Uruguay","URY","Sunflowerseed Cake","fabio" +"22835","Uruguay","URY","Rape and Mustard Cake","fabio" +"22836","Uruguay","URY","Cottonseed Cake","fabio" +"22837","Uruguay","URY","Palmkernel Cake","fabio" +"22838","Uruguay","URY","Copra Cake","fabio" +"22839","Uruguay","URY","Sesameseed Cake","fabio" +"22840","Uruguay","URY","Oilseed Cakes, Other","fabio" +"22841","Uruguay","URY","Wine","fabio" +"22842","Uruguay","URY","Beer","fabio" +"22843","Uruguay","URY","Beverages, Fermented","fabio" +"22844","Uruguay","URY","Beverages, Alcoholic","fabio" +"22845","Uruguay","URY","Alcohol, Non-Food","fabio" +"22846","Uruguay","URY","Cotton lint","fabio" +"22847","Uruguay","URY","Cattle","fabio" +"22848","Uruguay","URY","Buffaloes","fabio" +"22849","Uruguay","URY","Sheep","fabio" +"22850","Uruguay","URY","Goats","fabio" +"22851","Uruguay","URY","Pigs","fabio" +"22852","Uruguay","URY","Poultry Birds","fabio" +"22853","Uruguay","URY","Horses","fabio" +"22854","Uruguay","URY","Asses","fabio" +"22855","Uruguay","URY","Mules","fabio" +"22856","Uruguay","URY","Camels","fabio" +"22857","Uruguay","URY","Camelids, other","fabio" +"22858","Uruguay","URY","Rabbits and hares","fabio" +"22859","Uruguay","URY","Rodents, other","fabio" +"22860","Uruguay","URY","Live animals, other","fabio" +"22861","Uruguay","URY","Milk - Excluding Butter","fabio" +"22862","Uruguay","URY","Butter, Ghee","fabio" +"22863","Uruguay","URY","Eggs","fabio" +"22864","Uruguay","URY","Wool (Clean Eq.)","fabio" +"22865","Uruguay","URY","Bovine Meat","fabio" +"22866","Uruguay","URY","Mutton & Goat Meat","fabio" +"22867","Uruguay","URY","Pigmeat","fabio" +"22868","Uruguay","URY","Poultry Meat","fabio" +"22869","Uruguay","URY","Meat, Other","fabio" +"22870","Uruguay","URY","Offals, Edible","fabio" +"22871","Uruguay","URY","Fats, Animals, Raw","fabio" +"22872","Uruguay","URY","Hides and skins","fabio" +"22873","Uruguay","URY","Meat Meal","fabio" +"22874","Uruguay","URY","Pet food","fabio" +"22875","Uruguay","URY","Honey","fabio" +"22876","Uruguay","URY","Silk","fabio" +"22877","Uruguay","URY","Fish, Seafood","fabio" +"22878","Uruguay","URY","Wood fuel","fabio" +"22879","Uruguay","URY","Industrial roundwood, coniferous","fabio" +"22880","Uruguay","URY","Industrial roundwood, non-coniferous","fabio" +"22881","Uzbekistan","UZB","Rice (Milled Equivalent)","fabio" +"22882","Uzbekistan","UZB","Wheat and products","fabio" +"22883","Uzbekistan","UZB","Barley and products","fabio" +"22884","Uzbekistan","UZB","Maize and products","fabio" +"22885","Uzbekistan","UZB","Rye and products","fabio" +"22886","Uzbekistan","UZB","Oats","fabio" +"22887","Uzbekistan","UZB","Millet and products","fabio" +"22888","Uzbekistan","UZB","Sorghum and products","fabio" +"22889","Uzbekistan","UZB","Cereals, Other","fabio" +"22890","Uzbekistan","UZB","Potatoes and products","fabio" +"22891","Uzbekistan","UZB","Cassava and products","fabio" +"22892","Uzbekistan","UZB","Sweet potatoes","fabio" +"22893","Uzbekistan","UZB","Roots, Other","fabio" +"22894","Uzbekistan","UZB","Yams","fabio" +"22895","Uzbekistan","UZB","Sugar cane","fabio" +"22896","Uzbekistan","UZB","Sugar beet","fabio" +"22897","Uzbekistan","UZB","Beans","fabio" +"22898","Uzbekistan","UZB","Peas","fabio" +"22899","Uzbekistan","UZB","Pulses, Other and products","fabio" +"22900","Uzbekistan","UZB","Nuts and products","fabio" +"22901","Uzbekistan","UZB","Soyabeans","fabio" +"22902","Uzbekistan","UZB","Groundnuts (Shelled Eq)","fabio" +"22903","Uzbekistan","UZB","Sunflower seed","fabio" +"22904","Uzbekistan","UZB","Rape and Mustardseed","fabio" +"22905","Uzbekistan","UZB","Seed cotton","fabio" +"22906","Uzbekistan","UZB","Coconuts - Incl Copra","fabio" +"22907","Uzbekistan","UZB","Sesame seed","fabio" +"22908","Uzbekistan","UZB","Oil, palm fruit","fabio" +"22909","Uzbekistan","UZB","Olives (including preserved)","fabio" +"22910","Uzbekistan","UZB","Oilcrops, Other","fabio" +"22911","Uzbekistan","UZB","Tomatoes and products","fabio" +"22912","Uzbekistan","UZB","Onions","fabio" +"22913","Uzbekistan","UZB","Vegetables, Other","fabio" +"22914","Uzbekistan","UZB","Oranges, Mandarines","fabio" +"22915","Uzbekistan","UZB","Lemons, Limes and products","fabio" +"22916","Uzbekistan","UZB","Grapefruit and products","fabio" +"22917","Uzbekistan","UZB","Citrus, Other","fabio" +"22918","Uzbekistan","UZB","Bananas","fabio" +"22919","Uzbekistan","UZB","Plantains","fabio" +"22920","Uzbekistan","UZB","Apples and products","fabio" +"22921","Uzbekistan","UZB","Pineapples and products","fabio" +"22922","Uzbekistan","UZB","Dates","fabio" +"22923","Uzbekistan","UZB","Grapes and products (excl wine)","fabio" +"22924","Uzbekistan","UZB","Fruits, Other","fabio" +"22925","Uzbekistan","UZB","Coffee and products","fabio" +"22926","Uzbekistan","UZB","Cocoa Beans and products","fabio" +"22927","Uzbekistan","UZB","Tea (including mate)","fabio" +"22928","Uzbekistan","UZB","Hops","fabio" +"22929","Uzbekistan","UZB","Pepper","fabio" +"22930","Uzbekistan","UZB","Pimento","fabio" +"22931","Uzbekistan","UZB","Cloves","fabio" +"22932","Uzbekistan","UZB","Spices, Other","fabio" +"22933","Uzbekistan","UZB","Jute","fabio" +"22934","Uzbekistan","UZB","Jute-Like Fibres","fabio" +"22935","Uzbekistan","UZB","Soft-Fibres, Other","fabio" +"22936","Uzbekistan","UZB","Sisal","fabio" +"22937","Uzbekistan","UZB","Abaca","fabio" +"22938","Uzbekistan","UZB","Hard Fibres, Other","fabio" +"22939","Uzbekistan","UZB","Tobacco","fabio" +"22940","Uzbekistan","UZB","Rubber","fabio" +"22941","Uzbekistan","UZB","Fodder crops","fabio" +"22942","Uzbekistan","UZB","Grazing","fabio" +"22943","Uzbekistan","UZB","Cottonseed","fabio" +"22944","Uzbekistan","UZB","Palm kernels","fabio" +"22945","Uzbekistan","UZB","Sugar non-centrifugal","fabio" +"22946","Uzbekistan","UZB","Molasses","fabio" +"22947","Uzbekistan","UZB","Sugar, Refined Equiv","fabio" +"22948","Uzbekistan","UZB","Sweeteners, Other","fabio" +"22949","Uzbekistan","UZB","Soyabean Oil","fabio" +"22950","Uzbekistan","UZB","Groundnut Oil","fabio" +"22951","Uzbekistan","UZB","Sunflowerseed Oil","fabio" +"22952","Uzbekistan","UZB","Rape and Mustard Oil","fabio" +"22953","Uzbekistan","UZB","Cottonseed Oil","fabio" +"22954","Uzbekistan","UZB","Palmkernel Oil","fabio" +"22955","Uzbekistan","UZB","Palm Oil","fabio" +"22956","Uzbekistan","UZB","Coconut Oil","fabio" +"22957","Uzbekistan","UZB","Sesameseed Oil","fabio" +"22958","Uzbekistan","UZB","Olive Oil","fabio" +"22959","Uzbekistan","UZB","Ricebran Oil","fabio" +"22960","Uzbekistan","UZB","Maize Germ Oil","fabio" +"22961","Uzbekistan","UZB","Oilcrops Oil, Other","fabio" +"22962","Uzbekistan","UZB","Soyabean Cake","fabio" +"22963","Uzbekistan","UZB","Groundnut Cake","fabio" +"22964","Uzbekistan","UZB","Sunflowerseed Cake","fabio" +"22965","Uzbekistan","UZB","Rape and Mustard Cake","fabio" +"22966","Uzbekistan","UZB","Cottonseed Cake","fabio" +"22967","Uzbekistan","UZB","Palmkernel Cake","fabio" +"22968","Uzbekistan","UZB","Copra Cake","fabio" +"22969","Uzbekistan","UZB","Sesameseed Cake","fabio" +"22970","Uzbekistan","UZB","Oilseed Cakes, Other","fabio" +"22971","Uzbekistan","UZB","Wine","fabio" +"22972","Uzbekistan","UZB","Beer","fabio" +"22973","Uzbekistan","UZB","Beverages, Fermented","fabio" +"22974","Uzbekistan","UZB","Beverages, Alcoholic","fabio" +"22975","Uzbekistan","UZB","Alcohol, Non-Food","fabio" +"22976","Uzbekistan","UZB","Cotton lint","fabio" +"22977","Uzbekistan","UZB","Cattle","fabio" +"22978","Uzbekistan","UZB","Buffaloes","fabio" +"22979","Uzbekistan","UZB","Sheep","fabio" +"22980","Uzbekistan","UZB","Goats","fabio" +"22981","Uzbekistan","UZB","Pigs","fabio" +"22982","Uzbekistan","UZB","Poultry Birds","fabio" +"22983","Uzbekistan","UZB","Horses","fabio" +"22984","Uzbekistan","UZB","Asses","fabio" +"22985","Uzbekistan","UZB","Mules","fabio" +"22986","Uzbekistan","UZB","Camels","fabio" +"22987","Uzbekistan","UZB","Camelids, other","fabio" +"22988","Uzbekistan","UZB","Rabbits and hares","fabio" +"22989","Uzbekistan","UZB","Rodents, other","fabio" +"22990","Uzbekistan","UZB","Live animals, other","fabio" +"22991","Uzbekistan","UZB","Milk - Excluding Butter","fabio" +"22992","Uzbekistan","UZB","Butter, Ghee","fabio" +"22993","Uzbekistan","UZB","Eggs","fabio" +"22994","Uzbekistan","UZB","Wool (Clean Eq.)","fabio" +"22995","Uzbekistan","UZB","Bovine Meat","fabio" +"22996","Uzbekistan","UZB","Mutton & Goat Meat","fabio" +"22997","Uzbekistan","UZB","Pigmeat","fabio" +"22998","Uzbekistan","UZB","Poultry Meat","fabio" +"22999","Uzbekistan","UZB","Meat, Other","fabio" +"23000","Uzbekistan","UZB","Offals, Edible","fabio" +"23001","Uzbekistan","UZB","Fats, Animals, Raw","fabio" +"23002","Uzbekistan","UZB","Hides and skins","fabio" +"23003","Uzbekistan","UZB","Meat Meal","fabio" +"23004","Uzbekistan","UZB","Pet food","fabio" +"23005","Uzbekistan","UZB","Honey","fabio" +"23006","Uzbekistan","UZB","Silk","fabio" +"23007","Uzbekistan","UZB","Fish, Seafood","fabio" +"23008","Uzbekistan","UZB","Wood fuel","fabio" +"23009","Uzbekistan","UZB","Industrial roundwood, coniferous","fabio" +"23010","Uzbekistan","UZB","Industrial roundwood, non-coniferous","fabio" +"23011","Venezuela (Bolivarian Republic of)","VEN","Rice (Milled Equivalent)","fabio" +"23012","Venezuela (Bolivarian Republic of)","VEN","Wheat and products","fabio" +"23013","Venezuela (Bolivarian Republic of)","VEN","Barley and products","fabio" +"23014","Venezuela (Bolivarian Republic of)","VEN","Maize and products","fabio" +"23015","Venezuela (Bolivarian Republic of)","VEN","Rye and products","fabio" +"23016","Venezuela (Bolivarian Republic of)","VEN","Oats","fabio" +"23017","Venezuela (Bolivarian Republic of)","VEN","Millet and products","fabio" +"23018","Venezuela (Bolivarian Republic of)","VEN","Sorghum and products","fabio" +"23019","Venezuela (Bolivarian Republic of)","VEN","Cereals, Other","fabio" +"23020","Venezuela (Bolivarian Republic of)","VEN","Potatoes and products","fabio" +"23021","Venezuela (Bolivarian Republic of)","VEN","Cassava and products","fabio" +"23022","Venezuela (Bolivarian Republic of)","VEN","Sweet potatoes","fabio" +"23023","Venezuela (Bolivarian Republic of)","VEN","Roots, Other","fabio" +"23024","Venezuela (Bolivarian Republic of)","VEN","Yams","fabio" +"23025","Venezuela (Bolivarian Republic of)","VEN","Sugar cane","fabio" +"23026","Venezuela (Bolivarian Republic of)","VEN","Sugar beet","fabio" +"23027","Venezuela (Bolivarian Republic of)","VEN","Beans","fabio" +"23028","Venezuela (Bolivarian Republic of)","VEN","Peas","fabio" +"23029","Venezuela (Bolivarian Republic of)","VEN","Pulses, Other and products","fabio" +"23030","Venezuela (Bolivarian Republic of)","VEN","Nuts and products","fabio" +"23031","Venezuela (Bolivarian Republic of)","VEN","Soyabeans","fabio" +"23032","Venezuela (Bolivarian Republic of)","VEN","Groundnuts (Shelled Eq)","fabio" +"23033","Venezuela (Bolivarian Republic of)","VEN","Sunflower seed","fabio" +"23034","Venezuela (Bolivarian Republic of)","VEN","Rape and Mustardseed","fabio" +"23035","Venezuela (Bolivarian Republic of)","VEN","Seed cotton","fabio" +"23036","Venezuela (Bolivarian Republic of)","VEN","Coconuts - Incl Copra","fabio" +"23037","Venezuela (Bolivarian Republic of)","VEN","Sesame seed","fabio" +"23038","Venezuela (Bolivarian Republic of)","VEN","Oil, palm fruit","fabio" +"23039","Venezuela (Bolivarian Republic of)","VEN","Olives (including preserved)","fabio" +"23040","Venezuela (Bolivarian Republic of)","VEN","Oilcrops, Other","fabio" +"23041","Venezuela (Bolivarian Republic of)","VEN","Tomatoes and products","fabio" +"23042","Venezuela (Bolivarian Republic of)","VEN","Onions","fabio" +"23043","Venezuela (Bolivarian Republic of)","VEN","Vegetables, Other","fabio" +"23044","Venezuela (Bolivarian Republic of)","VEN","Oranges, Mandarines","fabio" +"23045","Venezuela (Bolivarian Republic of)","VEN","Lemons, Limes and products","fabio" +"23046","Venezuela (Bolivarian Republic of)","VEN","Grapefruit and products","fabio" +"23047","Venezuela (Bolivarian Republic of)","VEN","Citrus, Other","fabio" +"23048","Venezuela (Bolivarian Republic of)","VEN","Bananas","fabio" +"23049","Venezuela (Bolivarian Republic of)","VEN","Plantains","fabio" +"23050","Venezuela (Bolivarian Republic of)","VEN","Apples and products","fabio" +"23051","Venezuela (Bolivarian Republic of)","VEN","Pineapples and products","fabio" +"23052","Venezuela (Bolivarian Republic of)","VEN","Dates","fabio" +"23053","Venezuela (Bolivarian Republic of)","VEN","Grapes and products (excl wine)","fabio" +"23054","Venezuela (Bolivarian Republic of)","VEN","Fruits, Other","fabio" +"23055","Venezuela (Bolivarian Republic of)","VEN","Coffee and products","fabio" +"23056","Venezuela (Bolivarian Republic of)","VEN","Cocoa Beans and products","fabio" +"23057","Venezuela (Bolivarian Republic of)","VEN","Tea (including mate)","fabio" +"23058","Venezuela (Bolivarian Republic of)","VEN","Hops","fabio" +"23059","Venezuela (Bolivarian Republic of)","VEN","Pepper","fabio" +"23060","Venezuela (Bolivarian Republic of)","VEN","Pimento","fabio" +"23061","Venezuela (Bolivarian Republic of)","VEN","Cloves","fabio" +"23062","Venezuela (Bolivarian Republic of)","VEN","Spices, Other","fabio" +"23063","Venezuela (Bolivarian Republic of)","VEN","Jute","fabio" +"23064","Venezuela (Bolivarian Republic of)","VEN","Jute-Like Fibres","fabio" +"23065","Venezuela (Bolivarian Republic of)","VEN","Soft-Fibres, Other","fabio" +"23066","Venezuela (Bolivarian Republic of)","VEN","Sisal","fabio" +"23067","Venezuela (Bolivarian Republic of)","VEN","Abaca","fabio" +"23068","Venezuela (Bolivarian Republic of)","VEN","Hard Fibres, Other","fabio" +"23069","Venezuela (Bolivarian Republic of)","VEN","Tobacco","fabio" +"23070","Venezuela (Bolivarian Republic of)","VEN","Rubber","fabio" +"23071","Venezuela (Bolivarian Republic of)","VEN","Fodder crops","fabio" +"23072","Venezuela (Bolivarian Republic of)","VEN","Grazing","fabio" +"23073","Venezuela (Bolivarian Republic of)","VEN","Cottonseed","fabio" +"23074","Venezuela (Bolivarian Republic of)","VEN","Palm kernels","fabio" +"23075","Venezuela (Bolivarian Republic of)","VEN","Sugar non-centrifugal","fabio" +"23076","Venezuela (Bolivarian Republic of)","VEN","Molasses","fabio" +"23077","Venezuela (Bolivarian Republic of)","VEN","Sugar, Refined Equiv","fabio" +"23078","Venezuela (Bolivarian Republic of)","VEN","Sweeteners, Other","fabio" +"23079","Venezuela (Bolivarian Republic of)","VEN","Soyabean Oil","fabio" +"23080","Venezuela (Bolivarian Republic of)","VEN","Groundnut Oil","fabio" +"23081","Venezuela (Bolivarian Republic of)","VEN","Sunflowerseed Oil","fabio" +"23082","Venezuela (Bolivarian Republic of)","VEN","Rape and Mustard Oil","fabio" +"23083","Venezuela (Bolivarian Republic of)","VEN","Cottonseed Oil","fabio" +"23084","Venezuela (Bolivarian Republic of)","VEN","Palmkernel Oil","fabio" +"23085","Venezuela (Bolivarian Republic of)","VEN","Palm Oil","fabio" +"23086","Venezuela (Bolivarian Republic of)","VEN","Coconut Oil","fabio" +"23087","Venezuela (Bolivarian Republic of)","VEN","Sesameseed Oil","fabio" +"23088","Venezuela (Bolivarian Republic of)","VEN","Olive Oil","fabio" +"23089","Venezuela (Bolivarian Republic of)","VEN","Ricebran Oil","fabio" +"23090","Venezuela (Bolivarian Republic of)","VEN","Maize Germ Oil","fabio" +"23091","Venezuela (Bolivarian Republic of)","VEN","Oilcrops Oil, Other","fabio" +"23092","Venezuela (Bolivarian Republic of)","VEN","Soyabean Cake","fabio" +"23093","Venezuela (Bolivarian Republic of)","VEN","Groundnut Cake","fabio" +"23094","Venezuela (Bolivarian Republic of)","VEN","Sunflowerseed Cake","fabio" +"23095","Venezuela (Bolivarian Republic of)","VEN","Rape and Mustard Cake","fabio" +"23096","Venezuela (Bolivarian Republic of)","VEN","Cottonseed Cake","fabio" +"23097","Venezuela (Bolivarian Republic of)","VEN","Palmkernel Cake","fabio" +"23098","Venezuela (Bolivarian Republic of)","VEN","Copra Cake","fabio" +"23099","Venezuela (Bolivarian Republic of)","VEN","Sesameseed Cake","fabio" +"23100","Venezuela (Bolivarian Republic of)","VEN","Oilseed Cakes, Other","fabio" +"23101","Venezuela (Bolivarian Republic of)","VEN","Wine","fabio" +"23102","Venezuela (Bolivarian Republic of)","VEN","Beer","fabio" +"23103","Venezuela (Bolivarian Republic of)","VEN","Beverages, Fermented","fabio" +"23104","Venezuela (Bolivarian Republic of)","VEN","Beverages, Alcoholic","fabio" +"23105","Venezuela (Bolivarian Republic of)","VEN","Alcohol, Non-Food","fabio" +"23106","Venezuela (Bolivarian Republic of)","VEN","Cotton lint","fabio" +"23107","Venezuela (Bolivarian Republic of)","VEN","Cattle","fabio" +"23108","Venezuela (Bolivarian Republic of)","VEN","Buffaloes","fabio" +"23109","Venezuela (Bolivarian Republic of)","VEN","Sheep","fabio" +"23110","Venezuela (Bolivarian Republic of)","VEN","Goats","fabio" +"23111","Venezuela (Bolivarian Republic of)","VEN","Pigs","fabio" +"23112","Venezuela (Bolivarian Republic of)","VEN","Poultry Birds","fabio" +"23113","Venezuela (Bolivarian Republic of)","VEN","Horses","fabio" +"23114","Venezuela (Bolivarian Republic of)","VEN","Asses","fabio" +"23115","Venezuela (Bolivarian Republic of)","VEN","Mules","fabio" +"23116","Venezuela (Bolivarian Republic of)","VEN","Camels","fabio" +"23117","Venezuela (Bolivarian Republic of)","VEN","Camelids, other","fabio" +"23118","Venezuela (Bolivarian Republic of)","VEN","Rabbits and hares","fabio" +"23119","Venezuela (Bolivarian Republic of)","VEN","Rodents, other","fabio" +"23120","Venezuela (Bolivarian Republic of)","VEN","Live animals, other","fabio" +"23121","Venezuela (Bolivarian Republic of)","VEN","Milk - Excluding Butter","fabio" +"23122","Venezuela (Bolivarian Republic of)","VEN","Butter, Ghee","fabio" +"23123","Venezuela (Bolivarian Republic of)","VEN","Eggs","fabio" +"23124","Venezuela (Bolivarian Republic of)","VEN","Wool (Clean Eq.)","fabio" +"23125","Venezuela (Bolivarian Republic of)","VEN","Bovine Meat","fabio" +"23126","Venezuela (Bolivarian Republic of)","VEN","Mutton & Goat Meat","fabio" +"23127","Venezuela (Bolivarian Republic of)","VEN","Pigmeat","fabio" +"23128","Venezuela (Bolivarian Republic of)","VEN","Poultry Meat","fabio" +"23129","Venezuela (Bolivarian Republic of)","VEN","Meat, Other","fabio" +"23130","Venezuela (Bolivarian Republic of)","VEN","Offals, Edible","fabio" +"23131","Venezuela (Bolivarian Republic of)","VEN","Fats, Animals, Raw","fabio" +"23132","Venezuela (Bolivarian Republic of)","VEN","Hides and skins","fabio" +"23133","Venezuela (Bolivarian Republic of)","VEN","Meat Meal","fabio" +"23134","Venezuela (Bolivarian Republic of)","VEN","Pet food","fabio" +"23135","Venezuela (Bolivarian Republic of)","VEN","Honey","fabio" +"23136","Venezuela (Bolivarian Republic of)","VEN","Silk","fabio" +"23137","Venezuela (Bolivarian Republic of)","VEN","Fish, Seafood","fabio" +"23138","Venezuela (Bolivarian Republic of)","VEN","Wood fuel","fabio" +"23139","Venezuela (Bolivarian Republic of)","VEN","Industrial roundwood, coniferous","fabio" +"23140","Venezuela (Bolivarian Republic of)","VEN","Industrial roundwood, non-coniferous","fabio" +"23141","Viet Nam","VNM","Rice (Milled Equivalent)","fabio" +"23142","Viet Nam","VNM","Wheat and products","fabio" +"23143","Viet Nam","VNM","Barley and products","fabio" +"23144","Viet Nam","VNM","Maize and products","fabio" +"23145","Viet Nam","VNM","Rye and products","fabio" +"23146","Viet Nam","VNM","Oats","fabio" +"23147","Viet Nam","VNM","Millet and products","fabio" +"23148","Viet Nam","VNM","Sorghum and products","fabio" +"23149","Viet Nam","VNM","Cereals, Other","fabio" +"23150","Viet Nam","VNM","Potatoes and products","fabio" +"23151","Viet Nam","VNM","Cassava and products","fabio" +"23152","Viet Nam","VNM","Sweet potatoes","fabio" +"23153","Viet Nam","VNM","Roots, Other","fabio" +"23154","Viet Nam","VNM","Yams","fabio" +"23155","Viet Nam","VNM","Sugar cane","fabio" +"23156","Viet Nam","VNM","Sugar beet","fabio" +"23157","Viet Nam","VNM","Beans","fabio" +"23158","Viet Nam","VNM","Peas","fabio" +"23159","Viet Nam","VNM","Pulses, Other and products","fabio" +"23160","Viet Nam","VNM","Nuts and products","fabio" +"23161","Viet Nam","VNM","Soyabeans","fabio" +"23162","Viet Nam","VNM","Groundnuts (Shelled Eq)","fabio" +"23163","Viet Nam","VNM","Sunflower seed","fabio" +"23164","Viet Nam","VNM","Rape and Mustardseed","fabio" +"23165","Viet Nam","VNM","Seed cotton","fabio" +"23166","Viet Nam","VNM","Coconuts - Incl Copra","fabio" +"23167","Viet Nam","VNM","Sesame seed","fabio" +"23168","Viet Nam","VNM","Oil, palm fruit","fabio" +"23169","Viet Nam","VNM","Olives (including preserved)","fabio" +"23170","Viet Nam","VNM","Oilcrops, Other","fabio" +"23171","Viet Nam","VNM","Tomatoes and products","fabio" +"23172","Viet Nam","VNM","Onions","fabio" +"23173","Viet Nam","VNM","Vegetables, Other","fabio" +"23174","Viet Nam","VNM","Oranges, Mandarines","fabio" +"23175","Viet Nam","VNM","Lemons, Limes and products","fabio" +"23176","Viet Nam","VNM","Grapefruit and products","fabio" +"23177","Viet Nam","VNM","Citrus, Other","fabio" +"23178","Viet Nam","VNM","Bananas","fabio" +"23179","Viet Nam","VNM","Plantains","fabio" +"23180","Viet Nam","VNM","Apples and products","fabio" +"23181","Viet Nam","VNM","Pineapples and products","fabio" +"23182","Viet Nam","VNM","Dates","fabio" +"23183","Viet Nam","VNM","Grapes and products (excl wine)","fabio" +"23184","Viet Nam","VNM","Fruits, Other","fabio" +"23185","Viet Nam","VNM","Coffee and products","fabio" +"23186","Viet Nam","VNM","Cocoa Beans and products","fabio" +"23187","Viet Nam","VNM","Tea (including mate)","fabio" +"23188","Viet Nam","VNM","Hops","fabio" +"23189","Viet Nam","VNM","Pepper","fabio" +"23190","Viet Nam","VNM","Pimento","fabio" +"23191","Viet Nam","VNM","Cloves","fabio" +"23192","Viet Nam","VNM","Spices, Other","fabio" +"23193","Viet Nam","VNM","Jute","fabio" +"23194","Viet Nam","VNM","Jute-Like Fibres","fabio" +"23195","Viet Nam","VNM","Soft-Fibres, Other","fabio" +"23196","Viet Nam","VNM","Sisal","fabio" +"23197","Viet Nam","VNM","Abaca","fabio" +"23198","Viet Nam","VNM","Hard Fibres, Other","fabio" +"23199","Viet Nam","VNM","Tobacco","fabio" +"23200","Viet Nam","VNM","Rubber","fabio" +"23201","Viet Nam","VNM","Fodder crops","fabio" +"23202","Viet Nam","VNM","Grazing","fabio" +"23203","Viet Nam","VNM","Cottonseed","fabio" +"23204","Viet Nam","VNM","Palm kernels","fabio" +"23205","Viet Nam","VNM","Sugar non-centrifugal","fabio" +"23206","Viet Nam","VNM","Molasses","fabio" +"23207","Viet Nam","VNM","Sugar, Refined Equiv","fabio" +"23208","Viet Nam","VNM","Sweeteners, Other","fabio" +"23209","Viet Nam","VNM","Soyabean Oil","fabio" +"23210","Viet Nam","VNM","Groundnut Oil","fabio" +"23211","Viet Nam","VNM","Sunflowerseed Oil","fabio" +"23212","Viet Nam","VNM","Rape and Mustard Oil","fabio" +"23213","Viet Nam","VNM","Cottonseed Oil","fabio" +"23214","Viet Nam","VNM","Palmkernel Oil","fabio" +"23215","Viet Nam","VNM","Palm Oil","fabio" +"23216","Viet Nam","VNM","Coconut Oil","fabio" +"23217","Viet Nam","VNM","Sesameseed Oil","fabio" +"23218","Viet Nam","VNM","Olive Oil","fabio" +"23219","Viet Nam","VNM","Ricebran Oil","fabio" +"23220","Viet Nam","VNM","Maize Germ Oil","fabio" +"23221","Viet Nam","VNM","Oilcrops Oil, Other","fabio" +"23222","Viet Nam","VNM","Soyabean Cake","fabio" +"23223","Viet Nam","VNM","Groundnut Cake","fabio" +"23224","Viet Nam","VNM","Sunflowerseed Cake","fabio" +"23225","Viet Nam","VNM","Rape and Mustard Cake","fabio" +"23226","Viet Nam","VNM","Cottonseed Cake","fabio" +"23227","Viet Nam","VNM","Palmkernel Cake","fabio" +"23228","Viet Nam","VNM","Copra Cake","fabio" +"23229","Viet Nam","VNM","Sesameseed Cake","fabio" +"23230","Viet Nam","VNM","Oilseed Cakes, Other","fabio" +"23231","Viet Nam","VNM","Wine","fabio" +"23232","Viet Nam","VNM","Beer","fabio" +"23233","Viet Nam","VNM","Beverages, Fermented","fabio" +"23234","Viet Nam","VNM","Beverages, Alcoholic","fabio" +"23235","Viet Nam","VNM","Alcohol, Non-Food","fabio" +"23236","Viet Nam","VNM","Cotton lint","fabio" +"23237","Viet Nam","VNM","Cattle","fabio" +"23238","Viet Nam","VNM","Buffaloes","fabio" +"23239","Viet Nam","VNM","Sheep","fabio" +"23240","Viet Nam","VNM","Goats","fabio" +"23241","Viet Nam","VNM","Pigs","fabio" +"23242","Viet Nam","VNM","Poultry Birds","fabio" +"23243","Viet Nam","VNM","Horses","fabio" +"23244","Viet Nam","VNM","Asses","fabio" +"23245","Viet Nam","VNM","Mules","fabio" +"23246","Viet Nam","VNM","Camels","fabio" +"23247","Viet Nam","VNM","Camelids, other","fabio" +"23248","Viet Nam","VNM","Rabbits and hares","fabio" +"23249","Viet Nam","VNM","Rodents, other","fabio" +"23250","Viet Nam","VNM","Live animals, other","fabio" +"23251","Viet Nam","VNM","Milk - Excluding Butter","fabio" +"23252","Viet Nam","VNM","Butter, Ghee","fabio" +"23253","Viet Nam","VNM","Eggs","fabio" +"23254","Viet Nam","VNM","Wool (Clean Eq.)","fabio" +"23255","Viet Nam","VNM","Bovine Meat","fabio" +"23256","Viet Nam","VNM","Mutton & Goat Meat","fabio" +"23257","Viet Nam","VNM","Pigmeat","fabio" +"23258","Viet Nam","VNM","Poultry Meat","fabio" +"23259","Viet Nam","VNM","Meat, Other","fabio" +"23260","Viet Nam","VNM","Offals, Edible","fabio" +"23261","Viet Nam","VNM","Fats, Animals, Raw","fabio" +"23262","Viet Nam","VNM","Hides and skins","fabio" +"23263","Viet Nam","VNM","Meat Meal","fabio" +"23264","Viet Nam","VNM","Pet food","fabio" +"23265","Viet Nam","VNM","Honey","fabio" +"23266","Viet Nam","VNM","Silk","fabio" +"23267","Viet Nam","VNM","Fish, Seafood","fabio" +"23268","Viet Nam","VNM","Wood fuel","fabio" +"23269","Viet Nam","VNM","Industrial roundwood, coniferous","fabio" +"23270","Viet Nam","VNM","Industrial roundwood, non-coniferous","fabio" +"23271","Ethiopia","ETH","Rice (Milled Equivalent)","fabio" +"23272","Ethiopia","ETH","Wheat and products","fabio" +"23273","Ethiopia","ETH","Barley and products","fabio" +"23274","Ethiopia","ETH","Maize and products","fabio" +"23275","Ethiopia","ETH","Rye and products","fabio" +"23276","Ethiopia","ETH","Oats","fabio" +"23277","Ethiopia","ETH","Millet and products","fabio" +"23278","Ethiopia","ETH","Sorghum and products","fabio" +"23279","Ethiopia","ETH","Cereals, Other","fabio" +"23280","Ethiopia","ETH","Potatoes and products","fabio" +"23281","Ethiopia","ETH","Cassava and products","fabio" +"23282","Ethiopia","ETH","Sweet potatoes","fabio" +"23283","Ethiopia","ETH","Roots, Other","fabio" +"23284","Ethiopia","ETH","Yams","fabio" +"23285","Ethiopia","ETH","Sugar cane","fabio" +"23286","Ethiopia","ETH","Sugar beet","fabio" +"23287","Ethiopia","ETH","Beans","fabio" +"23288","Ethiopia","ETH","Peas","fabio" +"23289","Ethiopia","ETH","Pulses, Other and products","fabio" +"23290","Ethiopia","ETH","Nuts and products","fabio" +"23291","Ethiopia","ETH","Soyabeans","fabio" +"23292","Ethiopia","ETH","Groundnuts (Shelled Eq)","fabio" +"23293","Ethiopia","ETH","Sunflower seed","fabio" +"23294","Ethiopia","ETH","Rape and Mustardseed","fabio" +"23295","Ethiopia","ETH","Seed cotton","fabio" +"23296","Ethiopia","ETH","Coconuts - Incl Copra","fabio" +"23297","Ethiopia","ETH","Sesame seed","fabio" +"23298","Ethiopia","ETH","Oil, palm fruit","fabio" +"23299","Ethiopia","ETH","Olives (including preserved)","fabio" +"23300","Ethiopia","ETH","Oilcrops, Other","fabio" +"23301","Ethiopia","ETH","Tomatoes and products","fabio" +"23302","Ethiopia","ETH","Onions","fabio" +"23303","Ethiopia","ETH","Vegetables, Other","fabio" +"23304","Ethiopia","ETH","Oranges, Mandarines","fabio" +"23305","Ethiopia","ETH","Lemons, Limes and products","fabio" +"23306","Ethiopia","ETH","Grapefruit and products","fabio" +"23307","Ethiopia","ETH","Citrus, Other","fabio" +"23308","Ethiopia","ETH","Bananas","fabio" +"23309","Ethiopia","ETH","Plantains","fabio" +"23310","Ethiopia","ETH","Apples and products","fabio" +"23311","Ethiopia","ETH","Pineapples and products","fabio" +"23312","Ethiopia","ETH","Dates","fabio" +"23313","Ethiopia","ETH","Grapes and products (excl wine)","fabio" +"23314","Ethiopia","ETH","Fruits, Other","fabio" +"23315","Ethiopia","ETH","Coffee and products","fabio" +"23316","Ethiopia","ETH","Cocoa Beans and products","fabio" +"23317","Ethiopia","ETH","Tea (including mate)","fabio" +"23318","Ethiopia","ETH","Hops","fabio" +"23319","Ethiopia","ETH","Pepper","fabio" +"23320","Ethiopia","ETH","Pimento","fabio" +"23321","Ethiopia","ETH","Cloves","fabio" +"23322","Ethiopia","ETH","Spices, Other","fabio" +"23323","Ethiopia","ETH","Jute","fabio" +"23324","Ethiopia","ETH","Jute-Like Fibres","fabio" +"23325","Ethiopia","ETH","Soft-Fibres, Other","fabio" +"23326","Ethiopia","ETH","Sisal","fabio" +"23327","Ethiopia","ETH","Abaca","fabio" +"23328","Ethiopia","ETH","Hard Fibres, Other","fabio" +"23329","Ethiopia","ETH","Tobacco","fabio" +"23330","Ethiopia","ETH","Rubber","fabio" +"23331","Ethiopia","ETH","Fodder crops","fabio" +"23332","Ethiopia","ETH","Grazing","fabio" +"23333","Ethiopia","ETH","Cottonseed","fabio" +"23334","Ethiopia","ETH","Palm kernels","fabio" +"23335","Ethiopia","ETH","Sugar non-centrifugal","fabio" +"23336","Ethiopia","ETH","Molasses","fabio" +"23337","Ethiopia","ETH","Sugar, Refined Equiv","fabio" +"23338","Ethiopia","ETH","Sweeteners, Other","fabio" +"23339","Ethiopia","ETH","Soyabean Oil","fabio" +"23340","Ethiopia","ETH","Groundnut Oil","fabio" +"23341","Ethiopia","ETH","Sunflowerseed Oil","fabio" +"23342","Ethiopia","ETH","Rape and Mustard Oil","fabio" +"23343","Ethiopia","ETH","Cottonseed Oil","fabio" +"23344","Ethiopia","ETH","Palmkernel Oil","fabio" +"23345","Ethiopia","ETH","Palm Oil","fabio" +"23346","Ethiopia","ETH","Coconut Oil","fabio" +"23347","Ethiopia","ETH","Sesameseed Oil","fabio" +"23348","Ethiopia","ETH","Olive Oil","fabio" +"23349","Ethiopia","ETH","Ricebran Oil","fabio" +"23350","Ethiopia","ETH","Maize Germ Oil","fabio" +"23351","Ethiopia","ETH","Oilcrops Oil, Other","fabio" +"23352","Ethiopia","ETH","Soyabean Cake","fabio" +"23353","Ethiopia","ETH","Groundnut Cake","fabio" +"23354","Ethiopia","ETH","Sunflowerseed Cake","fabio" +"23355","Ethiopia","ETH","Rape and Mustard Cake","fabio" +"23356","Ethiopia","ETH","Cottonseed Cake","fabio" +"23357","Ethiopia","ETH","Palmkernel Cake","fabio" +"23358","Ethiopia","ETH","Copra Cake","fabio" +"23359","Ethiopia","ETH","Sesameseed Cake","fabio" +"23360","Ethiopia","ETH","Oilseed Cakes, Other","fabio" +"23361","Ethiopia","ETH","Wine","fabio" +"23362","Ethiopia","ETH","Beer","fabio" +"23363","Ethiopia","ETH","Beverages, Fermented","fabio" +"23364","Ethiopia","ETH","Beverages, Alcoholic","fabio" +"23365","Ethiopia","ETH","Alcohol, Non-Food","fabio" +"23366","Ethiopia","ETH","Cotton lint","fabio" +"23367","Ethiopia","ETH","Cattle","fabio" +"23368","Ethiopia","ETH","Buffaloes","fabio" +"23369","Ethiopia","ETH","Sheep","fabio" +"23370","Ethiopia","ETH","Goats","fabio" +"23371","Ethiopia","ETH","Pigs","fabio" +"23372","Ethiopia","ETH","Poultry Birds","fabio" +"23373","Ethiopia","ETH","Horses","fabio" +"23374","Ethiopia","ETH","Asses","fabio" +"23375","Ethiopia","ETH","Mules","fabio" +"23376","Ethiopia","ETH","Camels","fabio" +"23377","Ethiopia","ETH","Camelids, other","fabio" +"23378","Ethiopia","ETH","Rabbits and hares","fabio" +"23379","Ethiopia","ETH","Rodents, other","fabio" +"23380","Ethiopia","ETH","Live animals, other","fabio" +"23381","Ethiopia","ETH","Milk - Excluding Butter","fabio" +"23382","Ethiopia","ETH","Butter, Ghee","fabio" +"23383","Ethiopia","ETH","Eggs","fabio" +"23384","Ethiopia","ETH","Wool (Clean Eq.)","fabio" +"23385","Ethiopia","ETH","Bovine Meat","fabio" +"23386","Ethiopia","ETH","Mutton & Goat Meat","fabio" +"23387","Ethiopia","ETH","Pigmeat","fabio" +"23388","Ethiopia","ETH","Poultry Meat","fabio" +"23389","Ethiopia","ETH","Meat, Other","fabio" +"23390","Ethiopia","ETH","Offals, Edible","fabio" +"23391","Ethiopia","ETH","Fats, Animals, Raw","fabio" +"23392","Ethiopia","ETH","Hides and skins","fabio" +"23393","Ethiopia","ETH","Meat Meal","fabio" +"23394","Ethiopia","ETH","Pet food","fabio" +"23395","Ethiopia","ETH","Honey","fabio" +"23396","Ethiopia","ETH","Silk","fabio" +"23397","Ethiopia","ETH","Fish, Seafood","fabio" +"23398","Ethiopia","ETH","Wood fuel","fabio" +"23399","Ethiopia","ETH","Industrial roundwood, coniferous","fabio" +"23400","Ethiopia","ETH","Industrial roundwood, non-coniferous","fabio" +"23401","Samoa","WSM","Rice (Milled Equivalent)","fabio" +"23402","Samoa","WSM","Wheat and products","fabio" +"23403","Samoa","WSM","Barley and products","fabio" +"23404","Samoa","WSM","Maize and products","fabio" +"23405","Samoa","WSM","Rye and products","fabio" +"23406","Samoa","WSM","Oats","fabio" +"23407","Samoa","WSM","Millet and products","fabio" +"23408","Samoa","WSM","Sorghum and products","fabio" +"23409","Samoa","WSM","Cereals, Other","fabio" +"23410","Samoa","WSM","Potatoes and products","fabio" +"23411","Samoa","WSM","Cassava and products","fabio" +"23412","Samoa","WSM","Sweet potatoes","fabio" +"23413","Samoa","WSM","Roots, Other","fabio" +"23414","Samoa","WSM","Yams","fabio" +"23415","Samoa","WSM","Sugar cane","fabio" +"23416","Samoa","WSM","Sugar beet","fabio" +"23417","Samoa","WSM","Beans","fabio" +"23418","Samoa","WSM","Peas","fabio" +"23419","Samoa","WSM","Pulses, Other and products","fabio" +"23420","Samoa","WSM","Nuts and products","fabio" +"23421","Samoa","WSM","Soyabeans","fabio" +"23422","Samoa","WSM","Groundnuts (Shelled Eq)","fabio" +"23423","Samoa","WSM","Sunflower seed","fabio" +"23424","Samoa","WSM","Rape and Mustardseed","fabio" +"23425","Samoa","WSM","Seed cotton","fabio" +"23426","Samoa","WSM","Coconuts - Incl Copra","fabio" +"23427","Samoa","WSM","Sesame seed","fabio" +"23428","Samoa","WSM","Oil, palm fruit","fabio" +"23429","Samoa","WSM","Olives (including preserved)","fabio" +"23430","Samoa","WSM","Oilcrops, Other","fabio" +"23431","Samoa","WSM","Tomatoes and products","fabio" +"23432","Samoa","WSM","Onions","fabio" +"23433","Samoa","WSM","Vegetables, Other","fabio" +"23434","Samoa","WSM","Oranges, Mandarines","fabio" +"23435","Samoa","WSM","Lemons, Limes and products","fabio" +"23436","Samoa","WSM","Grapefruit and products","fabio" +"23437","Samoa","WSM","Citrus, Other","fabio" +"23438","Samoa","WSM","Bananas","fabio" +"23439","Samoa","WSM","Plantains","fabio" +"23440","Samoa","WSM","Apples and products","fabio" +"23441","Samoa","WSM","Pineapples and products","fabio" +"23442","Samoa","WSM","Dates","fabio" +"23443","Samoa","WSM","Grapes and products (excl wine)","fabio" +"23444","Samoa","WSM","Fruits, Other","fabio" +"23445","Samoa","WSM","Coffee and products","fabio" +"23446","Samoa","WSM","Cocoa Beans and products","fabio" +"23447","Samoa","WSM","Tea (including mate)","fabio" +"23448","Samoa","WSM","Hops","fabio" +"23449","Samoa","WSM","Pepper","fabio" +"23450","Samoa","WSM","Pimento","fabio" +"23451","Samoa","WSM","Cloves","fabio" +"23452","Samoa","WSM","Spices, Other","fabio" +"23453","Samoa","WSM","Jute","fabio" +"23454","Samoa","WSM","Jute-Like Fibres","fabio" +"23455","Samoa","WSM","Soft-Fibres, Other","fabio" +"23456","Samoa","WSM","Sisal","fabio" +"23457","Samoa","WSM","Abaca","fabio" +"23458","Samoa","WSM","Hard Fibres, Other","fabio" +"23459","Samoa","WSM","Tobacco","fabio" +"23460","Samoa","WSM","Rubber","fabio" +"23461","Samoa","WSM","Fodder crops","fabio" +"23462","Samoa","WSM","Grazing","fabio" +"23463","Samoa","WSM","Cottonseed","fabio" +"23464","Samoa","WSM","Palm kernels","fabio" +"23465","Samoa","WSM","Sugar non-centrifugal","fabio" +"23466","Samoa","WSM","Molasses","fabio" +"23467","Samoa","WSM","Sugar, Refined Equiv","fabio" +"23468","Samoa","WSM","Sweeteners, Other","fabio" +"23469","Samoa","WSM","Soyabean Oil","fabio" +"23470","Samoa","WSM","Groundnut Oil","fabio" +"23471","Samoa","WSM","Sunflowerseed Oil","fabio" +"23472","Samoa","WSM","Rape and Mustard Oil","fabio" +"23473","Samoa","WSM","Cottonseed Oil","fabio" +"23474","Samoa","WSM","Palmkernel Oil","fabio" +"23475","Samoa","WSM","Palm Oil","fabio" +"23476","Samoa","WSM","Coconut Oil","fabio" +"23477","Samoa","WSM","Sesameseed Oil","fabio" +"23478","Samoa","WSM","Olive Oil","fabio" +"23479","Samoa","WSM","Ricebran Oil","fabio" +"23480","Samoa","WSM","Maize Germ Oil","fabio" +"23481","Samoa","WSM","Oilcrops Oil, Other","fabio" +"23482","Samoa","WSM","Soyabean Cake","fabio" +"23483","Samoa","WSM","Groundnut Cake","fabio" +"23484","Samoa","WSM","Sunflowerseed Cake","fabio" +"23485","Samoa","WSM","Rape and Mustard Cake","fabio" +"23486","Samoa","WSM","Cottonseed Cake","fabio" +"23487","Samoa","WSM","Palmkernel Cake","fabio" +"23488","Samoa","WSM","Copra Cake","fabio" +"23489","Samoa","WSM","Sesameseed Cake","fabio" +"23490","Samoa","WSM","Oilseed Cakes, Other","fabio" +"23491","Samoa","WSM","Wine","fabio" +"23492","Samoa","WSM","Beer","fabio" +"23493","Samoa","WSM","Beverages, Fermented","fabio" +"23494","Samoa","WSM","Beverages, Alcoholic","fabio" +"23495","Samoa","WSM","Alcohol, Non-Food","fabio" +"23496","Samoa","WSM","Cotton lint","fabio" +"23497","Samoa","WSM","Cattle","fabio" +"23498","Samoa","WSM","Buffaloes","fabio" +"23499","Samoa","WSM","Sheep","fabio" +"23500","Samoa","WSM","Goats","fabio" +"23501","Samoa","WSM","Pigs","fabio" +"23502","Samoa","WSM","Poultry Birds","fabio" +"23503","Samoa","WSM","Horses","fabio" +"23504","Samoa","WSM","Asses","fabio" +"23505","Samoa","WSM","Mules","fabio" +"23506","Samoa","WSM","Camels","fabio" +"23507","Samoa","WSM","Camelids, other","fabio" +"23508","Samoa","WSM","Rabbits and hares","fabio" +"23509","Samoa","WSM","Rodents, other","fabio" +"23510","Samoa","WSM","Live animals, other","fabio" +"23511","Samoa","WSM","Milk - Excluding Butter","fabio" +"23512","Samoa","WSM","Butter, Ghee","fabio" +"23513","Samoa","WSM","Eggs","fabio" +"23514","Samoa","WSM","Wool (Clean Eq.)","fabio" +"23515","Samoa","WSM","Bovine Meat","fabio" +"23516","Samoa","WSM","Mutton & Goat Meat","fabio" +"23517","Samoa","WSM","Pigmeat","fabio" +"23518","Samoa","WSM","Poultry Meat","fabio" +"23519","Samoa","WSM","Meat, Other","fabio" +"23520","Samoa","WSM","Offals, Edible","fabio" +"23521","Samoa","WSM","Fats, Animals, Raw","fabio" +"23522","Samoa","WSM","Hides and skins","fabio" +"23523","Samoa","WSM","Meat Meal","fabio" +"23524","Samoa","WSM","Pet food","fabio" +"23525","Samoa","WSM","Honey","fabio" +"23526","Samoa","WSM","Silk","fabio" +"23527","Samoa","WSM","Fish, Seafood","fabio" +"23528","Samoa","WSM","Wood fuel","fabio" +"23529","Samoa","WSM","Industrial roundwood, coniferous","fabio" +"23530","Samoa","WSM","Industrial roundwood, non-coniferous","fabio" +"23531","Yugoslav SFR","YUG","Rice (Milled Equivalent)","fabio" +"23532","Yugoslav SFR","YUG","Wheat and products","fabio" +"23533","Yugoslav SFR","YUG","Barley and products","fabio" +"23534","Yugoslav SFR","YUG","Maize and products","fabio" +"23535","Yugoslav SFR","YUG","Rye and products","fabio" +"23536","Yugoslav SFR","YUG","Oats","fabio" +"23537","Yugoslav SFR","YUG","Millet and products","fabio" +"23538","Yugoslav SFR","YUG","Sorghum and products","fabio" +"23539","Yugoslav SFR","YUG","Cereals, Other","fabio" +"23540","Yugoslav SFR","YUG","Potatoes and products","fabio" +"23541","Yugoslav SFR","YUG","Cassava and products","fabio" +"23542","Yugoslav SFR","YUG","Sweet potatoes","fabio" +"23543","Yugoslav SFR","YUG","Roots, Other","fabio" +"23544","Yugoslav SFR","YUG","Yams","fabio" +"23545","Yugoslav SFR","YUG","Sugar cane","fabio" +"23546","Yugoslav SFR","YUG","Sugar beet","fabio" +"23547","Yugoslav SFR","YUG","Beans","fabio" +"23548","Yugoslav SFR","YUG","Peas","fabio" +"23549","Yugoslav SFR","YUG","Pulses, Other and products","fabio" +"23550","Yugoslav SFR","YUG","Nuts and products","fabio" +"23551","Yugoslav SFR","YUG","Soyabeans","fabio" +"23552","Yugoslav SFR","YUG","Groundnuts (Shelled Eq)","fabio" +"23553","Yugoslav SFR","YUG","Sunflower seed","fabio" +"23554","Yugoslav SFR","YUG","Rape and Mustardseed","fabio" +"23555","Yugoslav SFR","YUG","Seed cotton","fabio" +"23556","Yugoslav SFR","YUG","Coconuts - Incl Copra","fabio" +"23557","Yugoslav SFR","YUG","Sesame seed","fabio" +"23558","Yugoslav SFR","YUG","Oil, palm fruit","fabio" +"23559","Yugoslav SFR","YUG","Olives (including preserved)","fabio" +"23560","Yugoslav SFR","YUG","Oilcrops, Other","fabio" +"23561","Yugoslav SFR","YUG","Tomatoes and products","fabio" +"23562","Yugoslav SFR","YUG","Onions","fabio" +"23563","Yugoslav SFR","YUG","Vegetables, Other","fabio" +"23564","Yugoslav SFR","YUG","Oranges, Mandarines","fabio" +"23565","Yugoslav SFR","YUG","Lemons, Limes and products","fabio" +"23566","Yugoslav SFR","YUG","Grapefruit and products","fabio" +"23567","Yugoslav SFR","YUG","Citrus, Other","fabio" +"23568","Yugoslav SFR","YUG","Bananas","fabio" +"23569","Yugoslav SFR","YUG","Plantains","fabio" +"23570","Yugoslav SFR","YUG","Apples and products","fabio" +"23571","Yugoslav SFR","YUG","Pineapples and products","fabio" +"23572","Yugoslav SFR","YUG","Dates","fabio" +"23573","Yugoslav SFR","YUG","Grapes and products (excl wine)","fabio" +"23574","Yugoslav SFR","YUG","Fruits, Other","fabio" +"23575","Yugoslav SFR","YUG","Coffee and products","fabio" +"23576","Yugoslav SFR","YUG","Cocoa Beans and products","fabio" +"23577","Yugoslav SFR","YUG","Tea (including mate)","fabio" +"23578","Yugoslav SFR","YUG","Hops","fabio" +"23579","Yugoslav SFR","YUG","Pepper","fabio" +"23580","Yugoslav SFR","YUG","Pimento","fabio" +"23581","Yugoslav SFR","YUG","Cloves","fabio" +"23582","Yugoslav SFR","YUG","Spices, Other","fabio" +"23583","Yugoslav SFR","YUG","Jute","fabio" +"23584","Yugoslav SFR","YUG","Jute-Like Fibres","fabio" +"23585","Yugoslav SFR","YUG","Soft-Fibres, Other","fabio" +"23586","Yugoslav SFR","YUG","Sisal","fabio" +"23587","Yugoslav SFR","YUG","Abaca","fabio" +"23588","Yugoslav SFR","YUG","Hard Fibres, Other","fabio" +"23589","Yugoslav SFR","YUG","Tobacco","fabio" +"23590","Yugoslav SFR","YUG","Rubber","fabio" +"23591","Yugoslav SFR","YUG","Fodder crops","fabio" +"23592","Yugoslav SFR","YUG","Grazing","fabio" +"23593","Yugoslav SFR","YUG","Cottonseed","fabio" +"23594","Yugoslav SFR","YUG","Palm kernels","fabio" +"23595","Yugoslav SFR","YUG","Sugar non-centrifugal","fabio" +"23596","Yugoslav SFR","YUG","Molasses","fabio" +"23597","Yugoslav SFR","YUG","Sugar, Refined Equiv","fabio" +"23598","Yugoslav SFR","YUG","Sweeteners, Other","fabio" +"23599","Yugoslav SFR","YUG","Soyabean Oil","fabio" +"23600","Yugoslav SFR","YUG","Groundnut Oil","fabio" +"23601","Yugoslav SFR","YUG","Sunflowerseed Oil","fabio" +"23602","Yugoslav SFR","YUG","Rape and Mustard Oil","fabio" +"23603","Yugoslav SFR","YUG","Cottonseed Oil","fabio" +"23604","Yugoslav SFR","YUG","Palmkernel Oil","fabio" +"23605","Yugoslav SFR","YUG","Palm Oil","fabio" +"23606","Yugoslav SFR","YUG","Coconut Oil","fabio" +"23607","Yugoslav SFR","YUG","Sesameseed Oil","fabio" +"23608","Yugoslav SFR","YUG","Olive Oil","fabio" +"23609","Yugoslav SFR","YUG","Ricebran Oil","fabio" +"23610","Yugoslav SFR","YUG","Maize Germ Oil","fabio" +"23611","Yugoslav SFR","YUG","Oilcrops Oil, Other","fabio" +"23612","Yugoslav SFR","YUG","Soyabean Cake","fabio" +"23613","Yugoslav SFR","YUG","Groundnut Cake","fabio" +"23614","Yugoslav SFR","YUG","Sunflowerseed Cake","fabio" +"23615","Yugoslav SFR","YUG","Rape and Mustard Cake","fabio" +"23616","Yugoslav SFR","YUG","Cottonseed Cake","fabio" +"23617","Yugoslav SFR","YUG","Palmkernel Cake","fabio" +"23618","Yugoslav SFR","YUG","Copra Cake","fabio" +"23619","Yugoslav SFR","YUG","Sesameseed Cake","fabio" +"23620","Yugoslav SFR","YUG","Oilseed Cakes, Other","fabio" +"23621","Yugoslav SFR","YUG","Wine","fabio" +"23622","Yugoslav SFR","YUG","Beer","fabio" +"23623","Yugoslav SFR","YUG","Beverages, Fermented","fabio" +"23624","Yugoslav SFR","YUG","Beverages, Alcoholic","fabio" +"23625","Yugoslav SFR","YUG","Alcohol, Non-Food","fabio" +"23626","Yugoslav SFR","YUG","Cotton lint","fabio" +"23627","Yugoslav SFR","YUG","Cattle","fabio" +"23628","Yugoslav SFR","YUG","Buffaloes","fabio" +"23629","Yugoslav SFR","YUG","Sheep","fabio" +"23630","Yugoslav SFR","YUG","Goats","fabio" +"23631","Yugoslav SFR","YUG","Pigs","fabio" +"23632","Yugoslav SFR","YUG","Poultry Birds","fabio" +"23633","Yugoslav SFR","YUG","Horses","fabio" +"23634","Yugoslav SFR","YUG","Asses","fabio" +"23635","Yugoslav SFR","YUG","Mules","fabio" +"23636","Yugoslav SFR","YUG","Camels","fabio" +"23637","Yugoslav SFR","YUG","Camelids, other","fabio" +"23638","Yugoslav SFR","YUG","Rabbits and hares","fabio" +"23639","Yugoslav SFR","YUG","Rodents, other","fabio" +"23640","Yugoslav SFR","YUG","Live animals, other","fabio" +"23641","Yugoslav SFR","YUG","Milk - Excluding Butter","fabio" +"23642","Yugoslav SFR","YUG","Butter, Ghee","fabio" +"23643","Yugoslav SFR","YUG","Eggs","fabio" +"23644","Yugoslav SFR","YUG","Wool (Clean Eq.)","fabio" +"23645","Yugoslav SFR","YUG","Bovine Meat","fabio" +"23646","Yugoslav SFR","YUG","Mutton & Goat Meat","fabio" +"23647","Yugoslav SFR","YUG","Pigmeat","fabio" +"23648","Yugoslav SFR","YUG","Poultry Meat","fabio" +"23649","Yugoslav SFR","YUG","Meat, Other","fabio" +"23650","Yugoslav SFR","YUG","Offals, Edible","fabio" +"23651","Yugoslav SFR","YUG","Fats, Animals, Raw","fabio" +"23652","Yugoslav SFR","YUG","Hides and skins","fabio" +"23653","Yugoslav SFR","YUG","Meat Meal","fabio" +"23654","Yugoslav SFR","YUG","Pet food","fabio" +"23655","Yugoslav SFR","YUG","Honey","fabio" +"23656","Yugoslav SFR","YUG","Silk","fabio" +"23657","Yugoslav SFR","YUG","Fish, Seafood","fabio" +"23658","Yugoslav SFR","YUG","Wood fuel","fabio" +"23659","Yugoslav SFR","YUG","Industrial roundwood, coniferous","fabio" +"23660","Yugoslav SFR","YUG","Industrial roundwood, non-coniferous","fabio" +"23661","Yemen","YEM","Rice (Milled Equivalent)","fabio" +"23662","Yemen","YEM","Wheat and products","fabio" +"23663","Yemen","YEM","Barley and products","fabio" +"23664","Yemen","YEM","Maize and products","fabio" +"23665","Yemen","YEM","Rye and products","fabio" +"23666","Yemen","YEM","Oats","fabio" +"23667","Yemen","YEM","Millet and products","fabio" +"23668","Yemen","YEM","Sorghum and products","fabio" +"23669","Yemen","YEM","Cereals, Other","fabio" +"23670","Yemen","YEM","Potatoes and products","fabio" +"23671","Yemen","YEM","Cassava and products","fabio" +"23672","Yemen","YEM","Sweet potatoes","fabio" +"23673","Yemen","YEM","Roots, Other","fabio" +"23674","Yemen","YEM","Yams","fabio" +"23675","Yemen","YEM","Sugar cane","fabio" +"23676","Yemen","YEM","Sugar beet","fabio" +"23677","Yemen","YEM","Beans","fabio" +"23678","Yemen","YEM","Peas","fabio" +"23679","Yemen","YEM","Pulses, Other and products","fabio" +"23680","Yemen","YEM","Nuts and products","fabio" +"23681","Yemen","YEM","Soyabeans","fabio" +"23682","Yemen","YEM","Groundnuts (Shelled Eq)","fabio" +"23683","Yemen","YEM","Sunflower seed","fabio" +"23684","Yemen","YEM","Rape and Mustardseed","fabio" +"23685","Yemen","YEM","Seed cotton","fabio" +"23686","Yemen","YEM","Coconuts - Incl Copra","fabio" +"23687","Yemen","YEM","Sesame seed","fabio" +"23688","Yemen","YEM","Oil, palm fruit","fabio" +"23689","Yemen","YEM","Olives (including preserved)","fabio" +"23690","Yemen","YEM","Oilcrops, Other","fabio" +"23691","Yemen","YEM","Tomatoes and products","fabio" +"23692","Yemen","YEM","Onions","fabio" +"23693","Yemen","YEM","Vegetables, Other","fabio" +"23694","Yemen","YEM","Oranges, Mandarines","fabio" +"23695","Yemen","YEM","Lemons, Limes and products","fabio" +"23696","Yemen","YEM","Grapefruit and products","fabio" +"23697","Yemen","YEM","Citrus, Other","fabio" +"23698","Yemen","YEM","Bananas","fabio" +"23699","Yemen","YEM","Plantains","fabio" +"23700","Yemen","YEM","Apples and products","fabio" +"23701","Yemen","YEM","Pineapples and products","fabio" +"23702","Yemen","YEM","Dates","fabio" +"23703","Yemen","YEM","Grapes and products (excl wine)","fabio" +"23704","Yemen","YEM","Fruits, Other","fabio" +"23705","Yemen","YEM","Coffee and products","fabio" +"23706","Yemen","YEM","Cocoa Beans and products","fabio" +"23707","Yemen","YEM","Tea (including mate)","fabio" +"23708","Yemen","YEM","Hops","fabio" +"23709","Yemen","YEM","Pepper","fabio" +"23710","Yemen","YEM","Pimento","fabio" +"23711","Yemen","YEM","Cloves","fabio" +"23712","Yemen","YEM","Spices, Other","fabio" +"23713","Yemen","YEM","Jute","fabio" +"23714","Yemen","YEM","Jute-Like Fibres","fabio" +"23715","Yemen","YEM","Soft-Fibres, Other","fabio" +"23716","Yemen","YEM","Sisal","fabio" +"23717","Yemen","YEM","Abaca","fabio" +"23718","Yemen","YEM","Hard Fibres, Other","fabio" +"23719","Yemen","YEM","Tobacco","fabio" +"23720","Yemen","YEM","Rubber","fabio" +"23721","Yemen","YEM","Fodder crops","fabio" +"23722","Yemen","YEM","Grazing","fabio" +"23723","Yemen","YEM","Cottonseed","fabio" +"23724","Yemen","YEM","Palm kernels","fabio" +"23725","Yemen","YEM","Sugar non-centrifugal","fabio" +"23726","Yemen","YEM","Molasses","fabio" +"23727","Yemen","YEM","Sugar, Refined Equiv","fabio" +"23728","Yemen","YEM","Sweeteners, Other","fabio" +"23729","Yemen","YEM","Soyabean Oil","fabio" +"23730","Yemen","YEM","Groundnut Oil","fabio" +"23731","Yemen","YEM","Sunflowerseed Oil","fabio" +"23732","Yemen","YEM","Rape and Mustard Oil","fabio" +"23733","Yemen","YEM","Cottonseed Oil","fabio" +"23734","Yemen","YEM","Palmkernel Oil","fabio" +"23735","Yemen","YEM","Palm Oil","fabio" +"23736","Yemen","YEM","Coconut Oil","fabio" +"23737","Yemen","YEM","Sesameseed Oil","fabio" +"23738","Yemen","YEM","Olive Oil","fabio" +"23739","Yemen","YEM","Ricebran Oil","fabio" +"23740","Yemen","YEM","Maize Germ Oil","fabio" +"23741","Yemen","YEM","Oilcrops Oil, Other","fabio" +"23742","Yemen","YEM","Soyabean Cake","fabio" +"23743","Yemen","YEM","Groundnut Cake","fabio" +"23744","Yemen","YEM","Sunflowerseed Cake","fabio" +"23745","Yemen","YEM","Rape and Mustard Cake","fabio" +"23746","Yemen","YEM","Cottonseed Cake","fabio" +"23747","Yemen","YEM","Palmkernel Cake","fabio" +"23748","Yemen","YEM","Copra Cake","fabio" +"23749","Yemen","YEM","Sesameseed Cake","fabio" +"23750","Yemen","YEM","Oilseed Cakes, Other","fabio" +"23751","Yemen","YEM","Wine","fabio" +"23752","Yemen","YEM","Beer","fabio" +"23753","Yemen","YEM","Beverages, Fermented","fabio" +"23754","Yemen","YEM","Beverages, Alcoholic","fabio" +"23755","Yemen","YEM","Alcohol, Non-Food","fabio" +"23756","Yemen","YEM","Cotton lint","fabio" +"23757","Yemen","YEM","Cattle","fabio" +"23758","Yemen","YEM","Buffaloes","fabio" +"23759","Yemen","YEM","Sheep","fabio" +"23760","Yemen","YEM","Goats","fabio" +"23761","Yemen","YEM","Pigs","fabio" +"23762","Yemen","YEM","Poultry Birds","fabio" +"23763","Yemen","YEM","Horses","fabio" +"23764","Yemen","YEM","Asses","fabio" +"23765","Yemen","YEM","Mules","fabio" +"23766","Yemen","YEM","Camels","fabio" +"23767","Yemen","YEM","Camelids, other","fabio" +"23768","Yemen","YEM","Rabbits and hares","fabio" +"23769","Yemen","YEM","Rodents, other","fabio" +"23770","Yemen","YEM","Live animals, other","fabio" +"23771","Yemen","YEM","Milk - Excluding Butter","fabio" +"23772","Yemen","YEM","Butter, Ghee","fabio" +"23773","Yemen","YEM","Eggs","fabio" +"23774","Yemen","YEM","Wool (Clean Eq.)","fabio" +"23775","Yemen","YEM","Bovine Meat","fabio" +"23776","Yemen","YEM","Mutton & Goat Meat","fabio" +"23777","Yemen","YEM","Pigmeat","fabio" +"23778","Yemen","YEM","Poultry Meat","fabio" +"23779","Yemen","YEM","Meat, Other","fabio" +"23780","Yemen","YEM","Offals, Edible","fabio" +"23781","Yemen","YEM","Fats, Animals, Raw","fabio" +"23782","Yemen","YEM","Hides and skins","fabio" +"23783","Yemen","YEM","Meat Meal","fabio" +"23784","Yemen","YEM","Pet food","fabio" +"23785","Yemen","YEM","Honey","fabio" +"23786","Yemen","YEM","Silk","fabio" +"23787","Yemen","YEM","Fish, Seafood","fabio" +"23788","Yemen","YEM","Wood fuel","fabio" +"23789","Yemen","YEM","Industrial roundwood, coniferous","fabio" +"23790","Yemen","YEM","Industrial roundwood, non-coniferous","fabio" +"23791","Democratic Republic of the Congo","COD","Rice (Milled Equivalent)","fabio" +"23792","Democratic Republic of the Congo","COD","Wheat and products","fabio" +"23793","Democratic Republic of the Congo","COD","Barley and products","fabio" +"23794","Democratic Republic of the Congo","COD","Maize and products","fabio" +"23795","Democratic Republic of the Congo","COD","Rye and products","fabio" +"23796","Democratic Republic of the Congo","COD","Oats","fabio" +"23797","Democratic Republic of the Congo","COD","Millet and products","fabio" +"23798","Democratic Republic of the Congo","COD","Sorghum and products","fabio" +"23799","Democratic Republic of the Congo","COD","Cereals, Other","fabio" +"23800","Democratic Republic of the Congo","COD","Potatoes and products","fabio" +"23801","Democratic Republic of the Congo","COD","Cassava and products","fabio" +"23802","Democratic Republic of the Congo","COD","Sweet potatoes","fabio" +"23803","Democratic Republic of the Congo","COD","Roots, Other","fabio" +"23804","Democratic Republic of the Congo","COD","Yams","fabio" +"23805","Democratic Republic of the Congo","COD","Sugar cane","fabio" +"23806","Democratic Republic of the Congo","COD","Sugar beet","fabio" +"23807","Democratic Republic of the Congo","COD","Beans","fabio" +"23808","Democratic Republic of the Congo","COD","Peas","fabio" +"23809","Democratic Republic of the Congo","COD","Pulses, Other and products","fabio" +"23810","Democratic Republic of the Congo","COD","Nuts and products","fabio" +"23811","Democratic Republic of the Congo","COD","Soyabeans","fabio" +"23812","Democratic Republic of the Congo","COD","Groundnuts (Shelled Eq)","fabio" +"23813","Democratic Republic of the Congo","COD","Sunflower seed","fabio" +"23814","Democratic Republic of the Congo","COD","Rape and Mustardseed","fabio" +"23815","Democratic Republic of the Congo","COD","Seed cotton","fabio" +"23816","Democratic Republic of the Congo","COD","Coconuts - Incl Copra","fabio" +"23817","Democratic Republic of the Congo","COD","Sesame seed","fabio" +"23818","Democratic Republic of the Congo","COD","Oil, palm fruit","fabio" +"23819","Democratic Republic of the Congo","COD","Olives (including preserved)","fabio" +"23820","Democratic Republic of the Congo","COD","Oilcrops, Other","fabio" +"23821","Democratic Republic of the Congo","COD","Tomatoes and products","fabio" +"23822","Democratic Republic of the Congo","COD","Onions","fabio" +"23823","Democratic Republic of the Congo","COD","Vegetables, Other","fabio" +"23824","Democratic Republic of the Congo","COD","Oranges, Mandarines","fabio" +"23825","Democratic Republic of the Congo","COD","Lemons, Limes and products","fabio" +"23826","Democratic Republic of the Congo","COD","Grapefruit and products","fabio" +"23827","Democratic Republic of the Congo","COD","Citrus, Other","fabio" +"23828","Democratic Republic of the Congo","COD","Bananas","fabio" +"23829","Democratic Republic of the Congo","COD","Plantains","fabio" +"23830","Democratic Republic of the Congo","COD","Apples and products","fabio" +"23831","Democratic Republic of the Congo","COD","Pineapples and products","fabio" +"23832","Democratic Republic of the Congo","COD","Dates","fabio" +"23833","Democratic Republic of the Congo","COD","Grapes and products (excl wine)","fabio" +"23834","Democratic Republic of the Congo","COD","Fruits, Other","fabio" +"23835","Democratic Republic of the Congo","COD","Coffee and products","fabio" +"23836","Democratic Republic of the Congo","COD","Cocoa Beans and products","fabio" +"23837","Democratic Republic of the Congo","COD","Tea (including mate)","fabio" +"23838","Democratic Republic of the Congo","COD","Hops","fabio" +"23839","Democratic Republic of the Congo","COD","Pepper","fabio" +"23840","Democratic Republic of the Congo","COD","Pimento","fabio" +"23841","Democratic Republic of the Congo","COD","Cloves","fabio" +"23842","Democratic Republic of the Congo","COD","Spices, Other","fabio" +"23843","Democratic Republic of the Congo","COD","Jute","fabio" +"23844","Democratic Republic of the Congo","COD","Jute-Like Fibres","fabio" +"23845","Democratic Republic of the Congo","COD","Soft-Fibres, Other","fabio" +"23846","Democratic Republic of the Congo","COD","Sisal","fabio" +"23847","Democratic Republic of the Congo","COD","Abaca","fabio" +"23848","Democratic Republic of the Congo","COD","Hard Fibres, Other","fabio" +"23849","Democratic Republic of the Congo","COD","Tobacco","fabio" +"23850","Democratic Republic of the Congo","COD","Rubber","fabio" +"23851","Democratic Republic of the Congo","COD","Fodder crops","fabio" +"23852","Democratic Republic of the Congo","COD","Grazing","fabio" +"23853","Democratic Republic of the Congo","COD","Cottonseed","fabio" +"23854","Democratic Republic of the Congo","COD","Palm kernels","fabio" +"23855","Democratic Republic of the Congo","COD","Sugar non-centrifugal","fabio" +"23856","Democratic Republic of the Congo","COD","Molasses","fabio" +"23857","Democratic Republic of the Congo","COD","Sugar, Refined Equiv","fabio" +"23858","Democratic Republic of the Congo","COD","Sweeteners, Other","fabio" +"23859","Democratic Republic of the Congo","COD","Soyabean Oil","fabio" +"23860","Democratic Republic of the Congo","COD","Groundnut Oil","fabio" +"23861","Democratic Republic of the Congo","COD","Sunflowerseed Oil","fabio" +"23862","Democratic Republic of the Congo","COD","Rape and Mustard Oil","fabio" +"23863","Democratic Republic of the Congo","COD","Cottonseed Oil","fabio" +"23864","Democratic Republic of the Congo","COD","Palmkernel Oil","fabio" +"23865","Democratic Republic of the Congo","COD","Palm Oil","fabio" +"23866","Democratic Republic of the Congo","COD","Coconut Oil","fabio" +"23867","Democratic Republic of the Congo","COD","Sesameseed Oil","fabio" +"23868","Democratic Republic of the Congo","COD","Olive Oil","fabio" +"23869","Democratic Republic of the Congo","COD","Ricebran Oil","fabio" +"23870","Democratic Republic of the Congo","COD","Maize Germ Oil","fabio" +"23871","Democratic Republic of the Congo","COD","Oilcrops Oil, Other","fabio" +"23872","Democratic Republic of the Congo","COD","Soyabean Cake","fabio" +"23873","Democratic Republic of the Congo","COD","Groundnut Cake","fabio" +"23874","Democratic Republic of the Congo","COD","Sunflowerseed Cake","fabio" +"23875","Democratic Republic of the Congo","COD","Rape and Mustard Cake","fabio" +"23876","Democratic Republic of the Congo","COD","Cottonseed Cake","fabio" +"23877","Democratic Republic of the Congo","COD","Palmkernel Cake","fabio" +"23878","Democratic Republic of the Congo","COD","Copra Cake","fabio" +"23879","Democratic Republic of the Congo","COD","Sesameseed Cake","fabio" +"23880","Democratic Republic of the Congo","COD","Oilseed Cakes, Other","fabio" +"23881","Democratic Republic of the Congo","COD","Wine","fabio" +"23882","Democratic Republic of the Congo","COD","Beer","fabio" +"23883","Democratic Republic of the Congo","COD","Beverages, Fermented","fabio" +"23884","Democratic Republic of the Congo","COD","Beverages, Alcoholic","fabio" +"23885","Democratic Republic of the Congo","COD","Alcohol, Non-Food","fabio" +"23886","Democratic Republic of the Congo","COD","Cotton lint","fabio" +"23887","Democratic Republic of the Congo","COD","Cattle","fabio" +"23888","Democratic Republic of the Congo","COD","Buffaloes","fabio" +"23889","Democratic Republic of the Congo","COD","Sheep","fabio" +"23890","Democratic Republic of the Congo","COD","Goats","fabio" +"23891","Democratic Republic of the Congo","COD","Pigs","fabio" +"23892","Democratic Republic of the Congo","COD","Poultry Birds","fabio" +"23893","Democratic Republic of the Congo","COD","Horses","fabio" +"23894","Democratic Republic of the Congo","COD","Asses","fabio" +"23895","Democratic Republic of the Congo","COD","Mules","fabio" +"23896","Democratic Republic of the Congo","COD","Camels","fabio" +"23897","Democratic Republic of the Congo","COD","Camelids, other","fabio" +"23898","Democratic Republic of the Congo","COD","Rabbits and hares","fabio" +"23899","Democratic Republic of the Congo","COD","Rodents, other","fabio" +"23900","Democratic Republic of the Congo","COD","Live animals, other","fabio" +"23901","Democratic Republic of the Congo","COD","Milk - Excluding Butter","fabio" +"23902","Democratic Republic of the Congo","COD","Butter, Ghee","fabio" +"23903","Democratic Republic of the Congo","COD","Eggs","fabio" +"23904","Democratic Republic of the Congo","COD","Wool (Clean Eq.)","fabio" +"23905","Democratic Republic of the Congo","COD","Bovine Meat","fabio" +"23906","Democratic Republic of the Congo","COD","Mutton & Goat Meat","fabio" +"23907","Democratic Republic of the Congo","COD","Pigmeat","fabio" +"23908","Democratic Republic of the Congo","COD","Poultry Meat","fabio" +"23909","Democratic Republic of the Congo","COD","Meat, Other","fabio" +"23910","Democratic Republic of the Congo","COD","Offals, Edible","fabio" +"23911","Democratic Republic of the Congo","COD","Fats, Animals, Raw","fabio" +"23912","Democratic Republic of the Congo","COD","Hides and skins","fabio" +"23913","Democratic Republic of the Congo","COD","Meat Meal","fabio" +"23914","Democratic Republic of the Congo","COD","Pet food","fabio" +"23915","Democratic Republic of the Congo","COD","Honey","fabio" +"23916","Democratic Republic of the Congo","COD","Silk","fabio" +"23917","Democratic Republic of the Congo","COD","Fish, Seafood","fabio" +"23918","Democratic Republic of the Congo","COD","Wood fuel","fabio" +"23919","Democratic Republic of the Congo","COD","Industrial roundwood, coniferous","fabio" +"23920","Democratic Republic of the Congo","COD","Industrial roundwood, non-coniferous","fabio" +"23921","Zambia","ZMB","Rice (Milled Equivalent)","fabio" +"23922","Zambia","ZMB","Wheat and products","fabio" +"23923","Zambia","ZMB","Barley and products","fabio" +"23924","Zambia","ZMB","Maize and products","fabio" +"23925","Zambia","ZMB","Rye and products","fabio" +"23926","Zambia","ZMB","Oats","fabio" +"23927","Zambia","ZMB","Millet and products","fabio" +"23928","Zambia","ZMB","Sorghum and products","fabio" +"23929","Zambia","ZMB","Cereals, Other","fabio" +"23930","Zambia","ZMB","Potatoes and products","fabio" +"23931","Zambia","ZMB","Cassava and products","fabio" +"23932","Zambia","ZMB","Sweet potatoes","fabio" +"23933","Zambia","ZMB","Roots, Other","fabio" +"23934","Zambia","ZMB","Yams","fabio" +"23935","Zambia","ZMB","Sugar cane","fabio" +"23936","Zambia","ZMB","Sugar beet","fabio" +"23937","Zambia","ZMB","Beans","fabio" +"23938","Zambia","ZMB","Peas","fabio" +"23939","Zambia","ZMB","Pulses, Other and products","fabio" +"23940","Zambia","ZMB","Nuts and products","fabio" +"23941","Zambia","ZMB","Soyabeans","fabio" +"23942","Zambia","ZMB","Groundnuts (Shelled Eq)","fabio" +"23943","Zambia","ZMB","Sunflower seed","fabio" +"23944","Zambia","ZMB","Rape and Mustardseed","fabio" +"23945","Zambia","ZMB","Seed cotton","fabio" +"23946","Zambia","ZMB","Coconuts - Incl Copra","fabio" +"23947","Zambia","ZMB","Sesame seed","fabio" +"23948","Zambia","ZMB","Oil, palm fruit","fabio" +"23949","Zambia","ZMB","Olives (including preserved)","fabio" +"23950","Zambia","ZMB","Oilcrops, Other","fabio" +"23951","Zambia","ZMB","Tomatoes and products","fabio" +"23952","Zambia","ZMB","Onions","fabio" +"23953","Zambia","ZMB","Vegetables, Other","fabio" +"23954","Zambia","ZMB","Oranges, Mandarines","fabio" +"23955","Zambia","ZMB","Lemons, Limes and products","fabio" +"23956","Zambia","ZMB","Grapefruit and products","fabio" +"23957","Zambia","ZMB","Citrus, Other","fabio" +"23958","Zambia","ZMB","Bananas","fabio" +"23959","Zambia","ZMB","Plantains","fabio" +"23960","Zambia","ZMB","Apples and products","fabio" +"23961","Zambia","ZMB","Pineapples and products","fabio" +"23962","Zambia","ZMB","Dates","fabio" +"23963","Zambia","ZMB","Grapes and products (excl wine)","fabio" +"23964","Zambia","ZMB","Fruits, Other","fabio" +"23965","Zambia","ZMB","Coffee and products","fabio" +"23966","Zambia","ZMB","Cocoa Beans and products","fabio" +"23967","Zambia","ZMB","Tea (including mate)","fabio" +"23968","Zambia","ZMB","Hops","fabio" +"23969","Zambia","ZMB","Pepper","fabio" +"23970","Zambia","ZMB","Pimento","fabio" +"23971","Zambia","ZMB","Cloves","fabio" +"23972","Zambia","ZMB","Spices, Other","fabio" +"23973","Zambia","ZMB","Jute","fabio" +"23974","Zambia","ZMB","Jute-Like Fibres","fabio" +"23975","Zambia","ZMB","Soft-Fibres, Other","fabio" +"23976","Zambia","ZMB","Sisal","fabio" +"23977","Zambia","ZMB","Abaca","fabio" +"23978","Zambia","ZMB","Hard Fibres, Other","fabio" +"23979","Zambia","ZMB","Tobacco","fabio" +"23980","Zambia","ZMB","Rubber","fabio" +"23981","Zambia","ZMB","Fodder crops","fabio" +"23982","Zambia","ZMB","Grazing","fabio" +"23983","Zambia","ZMB","Cottonseed","fabio" +"23984","Zambia","ZMB","Palm kernels","fabio" +"23985","Zambia","ZMB","Sugar non-centrifugal","fabio" +"23986","Zambia","ZMB","Molasses","fabio" +"23987","Zambia","ZMB","Sugar, Refined Equiv","fabio" +"23988","Zambia","ZMB","Sweeteners, Other","fabio" +"23989","Zambia","ZMB","Soyabean Oil","fabio" +"23990","Zambia","ZMB","Groundnut Oil","fabio" +"23991","Zambia","ZMB","Sunflowerseed Oil","fabio" +"23992","Zambia","ZMB","Rape and Mustard Oil","fabio" +"23993","Zambia","ZMB","Cottonseed Oil","fabio" +"23994","Zambia","ZMB","Palmkernel Oil","fabio" +"23995","Zambia","ZMB","Palm Oil","fabio" +"23996","Zambia","ZMB","Coconut Oil","fabio" +"23997","Zambia","ZMB","Sesameseed Oil","fabio" +"23998","Zambia","ZMB","Olive Oil","fabio" +"23999","Zambia","ZMB","Ricebran Oil","fabio" +"24000","Zambia","ZMB","Maize Germ Oil","fabio" +"24001","Zambia","ZMB","Oilcrops Oil, Other","fabio" +"24002","Zambia","ZMB","Soyabean Cake","fabio" +"24003","Zambia","ZMB","Groundnut Cake","fabio" +"24004","Zambia","ZMB","Sunflowerseed Cake","fabio" +"24005","Zambia","ZMB","Rape and Mustard Cake","fabio" +"24006","Zambia","ZMB","Cottonseed Cake","fabio" +"24007","Zambia","ZMB","Palmkernel Cake","fabio" +"24008","Zambia","ZMB","Copra Cake","fabio" +"24009","Zambia","ZMB","Sesameseed Cake","fabio" +"24010","Zambia","ZMB","Oilseed Cakes, Other","fabio" +"24011","Zambia","ZMB","Wine","fabio" +"24012","Zambia","ZMB","Beer","fabio" +"24013","Zambia","ZMB","Beverages, Fermented","fabio" +"24014","Zambia","ZMB","Beverages, Alcoholic","fabio" +"24015","Zambia","ZMB","Alcohol, Non-Food","fabio" +"24016","Zambia","ZMB","Cotton lint","fabio" +"24017","Zambia","ZMB","Cattle","fabio" +"24018","Zambia","ZMB","Buffaloes","fabio" +"24019","Zambia","ZMB","Sheep","fabio" +"24020","Zambia","ZMB","Goats","fabio" +"24021","Zambia","ZMB","Pigs","fabio" +"24022","Zambia","ZMB","Poultry Birds","fabio" +"24023","Zambia","ZMB","Horses","fabio" +"24024","Zambia","ZMB","Asses","fabio" +"24025","Zambia","ZMB","Mules","fabio" +"24026","Zambia","ZMB","Camels","fabio" +"24027","Zambia","ZMB","Camelids, other","fabio" +"24028","Zambia","ZMB","Rabbits and hares","fabio" +"24029","Zambia","ZMB","Rodents, other","fabio" +"24030","Zambia","ZMB","Live animals, other","fabio" +"24031","Zambia","ZMB","Milk - Excluding Butter","fabio" +"24032","Zambia","ZMB","Butter, Ghee","fabio" +"24033","Zambia","ZMB","Eggs","fabio" +"24034","Zambia","ZMB","Wool (Clean Eq.)","fabio" +"24035","Zambia","ZMB","Bovine Meat","fabio" +"24036","Zambia","ZMB","Mutton & Goat Meat","fabio" +"24037","Zambia","ZMB","Pigmeat","fabio" +"24038","Zambia","ZMB","Poultry Meat","fabio" +"24039","Zambia","ZMB","Meat, Other","fabio" +"24040","Zambia","ZMB","Offals, Edible","fabio" +"24041","Zambia","ZMB","Fats, Animals, Raw","fabio" +"24042","Zambia","ZMB","Hides and skins","fabio" +"24043","Zambia","ZMB","Meat Meal","fabio" +"24044","Zambia","ZMB","Pet food","fabio" +"24045","Zambia","ZMB","Honey","fabio" +"24046","Zambia","ZMB","Silk","fabio" +"24047","Zambia","ZMB","Fish, Seafood","fabio" +"24048","Zambia","ZMB","Wood fuel","fabio" +"24049","Zambia","ZMB","Industrial roundwood, coniferous","fabio" +"24050","Zambia","ZMB","Industrial roundwood, non-coniferous","fabio" +"24051","Belgium","BEL","Rice (Milled Equivalent)","fabio" +"24052","Belgium","BEL","Wheat and products","fabio" +"24053","Belgium","BEL","Barley and products","fabio" +"24054","Belgium","BEL","Maize and products","fabio" +"24055","Belgium","BEL","Rye and products","fabio" +"24056","Belgium","BEL","Oats","fabio" +"24057","Belgium","BEL","Millet and products","fabio" +"24058","Belgium","BEL","Sorghum and products","fabio" +"24059","Belgium","BEL","Cereals, Other","fabio" +"24060","Belgium","BEL","Potatoes and products","fabio" +"24061","Belgium","BEL","Cassava and products","fabio" +"24062","Belgium","BEL","Sweet potatoes","fabio" +"24063","Belgium","BEL","Roots, Other","fabio" +"24064","Belgium","BEL","Yams","fabio" +"24065","Belgium","BEL","Sugar cane","fabio" +"24066","Belgium","BEL","Sugar beet","fabio" +"24067","Belgium","BEL","Beans","fabio" +"24068","Belgium","BEL","Peas","fabio" +"24069","Belgium","BEL","Pulses, Other and products","fabio" +"24070","Belgium","BEL","Nuts and products","fabio" +"24071","Belgium","BEL","Soyabeans","fabio" +"24072","Belgium","BEL","Groundnuts (Shelled Eq)","fabio" +"24073","Belgium","BEL","Sunflower seed","fabio" +"24074","Belgium","BEL","Rape and Mustardseed","fabio" +"24075","Belgium","BEL","Seed cotton","fabio" +"24076","Belgium","BEL","Coconuts - Incl Copra","fabio" +"24077","Belgium","BEL","Sesame seed","fabio" +"24078","Belgium","BEL","Oil, palm fruit","fabio" +"24079","Belgium","BEL","Olives (including preserved)","fabio" +"24080","Belgium","BEL","Oilcrops, Other","fabio" +"24081","Belgium","BEL","Tomatoes and products","fabio" +"24082","Belgium","BEL","Onions","fabio" +"24083","Belgium","BEL","Vegetables, Other","fabio" +"24084","Belgium","BEL","Oranges, Mandarines","fabio" +"24085","Belgium","BEL","Lemons, Limes and products","fabio" +"24086","Belgium","BEL","Grapefruit and products","fabio" +"24087","Belgium","BEL","Citrus, Other","fabio" +"24088","Belgium","BEL","Bananas","fabio" +"24089","Belgium","BEL","Plantains","fabio" +"24090","Belgium","BEL","Apples and products","fabio" +"24091","Belgium","BEL","Pineapples and products","fabio" +"24092","Belgium","BEL","Dates","fabio" +"24093","Belgium","BEL","Grapes and products (excl wine)","fabio" +"24094","Belgium","BEL","Fruits, Other","fabio" +"24095","Belgium","BEL","Coffee and products","fabio" +"24096","Belgium","BEL","Cocoa Beans and products","fabio" +"24097","Belgium","BEL","Tea (including mate)","fabio" +"24098","Belgium","BEL","Hops","fabio" +"24099","Belgium","BEL","Pepper","fabio" +"24100","Belgium","BEL","Pimento","fabio" +"24101","Belgium","BEL","Cloves","fabio" +"24102","Belgium","BEL","Spices, Other","fabio" +"24103","Belgium","BEL","Jute","fabio" +"24104","Belgium","BEL","Jute-Like Fibres","fabio" +"24105","Belgium","BEL","Soft-Fibres, Other","fabio" +"24106","Belgium","BEL","Sisal","fabio" +"24107","Belgium","BEL","Abaca","fabio" +"24108","Belgium","BEL","Hard Fibres, Other","fabio" +"24109","Belgium","BEL","Tobacco","fabio" +"24110","Belgium","BEL","Rubber","fabio" +"24111","Belgium","BEL","Fodder crops","fabio" +"24112","Belgium","BEL","Grazing","fabio" +"24113","Belgium","BEL","Cottonseed","fabio" +"24114","Belgium","BEL","Palm kernels","fabio" +"24115","Belgium","BEL","Sugar non-centrifugal","fabio" +"24116","Belgium","BEL","Molasses","fabio" +"24117","Belgium","BEL","Sugar, Refined Equiv","fabio" +"24118","Belgium","BEL","Sweeteners, Other","fabio" +"24119","Belgium","BEL","Soyabean Oil","fabio" +"24120","Belgium","BEL","Groundnut Oil","fabio" +"24121","Belgium","BEL","Sunflowerseed Oil","fabio" +"24122","Belgium","BEL","Rape and Mustard Oil","fabio" +"24123","Belgium","BEL","Cottonseed Oil","fabio" +"24124","Belgium","BEL","Palmkernel Oil","fabio" +"24125","Belgium","BEL","Palm Oil","fabio" +"24126","Belgium","BEL","Coconut Oil","fabio" +"24127","Belgium","BEL","Sesameseed Oil","fabio" +"24128","Belgium","BEL","Olive Oil","fabio" +"24129","Belgium","BEL","Ricebran Oil","fabio" +"24130","Belgium","BEL","Maize Germ Oil","fabio" +"24131","Belgium","BEL","Oilcrops Oil, Other","fabio" +"24132","Belgium","BEL","Soyabean Cake","fabio" +"24133","Belgium","BEL","Groundnut Cake","fabio" +"24134","Belgium","BEL","Sunflowerseed Cake","fabio" +"24135","Belgium","BEL","Rape and Mustard Cake","fabio" +"24136","Belgium","BEL","Cottonseed Cake","fabio" +"24137","Belgium","BEL","Palmkernel Cake","fabio" +"24138","Belgium","BEL","Copra Cake","fabio" +"24139","Belgium","BEL","Sesameseed Cake","fabio" +"24140","Belgium","BEL","Oilseed Cakes, Other","fabio" +"24141","Belgium","BEL","Wine","fabio" +"24142","Belgium","BEL","Beer","fabio" +"24143","Belgium","BEL","Beverages, Fermented","fabio" +"24144","Belgium","BEL","Beverages, Alcoholic","fabio" +"24145","Belgium","BEL","Alcohol, Non-Food","fabio" +"24146","Belgium","BEL","Cotton lint","fabio" +"24147","Belgium","BEL","Cattle","fabio" +"24148","Belgium","BEL","Buffaloes","fabio" +"24149","Belgium","BEL","Sheep","fabio" +"24150","Belgium","BEL","Goats","fabio" +"24151","Belgium","BEL","Pigs","fabio" +"24152","Belgium","BEL","Poultry Birds","fabio" +"24153","Belgium","BEL","Horses","fabio" +"24154","Belgium","BEL","Asses","fabio" +"24155","Belgium","BEL","Mules","fabio" +"24156","Belgium","BEL","Camels","fabio" +"24157","Belgium","BEL","Camelids, other","fabio" +"24158","Belgium","BEL","Rabbits and hares","fabio" +"24159","Belgium","BEL","Rodents, other","fabio" +"24160","Belgium","BEL","Live animals, other","fabio" +"24161","Belgium","BEL","Milk - Excluding Butter","fabio" +"24162","Belgium","BEL","Butter, Ghee","fabio" +"24163","Belgium","BEL","Eggs","fabio" +"24164","Belgium","BEL","Wool (Clean Eq.)","fabio" +"24165","Belgium","BEL","Bovine Meat","fabio" +"24166","Belgium","BEL","Mutton & Goat Meat","fabio" +"24167","Belgium","BEL","Pigmeat","fabio" +"24168","Belgium","BEL","Poultry Meat","fabio" +"24169","Belgium","BEL","Meat, Other","fabio" +"24170","Belgium","BEL","Offals, Edible","fabio" +"24171","Belgium","BEL","Fats, Animals, Raw","fabio" +"24172","Belgium","BEL","Hides and skins","fabio" +"24173","Belgium","BEL","Meat Meal","fabio" +"24174","Belgium","BEL","Pet food","fabio" +"24175","Belgium","BEL","Honey","fabio" +"24176","Belgium","BEL","Silk","fabio" +"24177","Belgium","BEL","Fish, Seafood","fabio" +"24178","Belgium","BEL","Wood fuel","fabio" +"24179","Belgium","BEL","Industrial roundwood, coniferous","fabio" +"24180","Belgium","BEL","Industrial roundwood, non-coniferous","fabio" +"24181","Luxembourg","LUX","Rice (Milled Equivalent)","fabio" +"24182","Luxembourg","LUX","Wheat and products","fabio" +"24183","Luxembourg","LUX","Barley and products","fabio" +"24184","Luxembourg","LUX","Maize and products","fabio" +"24185","Luxembourg","LUX","Rye and products","fabio" +"24186","Luxembourg","LUX","Oats","fabio" +"24187","Luxembourg","LUX","Millet and products","fabio" +"24188","Luxembourg","LUX","Sorghum and products","fabio" +"24189","Luxembourg","LUX","Cereals, Other","fabio" +"24190","Luxembourg","LUX","Potatoes and products","fabio" +"24191","Luxembourg","LUX","Cassava and products","fabio" +"24192","Luxembourg","LUX","Sweet potatoes","fabio" +"24193","Luxembourg","LUX","Roots, Other","fabio" +"24194","Luxembourg","LUX","Yams","fabio" +"24195","Luxembourg","LUX","Sugar cane","fabio" +"24196","Luxembourg","LUX","Sugar beet","fabio" +"24197","Luxembourg","LUX","Beans","fabio" +"24198","Luxembourg","LUX","Peas","fabio" +"24199","Luxembourg","LUX","Pulses, Other and products","fabio" +"24200","Luxembourg","LUX","Nuts and products","fabio" +"24201","Luxembourg","LUX","Soyabeans","fabio" +"24202","Luxembourg","LUX","Groundnuts (Shelled Eq)","fabio" +"24203","Luxembourg","LUX","Sunflower seed","fabio" +"24204","Luxembourg","LUX","Rape and Mustardseed","fabio" +"24205","Luxembourg","LUX","Seed cotton","fabio" +"24206","Luxembourg","LUX","Coconuts - Incl Copra","fabio" +"24207","Luxembourg","LUX","Sesame seed","fabio" +"24208","Luxembourg","LUX","Oil, palm fruit","fabio" +"24209","Luxembourg","LUX","Olives (including preserved)","fabio" +"24210","Luxembourg","LUX","Oilcrops, Other","fabio" +"24211","Luxembourg","LUX","Tomatoes and products","fabio" +"24212","Luxembourg","LUX","Onions","fabio" +"24213","Luxembourg","LUX","Vegetables, Other","fabio" +"24214","Luxembourg","LUX","Oranges, Mandarines","fabio" +"24215","Luxembourg","LUX","Lemons, Limes and products","fabio" +"24216","Luxembourg","LUX","Grapefruit and products","fabio" +"24217","Luxembourg","LUX","Citrus, Other","fabio" +"24218","Luxembourg","LUX","Bananas","fabio" +"24219","Luxembourg","LUX","Plantains","fabio" +"24220","Luxembourg","LUX","Apples and products","fabio" +"24221","Luxembourg","LUX","Pineapples and products","fabio" +"24222","Luxembourg","LUX","Dates","fabio" +"24223","Luxembourg","LUX","Grapes and products (excl wine)","fabio" +"24224","Luxembourg","LUX","Fruits, Other","fabio" +"24225","Luxembourg","LUX","Coffee and products","fabio" +"24226","Luxembourg","LUX","Cocoa Beans and products","fabio" +"24227","Luxembourg","LUX","Tea (including mate)","fabio" +"24228","Luxembourg","LUX","Hops","fabio" +"24229","Luxembourg","LUX","Pepper","fabio" +"24230","Luxembourg","LUX","Pimento","fabio" +"24231","Luxembourg","LUX","Cloves","fabio" +"24232","Luxembourg","LUX","Spices, Other","fabio" +"24233","Luxembourg","LUX","Jute","fabio" +"24234","Luxembourg","LUX","Jute-Like Fibres","fabio" +"24235","Luxembourg","LUX","Soft-Fibres, Other","fabio" +"24236","Luxembourg","LUX","Sisal","fabio" +"24237","Luxembourg","LUX","Abaca","fabio" +"24238","Luxembourg","LUX","Hard Fibres, Other","fabio" +"24239","Luxembourg","LUX","Tobacco","fabio" +"24240","Luxembourg","LUX","Rubber","fabio" +"24241","Luxembourg","LUX","Fodder crops","fabio" +"24242","Luxembourg","LUX","Grazing","fabio" +"24243","Luxembourg","LUX","Cottonseed","fabio" +"24244","Luxembourg","LUX","Palm kernels","fabio" +"24245","Luxembourg","LUX","Sugar non-centrifugal","fabio" +"24246","Luxembourg","LUX","Molasses","fabio" +"24247","Luxembourg","LUX","Sugar, Refined Equiv","fabio" +"24248","Luxembourg","LUX","Sweeteners, Other","fabio" +"24249","Luxembourg","LUX","Soyabean Oil","fabio" +"24250","Luxembourg","LUX","Groundnut Oil","fabio" +"24251","Luxembourg","LUX","Sunflowerseed Oil","fabio" +"24252","Luxembourg","LUX","Rape and Mustard Oil","fabio" +"24253","Luxembourg","LUX","Cottonseed Oil","fabio" +"24254","Luxembourg","LUX","Palmkernel Oil","fabio" +"24255","Luxembourg","LUX","Palm Oil","fabio" +"24256","Luxembourg","LUX","Coconut Oil","fabio" +"24257","Luxembourg","LUX","Sesameseed Oil","fabio" +"24258","Luxembourg","LUX","Olive Oil","fabio" +"24259","Luxembourg","LUX","Ricebran Oil","fabio" +"24260","Luxembourg","LUX","Maize Germ Oil","fabio" +"24261","Luxembourg","LUX","Oilcrops Oil, Other","fabio" +"24262","Luxembourg","LUX","Soyabean Cake","fabio" +"24263","Luxembourg","LUX","Groundnut Cake","fabio" +"24264","Luxembourg","LUX","Sunflowerseed Cake","fabio" +"24265","Luxembourg","LUX","Rape and Mustard Cake","fabio" +"24266","Luxembourg","LUX","Cottonseed Cake","fabio" +"24267","Luxembourg","LUX","Palmkernel Cake","fabio" +"24268","Luxembourg","LUX","Copra Cake","fabio" +"24269","Luxembourg","LUX","Sesameseed Cake","fabio" +"24270","Luxembourg","LUX","Oilseed Cakes, Other","fabio" +"24271","Luxembourg","LUX","Wine","fabio" +"24272","Luxembourg","LUX","Beer","fabio" +"24273","Luxembourg","LUX","Beverages, Fermented","fabio" +"24274","Luxembourg","LUX","Beverages, Alcoholic","fabio" +"24275","Luxembourg","LUX","Alcohol, Non-Food","fabio" +"24276","Luxembourg","LUX","Cotton lint","fabio" +"24277","Luxembourg","LUX","Cattle","fabio" +"24278","Luxembourg","LUX","Buffaloes","fabio" +"24279","Luxembourg","LUX","Sheep","fabio" +"24280","Luxembourg","LUX","Goats","fabio" +"24281","Luxembourg","LUX","Pigs","fabio" +"24282","Luxembourg","LUX","Poultry Birds","fabio" +"24283","Luxembourg","LUX","Horses","fabio" +"24284","Luxembourg","LUX","Asses","fabio" +"24285","Luxembourg","LUX","Mules","fabio" +"24286","Luxembourg","LUX","Camels","fabio" +"24287","Luxembourg","LUX","Camelids, other","fabio" +"24288","Luxembourg","LUX","Rabbits and hares","fabio" +"24289","Luxembourg","LUX","Rodents, other","fabio" +"24290","Luxembourg","LUX","Live animals, other","fabio" +"24291","Luxembourg","LUX","Milk - Excluding Butter","fabio" +"24292","Luxembourg","LUX","Butter, Ghee","fabio" +"24293","Luxembourg","LUX","Eggs","fabio" +"24294","Luxembourg","LUX","Wool (Clean Eq.)","fabio" +"24295","Luxembourg","LUX","Bovine Meat","fabio" +"24296","Luxembourg","LUX","Mutton & Goat Meat","fabio" +"24297","Luxembourg","LUX","Pigmeat","fabio" +"24298","Luxembourg","LUX","Poultry Meat","fabio" +"24299","Luxembourg","LUX","Meat, Other","fabio" +"24300","Luxembourg","LUX","Offals, Edible","fabio" +"24301","Luxembourg","LUX","Fats, Animals, Raw","fabio" +"24302","Luxembourg","LUX","Hides and skins","fabio" +"24303","Luxembourg","LUX","Meat Meal","fabio" +"24304","Luxembourg","LUX","Pet food","fabio" +"24305","Luxembourg","LUX","Honey","fabio" +"24306","Luxembourg","LUX","Silk","fabio" +"24307","Luxembourg","LUX","Fish, Seafood","fabio" +"24308","Luxembourg","LUX","Wood fuel","fabio" +"24309","Luxembourg","LUX","Industrial roundwood, coniferous","fabio" +"24310","Luxembourg","LUX","Industrial roundwood, non-coniferous","fabio" +"24311","Serbia","SRB","Rice (Milled Equivalent)","fabio" +"24312","Serbia","SRB","Wheat and products","fabio" +"24313","Serbia","SRB","Barley and products","fabio" +"24314","Serbia","SRB","Maize and products","fabio" +"24315","Serbia","SRB","Rye and products","fabio" +"24316","Serbia","SRB","Oats","fabio" +"24317","Serbia","SRB","Millet and products","fabio" +"24318","Serbia","SRB","Sorghum and products","fabio" +"24319","Serbia","SRB","Cereals, Other","fabio" +"24320","Serbia","SRB","Potatoes and products","fabio" +"24321","Serbia","SRB","Cassava and products","fabio" +"24322","Serbia","SRB","Sweet potatoes","fabio" +"24323","Serbia","SRB","Roots, Other","fabio" +"24324","Serbia","SRB","Yams","fabio" +"24325","Serbia","SRB","Sugar cane","fabio" +"24326","Serbia","SRB","Sugar beet","fabio" +"24327","Serbia","SRB","Beans","fabio" +"24328","Serbia","SRB","Peas","fabio" +"24329","Serbia","SRB","Pulses, Other and products","fabio" +"24330","Serbia","SRB","Nuts and products","fabio" +"24331","Serbia","SRB","Soyabeans","fabio" +"24332","Serbia","SRB","Groundnuts (Shelled Eq)","fabio" +"24333","Serbia","SRB","Sunflower seed","fabio" +"24334","Serbia","SRB","Rape and Mustardseed","fabio" +"24335","Serbia","SRB","Seed cotton","fabio" +"24336","Serbia","SRB","Coconuts - Incl Copra","fabio" +"24337","Serbia","SRB","Sesame seed","fabio" +"24338","Serbia","SRB","Oil, palm fruit","fabio" +"24339","Serbia","SRB","Olives (including preserved)","fabio" +"24340","Serbia","SRB","Oilcrops, Other","fabio" +"24341","Serbia","SRB","Tomatoes and products","fabio" +"24342","Serbia","SRB","Onions","fabio" +"24343","Serbia","SRB","Vegetables, Other","fabio" +"24344","Serbia","SRB","Oranges, Mandarines","fabio" +"24345","Serbia","SRB","Lemons, Limes and products","fabio" +"24346","Serbia","SRB","Grapefruit and products","fabio" +"24347","Serbia","SRB","Citrus, Other","fabio" +"24348","Serbia","SRB","Bananas","fabio" +"24349","Serbia","SRB","Plantains","fabio" +"24350","Serbia","SRB","Apples and products","fabio" +"24351","Serbia","SRB","Pineapples and products","fabio" +"24352","Serbia","SRB","Dates","fabio" +"24353","Serbia","SRB","Grapes and products (excl wine)","fabio" +"24354","Serbia","SRB","Fruits, Other","fabio" +"24355","Serbia","SRB","Coffee and products","fabio" +"24356","Serbia","SRB","Cocoa Beans and products","fabio" +"24357","Serbia","SRB","Tea (including mate)","fabio" +"24358","Serbia","SRB","Hops","fabio" +"24359","Serbia","SRB","Pepper","fabio" +"24360","Serbia","SRB","Pimento","fabio" +"24361","Serbia","SRB","Cloves","fabio" +"24362","Serbia","SRB","Spices, Other","fabio" +"24363","Serbia","SRB","Jute","fabio" +"24364","Serbia","SRB","Jute-Like Fibres","fabio" +"24365","Serbia","SRB","Soft-Fibres, Other","fabio" +"24366","Serbia","SRB","Sisal","fabio" +"24367","Serbia","SRB","Abaca","fabio" +"24368","Serbia","SRB","Hard Fibres, Other","fabio" +"24369","Serbia","SRB","Tobacco","fabio" +"24370","Serbia","SRB","Rubber","fabio" +"24371","Serbia","SRB","Fodder crops","fabio" +"24372","Serbia","SRB","Grazing","fabio" +"24373","Serbia","SRB","Cottonseed","fabio" +"24374","Serbia","SRB","Palm kernels","fabio" +"24375","Serbia","SRB","Sugar non-centrifugal","fabio" +"24376","Serbia","SRB","Molasses","fabio" +"24377","Serbia","SRB","Sugar, Refined Equiv","fabio" +"24378","Serbia","SRB","Sweeteners, Other","fabio" +"24379","Serbia","SRB","Soyabean Oil","fabio" +"24380","Serbia","SRB","Groundnut Oil","fabio" +"24381","Serbia","SRB","Sunflowerseed Oil","fabio" +"24382","Serbia","SRB","Rape and Mustard Oil","fabio" +"24383","Serbia","SRB","Cottonseed Oil","fabio" +"24384","Serbia","SRB","Palmkernel Oil","fabio" +"24385","Serbia","SRB","Palm Oil","fabio" +"24386","Serbia","SRB","Coconut Oil","fabio" +"24387","Serbia","SRB","Sesameseed Oil","fabio" +"24388","Serbia","SRB","Olive Oil","fabio" +"24389","Serbia","SRB","Ricebran Oil","fabio" +"24390","Serbia","SRB","Maize Germ Oil","fabio" +"24391","Serbia","SRB","Oilcrops Oil, Other","fabio" +"24392","Serbia","SRB","Soyabean Cake","fabio" +"24393","Serbia","SRB","Groundnut Cake","fabio" +"24394","Serbia","SRB","Sunflowerseed Cake","fabio" +"24395","Serbia","SRB","Rape and Mustard Cake","fabio" +"24396","Serbia","SRB","Cottonseed Cake","fabio" +"24397","Serbia","SRB","Palmkernel Cake","fabio" +"24398","Serbia","SRB","Copra Cake","fabio" +"24399","Serbia","SRB","Sesameseed Cake","fabio" +"24400","Serbia","SRB","Oilseed Cakes, Other","fabio" +"24401","Serbia","SRB","Wine","fabio" +"24402","Serbia","SRB","Beer","fabio" +"24403","Serbia","SRB","Beverages, Fermented","fabio" +"24404","Serbia","SRB","Beverages, Alcoholic","fabio" +"24405","Serbia","SRB","Alcohol, Non-Food","fabio" +"24406","Serbia","SRB","Cotton lint","fabio" +"24407","Serbia","SRB","Cattle","fabio" +"24408","Serbia","SRB","Buffaloes","fabio" +"24409","Serbia","SRB","Sheep","fabio" +"24410","Serbia","SRB","Goats","fabio" +"24411","Serbia","SRB","Pigs","fabio" +"24412","Serbia","SRB","Poultry Birds","fabio" +"24413","Serbia","SRB","Horses","fabio" +"24414","Serbia","SRB","Asses","fabio" +"24415","Serbia","SRB","Mules","fabio" +"24416","Serbia","SRB","Camels","fabio" +"24417","Serbia","SRB","Camelids, other","fabio" +"24418","Serbia","SRB","Rabbits and hares","fabio" +"24419","Serbia","SRB","Rodents, other","fabio" +"24420","Serbia","SRB","Live animals, other","fabio" +"24421","Serbia","SRB","Milk - Excluding Butter","fabio" +"24422","Serbia","SRB","Butter, Ghee","fabio" +"24423","Serbia","SRB","Eggs","fabio" +"24424","Serbia","SRB","Wool (Clean Eq.)","fabio" +"24425","Serbia","SRB","Bovine Meat","fabio" +"24426","Serbia","SRB","Mutton & Goat Meat","fabio" +"24427","Serbia","SRB","Pigmeat","fabio" +"24428","Serbia","SRB","Poultry Meat","fabio" +"24429","Serbia","SRB","Meat, Other","fabio" +"24430","Serbia","SRB","Offals, Edible","fabio" +"24431","Serbia","SRB","Fats, Animals, Raw","fabio" +"24432","Serbia","SRB","Hides and skins","fabio" +"24433","Serbia","SRB","Meat Meal","fabio" +"24434","Serbia","SRB","Pet food","fabio" +"24435","Serbia","SRB","Honey","fabio" +"24436","Serbia","SRB","Silk","fabio" +"24437","Serbia","SRB","Fish, Seafood","fabio" +"24438","Serbia","SRB","Wood fuel","fabio" +"24439","Serbia","SRB","Industrial roundwood, coniferous","fabio" +"24440","Serbia","SRB","Industrial roundwood, non-coniferous","fabio" +"24441","Montenegro","MNE","Rice (Milled Equivalent)","fabio" +"24442","Montenegro","MNE","Wheat and products","fabio" +"24443","Montenegro","MNE","Barley and products","fabio" +"24444","Montenegro","MNE","Maize and products","fabio" +"24445","Montenegro","MNE","Rye and products","fabio" +"24446","Montenegro","MNE","Oats","fabio" +"24447","Montenegro","MNE","Millet and products","fabio" +"24448","Montenegro","MNE","Sorghum and products","fabio" +"24449","Montenegro","MNE","Cereals, Other","fabio" +"24450","Montenegro","MNE","Potatoes and products","fabio" +"24451","Montenegro","MNE","Cassava and products","fabio" +"24452","Montenegro","MNE","Sweet potatoes","fabio" +"24453","Montenegro","MNE","Roots, Other","fabio" +"24454","Montenegro","MNE","Yams","fabio" +"24455","Montenegro","MNE","Sugar cane","fabio" +"24456","Montenegro","MNE","Sugar beet","fabio" +"24457","Montenegro","MNE","Beans","fabio" +"24458","Montenegro","MNE","Peas","fabio" +"24459","Montenegro","MNE","Pulses, Other and products","fabio" +"24460","Montenegro","MNE","Nuts and products","fabio" +"24461","Montenegro","MNE","Soyabeans","fabio" +"24462","Montenegro","MNE","Groundnuts (Shelled Eq)","fabio" +"24463","Montenegro","MNE","Sunflower seed","fabio" +"24464","Montenegro","MNE","Rape and Mustardseed","fabio" +"24465","Montenegro","MNE","Seed cotton","fabio" +"24466","Montenegro","MNE","Coconuts - Incl Copra","fabio" +"24467","Montenegro","MNE","Sesame seed","fabio" +"24468","Montenegro","MNE","Oil, palm fruit","fabio" +"24469","Montenegro","MNE","Olives (including preserved)","fabio" +"24470","Montenegro","MNE","Oilcrops, Other","fabio" +"24471","Montenegro","MNE","Tomatoes and products","fabio" +"24472","Montenegro","MNE","Onions","fabio" +"24473","Montenegro","MNE","Vegetables, Other","fabio" +"24474","Montenegro","MNE","Oranges, Mandarines","fabio" +"24475","Montenegro","MNE","Lemons, Limes and products","fabio" +"24476","Montenegro","MNE","Grapefruit and products","fabio" +"24477","Montenegro","MNE","Citrus, Other","fabio" +"24478","Montenegro","MNE","Bananas","fabio" +"24479","Montenegro","MNE","Plantains","fabio" +"24480","Montenegro","MNE","Apples and products","fabio" +"24481","Montenegro","MNE","Pineapples and products","fabio" +"24482","Montenegro","MNE","Dates","fabio" +"24483","Montenegro","MNE","Grapes and products (excl wine)","fabio" +"24484","Montenegro","MNE","Fruits, Other","fabio" +"24485","Montenegro","MNE","Coffee and products","fabio" +"24486","Montenegro","MNE","Cocoa Beans and products","fabio" +"24487","Montenegro","MNE","Tea (including mate)","fabio" +"24488","Montenegro","MNE","Hops","fabio" +"24489","Montenegro","MNE","Pepper","fabio" +"24490","Montenegro","MNE","Pimento","fabio" +"24491","Montenegro","MNE","Cloves","fabio" +"24492","Montenegro","MNE","Spices, Other","fabio" +"24493","Montenegro","MNE","Jute","fabio" +"24494","Montenegro","MNE","Jute-Like Fibres","fabio" +"24495","Montenegro","MNE","Soft-Fibres, Other","fabio" +"24496","Montenegro","MNE","Sisal","fabio" +"24497","Montenegro","MNE","Abaca","fabio" +"24498","Montenegro","MNE","Hard Fibres, Other","fabio" +"24499","Montenegro","MNE","Tobacco","fabio" +"24500","Montenegro","MNE","Rubber","fabio" +"24501","Montenegro","MNE","Fodder crops","fabio" +"24502","Montenegro","MNE","Grazing","fabio" +"24503","Montenegro","MNE","Cottonseed","fabio" +"24504","Montenegro","MNE","Palm kernels","fabio" +"24505","Montenegro","MNE","Sugar non-centrifugal","fabio" +"24506","Montenegro","MNE","Molasses","fabio" +"24507","Montenegro","MNE","Sugar, Refined Equiv","fabio" +"24508","Montenegro","MNE","Sweeteners, Other","fabio" +"24509","Montenegro","MNE","Soyabean Oil","fabio" +"24510","Montenegro","MNE","Groundnut Oil","fabio" +"24511","Montenegro","MNE","Sunflowerseed Oil","fabio" +"24512","Montenegro","MNE","Rape and Mustard Oil","fabio" +"24513","Montenegro","MNE","Cottonseed Oil","fabio" +"24514","Montenegro","MNE","Palmkernel Oil","fabio" +"24515","Montenegro","MNE","Palm Oil","fabio" +"24516","Montenegro","MNE","Coconut Oil","fabio" +"24517","Montenegro","MNE","Sesameseed Oil","fabio" +"24518","Montenegro","MNE","Olive Oil","fabio" +"24519","Montenegro","MNE","Ricebran Oil","fabio" +"24520","Montenegro","MNE","Maize Germ Oil","fabio" +"24521","Montenegro","MNE","Oilcrops Oil, Other","fabio" +"24522","Montenegro","MNE","Soyabean Cake","fabio" +"24523","Montenegro","MNE","Groundnut Cake","fabio" +"24524","Montenegro","MNE","Sunflowerseed Cake","fabio" +"24525","Montenegro","MNE","Rape and Mustard Cake","fabio" +"24526","Montenegro","MNE","Cottonseed Cake","fabio" +"24527","Montenegro","MNE","Palmkernel Cake","fabio" +"24528","Montenegro","MNE","Copra Cake","fabio" +"24529","Montenegro","MNE","Sesameseed Cake","fabio" +"24530","Montenegro","MNE","Oilseed Cakes, Other","fabio" +"24531","Montenegro","MNE","Wine","fabio" +"24532","Montenegro","MNE","Beer","fabio" +"24533","Montenegro","MNE","Beverages, Fermented","fabio" +"24534","Montenegro","MNE","Beverages, Alcoholic","fabio" +"24535","Montenegro","MNE","Alcohol, Non-Food","fabio" +"24536","Montenegro","MNE","Cotton lint","fabio" +"24537","Montenegro","MNE","Cattle","fabio" +"24538","Montenegro","MNE","Buffaloes","fabio" +"24539","Montenegro","MNE","Sheep","fabio" +"24540","Montenegro","MNE","Goats","fabio" +"24541","Montenegro","MNE","Pigs","fabio" +"24542","Montenegro","MNE","Poultry Birds","fabio" +"24543","Montenegro","MNE","Horses","fabio" +"24544","Montenegro","MNE","Asses","fabio" +"24545","Montenegro","MNE","Mules","fabio" +"24546","Montenegro","MNE","Camels","fabio" +"24547","Montenegro","MNE","Camelids, other","fabio" +"24548","Montenegro","MNE","Rabbits and hares","fabio" +"24549","Montenegro","MNE","Rodents, other","fabio" +"24550","Montenegro","MNE","Live animals, other","fabio" +"24551","Montenegro","MNE","Milk - Excluding Butter","fabio" +"24552","Montenegro","MNE","Butter, Ghee","fabio" +"24553","Montenegro","MNE","Eggs","fabio" +"24554","Montenegro","MNE","Wool (Clean Eq.)","fabio" +"24555","Montenegro","MNE","Bovine Meat","fabio" +"24556","Montenegro","MNE","Mutton & Goat Meat","fabio" +"24557","Montenegro","MNE","Pigmeat","fabio" +"24558","Montenegro","MNE","Poultry Meat","fabio" +"24559","Montenegro","MNE","Meat, Other","fabio" +"24560","Montenegro","MNE","Offals, Edible","fabio" +"24561","Montenegro","MNE","Fats, Animals, Raw","fabio" +"24562","Montenegro","MNE","Hides and skins","fabio" +"24563","Montenegro","MNE","Meat Meal","fabio" +"24564","Montenegro","MNE","Pet food","fabio" +"24565","Montenegro","MNE","Honey","fabio" +"24566","Montenegro","MNE","Silk","fabio" +"24567","Montenegro","MNE","Fish, Seafood","fabio" +"24568","Montenegro","MNE","Wood fuel","fabio" +"24569","Montenegro","MNE","Industrial roundwood, coniferous","fabio" +"24570","Montenegro","MNE","Industrial roundwood, non-coniferous","fabio" +"24571","Sudan","SDN","Rice (Milled Equivalent)","fabio" +"24572","Sudan","SDN","Wheat and products","fabio" +"24573","Sudan","SDN","Barley and products","fabio" +"24574","Sudan","SDN","Maize and products","fabio" +"24575","Sudan","SDN","Rye and products","fabio" +"24576","Sudan","SDN","Oats","fabio" +"24577","Sudan","SDN","Millet and products","fabio" +"24578","Sudan","SDN","Sorghum and products","fabio" +"24579","Sudan","SDN","Cereals, Other","fabio" +"24580","Sudan","SDN","Potatoes and products","fabio" +"24581","Sudan","SDN","Cassava and products","fabio" +"24582","Sudan","SDN","Sweet potatoes","fabio" +"24583","Sudan","SDN","Roots, Other","fabio" +"24584","Sudan","SDN","Yams","fabio" +"24585","Sudan","SDN","Sugar cane","fabio" +"24586","Sudan","SDN","Sugar beet","fabio" +"24587","Sudan","SDN","Beans","fabio" +"24588","Sudan","SDN","Peas","fabio" +"24589","Sudan","SDN","Pulses, Other and products","fabio" +"24590","Sudan","SDN","Nuts and products","fabio" +"24591","Sudan","SDN","Soyabeans","fabio" +"24592","Sudan","SDN","Groundnuts (Shelled Eq)","fabio" +"24593","Sudan","SDN","Sunflower seed","fabio" +"24594","Sudan","SDN","Rape and Mustardseed","fabio" +"24595","Sudan","SDN","Seed cotton","fabio" +"24596","Sudan","SDN","Coconuts - Incl Copra","fabio" +"24597","Sudan","SDN","Sesame seed","fabio" +"24598","Sudan","SDN","Oil, palm fruit","fabio" +"24599","Sudan","SDN","Olives (including preserved)","fabio" +"24600","Sudan","SDN","Oilcrops, Other","fabio" +"24601","Sudan","SDN","Tomatoes and products","fabio" +"24602","Sudan","SDN","Onions","fabio" +"24603","Sudan","SDN","Vegetables, Other","fabio" +"24604","Sudan","SDN","Oranges, Mandarines","fabio" +"24605","Sudan","SDN","Lemons, Limes and products","fabio" +"24606","Sudan","SDN","Grapefruit and products","fabio" +"24607","Sudan","SDN","Citrus, Other","fabio" +"24608","Sudan","SDN","Bananas","fabio" +"24609","Sudan","SDN","Plantains","fabio" +"24610","Sudan","SDN","Apples and products","fabio" +"24611","Sudan","SDN","Pineapples and products","fabio" +"24612","Sudan","SDN","Dates","fabio" +"24613","Sudan","SDN","Grapes and products (excl wine)","fabio" +"24614","Sudan","SDN","Fruits, Other","fabio" +"24615","Sudan","SDN","Coffee and products","fabio" +"24616","Sudan","SDN","Cocoa Beans and products","fabio" +"24617","Sudan","SDN","Tea (including mate)","fabio" +"24618","Sudan","SDN","Hops","fabio" +"24619","Sudan","SDN","Pepper","fabio" +"24620","Sudan","SDN","Pimento","fabio" +"24621","Sudan","SDN","Cloves","fabio" +"24622","Sudan","SDN","Spices, Other","fabio" +"24623","Sudan","SDN","Jute","fabio" +"24624","Sudan","SDN","Jute-Like Fibres","fabio" +"24625","Sudan","SDN","Soft-Fibres, Other","fabio" +"24626","Sudan","SDN","Sisal","fabio" +"24627","Sudan","SDN","Abaca","fabio" +"24628","Sudan","SDN","Hard Fibres, Other","fabio" +"24629","Sudan","SDN","Tobacco","fabio" +"24630","Sudan","SDN","Rubber","fabio" +"24631","Sudan","SDN","Fodder crops","fabio" +"24632","Sudan","SDN","Grazing","fabio" +"24633","Sudan","SDN","Cottonseed","fabio" +"24634","Sudan","SDN","Palm kernels","fabio" +"24635","Sudan","SDN","Sugar non-centrifugal","fabio" +"24636","Sudan","SDN","Molasses","fabio" +"24637","Sudan","SDN","Sugar, Refined Equiv","fabio" +"24638","Sudan","SDN","Sweeteners, Other","fabio" +"24639","Sudan","SDN","Soyabean Oil","fabio" +"24640","Sudan","SDN","Groundnut Oil","fabio" +"24641","Sudan","SDN","Sunflowerseed Oil","fabio" +"24642","Sudan","SDN","Rape and Mustard Oil","fabio" +"24643","Sudan","SDN","Cottonseed Oil","fabio" +"24644","Sudan","SDN","Palmkernel Oil","fabio" +"24645","Sudan","SDN","Palm Oil","fabio" +"24646","Sudan","SDN","Coconut Oil","fabio" +"24647","Sudan","SDN","Sesameseed Oil","fabio" +"24648","Sudan","SDN","Olive Oil","fabio" +"24649","Sudan","SDN","Ricebran Oil","fabio" +"24650","Sudan","SDN","Maize Germ Oil","fabio" +"24651","Sudan","SDN","Oilcrops Oil, Other","fabio" +"24652","Sudan","SDN","Soyabean Cake","fabio" +"24653","Sudan","SDN","Groundnut Cake","fabio" +"24654","Sudan","SDN","Sunflowerseed Cake","fabio" +"24655","Sudan","SDN","Rape and Mustard Cake","fabio" +"24656","Sudan","SDN","Cottonseed Cake","fabio" +"24657","Sudan","SDN","Palmkernel Cake","fabio" +"24658","Sudan","SDN","Copra Cake","fabio" +"24659","Sudan","SDN","Sesameseed Cake","fabio" +"24660","Sudan","SDN","Oilseed Cakes, Other","fabio" +"24661","Sudan","SDN","Wine","fabio" +"24662","Sudan","SDN","Beer","fabio" +"24663","Sudan","SDN","Beverages, Fermented","fabio" +"24664","Sudan","SDN","Beverages, Alcoholic","fabio" +"24665","Sudan","SDN","Alcohol, Non-Food","fabio" +"24666","Sudan","SDN","Cotton lint","fabio" +"24667","Sudan","SDN","Cattle","fabio" +"24668","Sudan","SDN","Buffaloes","fabio" +"24669","Sudan","SDN","Sheep","fabio" +"24670","Sudan","SDN","Goats","fabio" +"24671","Sudan","SDN","Pigs","fabio" +"24672","Sudan","SDN","Poultry Birds","fabio" +"24673","Sudan","SDN","Horses","fabio" +"24674","Sudan","SDN","Asses","fabio" +"24675","Sudan","SDN","Mules","fabio" +"24676","Sudan","SDN","Camels","fabio" +"24677","Sudan","SDN","Camelids, other","fabio" +"24678","Sudan","SDN","Rabbits and hares","fabio" +"24679","Sudan","SDN","Rodents, other","fabio" +"24680","Sudan","SDN","Live animals, other","fabio" +"24681","Sudan","SDN","Milk - Excluding Butter","fabio" +"24682","Sudan","SDN","Butter, Ghee","fabio" +"24683","Sudan","SDN","Eggs","fabio" +"24684","Sudan","SDN","Wool (Clean Eq.)","fabio" +"24685","Sudan","SDN","Bovine Meat","fabio" +"24686","Sudan","SDN","Mutton & Goat Meat","fabio" +"24687","Sudan","SDN","Pigmeat","fabio" +"24688","Sudan","SDN","Poultry Meat","fabio" +"24689","Sudan","SDN","Meat, Other","fabio" +"24690","Sudan","SDN","Offals, Edible","fabio" +"24691","Sudan","SDN","Fats, Animals, Raw","fabio" +"24692","Sudan","SDN","Hides and skins","fabio" +"24693","Sudan","SDN","Meat Meal","fabio" +"24694","Sudan","SDN","Pet food","fabio" +"24695","Sudan","SDN","Honey","fabio" +"24696","Sudan","SDN","Silk","fabio" +"24697","Sudan","SDN","Fish, Seafood","fabio" +"24698","Sudan","SDN","Wood fuel","fabio" +"24699","Sudan","SDN","Industrial roundwood, coniferous","fabio" +"24700","Sudan","SDN","Industrial roundwood, non-coniferous","fabio" +"24701","South Sudan","SSD","Rice (Milled Equivalent)","fabio" +"24702","South Sudan","SSD","Wheat and products","fabio" +"24703","South Sudan","SSD","Barley and products","fabio" +"24704","South Sudan","SSD","Maize and products","fabio" +"24705","South Sudan","SSD","Rye and products","fabio" +"24706","South Sudan","SSD","Oats","fabio" +"24707","South Sudan","SSD","Millet and products","fabio" +"24708","South Sudan","SSD","Sorghum and products","fabio" +"24709","South Sudan","SSD","Cereals, Other","fabio" +"24710","South Sudan","SSD","Potatoes and products","fabio" +"24711","South Sudan","SSD","Cassava and products","fabio" +"24712","South Sudan","SSD","Sweet potatoes","fabio" +"24713","South Sudan","SSD","Roots, Other","fabio" +"24714","South Sudan","SSD","Yams","fabio" +"24715","South Sudan","SSD","Sugar cane","fabio" +"24716","South Sudan","SSD","Sugar beet","fabio" +"24717","South Sudan","SSD","Beans","fabio" +"24718","South Sudan","SSD","Peas","fabio" +"24719","South Sudan","SSD","Pulses, Other and products","fabio" +"24720","South Sudan","SSD","Nuts and products","fabio" +"24721","South Sudan","SSD","Soyabeans","fabio" +"24722","South Sudan","SSD","Groundnuts (Shelled Eq)","fabio" +"24723","South Sudan","SSD","Sunflower seed","fabio" +"24724","South Sudan","SSD","Rape and Mustardseed","fabio" +"24725","South Sudan","SSD","Seed cotton","fabio" +"24726","South Sudan","SSD","Coconuts - Incl Copra","fabio" +"24727","South Sudan","SSD","Sesame seed","fabio" +"24728","South Sudan","SSD","Oil, palm fruit","fabio" +"24729","South Sudan","SSD","Olives (including preserved)","fabio" +"24730","South Sudan","SSD","Oilcrops, Other","fabio" +"24731","South Sudan","SSD","Tomatoes and products","fabio" +"24732","South Sudan","SSD","Onions","fabio" +"24733","South Sudan","SSD","Vegetables, Other","fabio" +"24734","South Sudan","SSD","Oranges, Mandarines","fabio" +"24735","South Sudan","SSD","Lemons, Limes and products","fabio" +"24736","South Sudan","SSD","Grapefruit and products","fabio" +"24737","South Sudan","SSD","Citrus, Other","fabio" +"24738","South Sudan","SSD","Bananas","fabio" +"24739","South Sudan","SSD","Plantains","fabio" +"24740","South Sudan","SSD","Apples and products","fabio" +"24741","South Sudan","SSD","Pineapples and products","fabio" +"24742","South Sudan","SSD","Dates","fabio" +"24743","South Sudan","SSD","Grapes and products (excl wine)","fabio" +"24744","South Sudan","SSD","Fruits, Other","fabio" +"24745","South Sudan","SSD","Coffee and products","fabio" +"24746","South Sudan","SSD","Cocoa Beans and products","fabio" +"24747","South Sudan","SSD","Tea (including mate)","fabio" +"24748","South Sudan","SSD","Hops","fabio" +"24749","South Sudan","SSD","Pepper","fabio" +"24750","South Sudan","SSD","Pimento","fabio" +"24751","South Sudan","SSD","Cloves","fabio" +"24752","South Sudan","SSD","Spices, Other","fabio" +"24753","South Sudan","SSD","Jute","fabio" +"24754","South Sudan","SSD","Jute-Like Fibres","fabio" +"24755","South Sudan","SSD","Soft-Fibres, Other","fabio" +"24756","South Sudan","SSD","Sisal","fabio" +"24757","South Sudan","SSD","Abaca","fabio" +"24758","South Sudan","SSD","Hard Fibres, Other","fabio" +"24759","South Sudan","SSD","Tobacco","fabio" +"24760","South Sudan","SSD","Rubber","fabio" +"24761","South Sudan","SSD","Fodder crops","fabio" +"24762","South Sudan","SSD","Grazing","fabio" +"24763","South Sudan","SSD","Cottonseed","fabio" +"24764","South Sudan","SSD","Palm kernels","fabio" +"24765","South Sudan","SSD","Sugar non-centrifugal","fabio" +"24766","South Sudan","SSD","Molasses","fabio" +"24767","South Sudan","SSD","Sugar, Refined Equiv","fabio" +"24768","South Sudan","SSD","Sweeteners, Other","fabio" +"24769","South Sudan","SSD","Soyabean Oil","fabio" +"24770","South Sudan","SSD","Groundnut Oil","fabio" +"24771","South Sudan","SSD","Sunflowerseed Oil","fabio" +"24772","South Sudan","SSD","Rape and Mustard Oil","fabio" +"24773","South Sudan","SSD","Cottonseed Oil","fabio" +"24774","South Sudan","SSD","Palmkernel Oil","fabio" +"24775","South Sudan","SSD","Palm Oil","fabio" +"24776","South Sudan","SSD","Coconut Oil","fabio" +"24777","South Sudan","SSD","Sesameseed Oil","fabio" +"24778","South Sudan","SSD","Olive Oil","fabio" +"24779","South Sudan","SSD","Ricebran Oil","fabio" +"24780","South Sudan","SSD","Maize Germ Oil","fabio" +"24781","South Sudan","SSD","Oilcrops Oil, Other","fabio" +"24782","South Sudan","SSD","Soyabean Cake","fabio" +"24783","South Sudan","SSD","Groundnut Cake","fabio" +"24784","South Sudan","SSD","Sunflowerseed Cake","fabio" +"24785","South Sudan","SSD","Rape and Mustard Cake","fabio" +"24786","South Sudan","SSD","Cottonseed Cake","fabio" +"24787","South Sudan","SSD","Palmkernel Cake","fabio" +"24788","South Sudan","SSD","Copra Cake","fabio" +"24789","South Sudan","SSD","Sesameseed Cake","fabio" +"24790","South Sudan","SSD","Oilseed Cakes, Other","fabio" +"24791","South Sudan","SSD","Wine","fabio" +"24792","South Sudan","SSD","Beer","fabio" +"24793","South Sudan","SSD","Beverages, Fermented","fabio" +"24794","South Sudan","SSD","Beverages, Alcoholic","fabio" +"24795","South Sudan","SSD","Alcohol, Non-Food","fabio" +"24796","South Sudan","SSD","Cotton lint","fabio" +"24797","South Sudan","SSD","Cattle","fabio" +"24798","South Sudan","SSD","Buffaloes","fabio" +"24799","South Sudan","SSD","Sheep","fabio" +"24800","South Sudan","SSD","Goats","fabio" +"24801","South Sudan","SSD","Pigs","fabio" +"24802","South Sudan","SSD","Poultry Birds","fabio" +"24803","South Sudan","SSD","Horses","fabio" +"24804","South Sudan","SSD","Asses","fabio" +"24805","South Sudan","SSD","Mules","fabio" +"24806","South Sudan","SSD","Camels","fabio" +"24807","South Sudan","SSD","Camelids, other","fabio" +"24808","South Sudan","SSD","Rabbits and hares","fabio" +"24809","South Sudan","SSD","Rodents, other","fabio" +"24810","South Sudan","SSD","Live animals, other","fabio" +"24811","South Sudan","SSD","Milk - Excluding Butter","fabio" +"24812","South Sudan","SSD","Butter, Ghee","fabio" +"24813","South Sudan","SSD","Eggs","fabio" +"24814","South Sudan","SSD","Wool (Clean Eq.)","fabio" +"24815","South Sudan","SSD","Bovine Meat","fabio" +"24816","South Sudan","SSD","Mutton & Goat Meat","fabio" +"24817","South Sudan","SSD","Pigmeat","fabio" +"24818","South Sudan","SSD","Poultry Meat","fabio" +"24819","South Sudan","SSD","Meat, Other","fabio" +"24820","South Sudan","SSD","Offals, Edible","fabio" +"24821","South Sudan","SSD","Fats, Animals, Raw","fabio" +"24822","South Sudan","SSD","Hides and skins","fabio" +"24823","South Sudan","SSD","Meat Meal","fabio" +"24824","South Sudan","SSD","Pet food","fabio" +"24825","South Sudan","SSD","Honey","fabio" +"24826","South Sudan","SSD","Silk","fabio" +"24827","South Sudan","SSD","Fish, Seafood","fabio" +"24828","South Sudan","SSD","Wood fuel","fabio" +"24829","South Sudan","SSD","Industrial roundwood, coniferous","fabio" +"24830","South Sudan","SSD","Industrial roundwood, non-coniferous","fabio" +"24831","RoW","ROW","Rice (Milled Equivalent)","fabio" +"24832","RoW","ROW","Wheat and products","fabio" +"24833","RoW","ROW","Barley and products","fabio" +"24834","RoW","ROW","Maize and products","fabio" +"24835","RoW","ROW","Rye and products","fabio" +"24836","RoW","ROW","Oats","fabio" +"24837","RoW","ROW","Millet and products","fabio" +"24838","RoW","ROW","Sorghum and products","fabio" +"24839","RoW","ROW","Cereals, Other","fabio" +"24840","RoW","ROW","Potatoes and products","fabio" +"24841","RoW","ROW","Cassava and products","fabio" +"24842","RoW","ROW","Sweet potatoes","fabio" +"24843","RoW","ROW","Roots, Other","fabio" +"24844","RoW","ROW","Yams","fabio" +"24845","RoW","ROW","Sugar cane","fabio" +"24846","RoW","ROW","Sugar beet","fabio" +"24847","RoW","ROW","Beans","fabio" +"24848","RoW","ROW","Peas","fabio" +"24849","RoW","ROW","Pulses, Other and products","fabio" +"24850","RoW","ROW","Nuts and products","fabio" +"24851","RoW","ROW","Soyabeans","fabio" +"24852","RoW","ROW","Groundnuts (Shelled Eq)","fabio" +"24853","RoW","ROW","Sunflower seed","fabio" +"24854","RoW","ROW","Rape and Mustardseed","fabio" +"24855","RoW","ROW","Seed cotton","fabio" +"24856","RoW","ROW","Coconuts - Incl Copra","fabio" +"24857","RoW","ROW","Sesame seed","fabio" +"24858","RoW","ROW","Oil, palm fruit","fabio" +"24859","RoW","ROW","Olives (including preserved)","fabio" +"24860","RoW","ROW","Oilcrops, Other","fabio" +"24861","RoW","ROW","Tomatoes and products","fabio" +"24862","RoW","ROW","Onions","fabio" +"24863","RoW","ROW","Vegetables, Other","fabio" +"24864","RoW","ROW","Oranges, Mandarines","fabio" +"24865","RoW","ROW","Lemons, Limes and products","fabio" +"24866","RoW","ROW","Grapefruit and products","fabio" +"24867","RoW","ROW","Citrus, Other","fabio" +"24868","RoW","ROW","Bananas","fabio" +"24869","RoW","ROW","Plantains","fabio" +"24870","RoW","ROW","Apples and products","fabio" +"24871","RoW","ROW","Pineapples and products","fabio" +"24872","RoW","ROW","Dates","fabio" +"24873","RoW","ROW","Grapes and products (excl wine)","fabio" +"24874","RoW","ROW","Fruits, Other","fabio" +"24875","RoW","ROW","Coffee and products","fabio" +"24876","RoW","ROW","Cocoa Beans and products","fabio" +"24877","RoW","ROW","Tea (including mate)","fabio" +"24878","RoW","ROW","Hops","fabio" +"24879","RoW","ROW","Pepper","fabio" +"24880","RoW","ROW","Pimento","fabio" +"24881","RoW","ROW","Cloves","fabio" +"24882","RoW","ROW","Spices, Other","fabio" +"24883","RoW","ROW","Jute","fabio" +"24884","RoW","ROW","Jute-Like Fibres","fabio" +"24885","RoW","ROW","Soft-Fibres, Other","fabio" +"24886","RoW","ROW","Sisal","fabio" +"24887","RoW","ROW","Abaca","fabio" +"24888","RoW","ROW","Hard Fibres, Other","fabio" +"24889","RoW","ROW","Tobacco","fabio" +"24890","RoW","ROW","Rubber","fabio" +"24891","RoW","ROW","Fodder crops","fabio" +"24892","RoW","ROW","Grazing","fabio" +"24893","RoW","ROW","Cottonseed","fabio" +"24894","RoW","ROW","Palm kernels","fabio" +"24895","RoW","ROW","Sugar non-centrifugal","fabio" +"24896","RoW","ROW","Molasses","fabio" +"24897","RoW","ROW","Sugar, Refined Equiv","fabio" +"24898","RoW","ROW","Sweeteners, Other","fabio" +"24899","RoW","ROW","Soyabean Oil","fabio" +"24900","RoW","ROW","Groundnut Oil","fabio" +"24901","RoW","ROW","Sunflowerseed Oil","fabio" +"24902","RoW","ROW","Rape and Mustard Oil","fabio" +"24903","RoW","ROW","Cottonseed Oil","fabio" +"24904","RoW","ROW","Palmkernel Oil","fabio" +"24905","RoW","ROW","Palm Oil","fabio" +"24906","RoW","ROW","Coconut Oil","fabio" +"24907","RoW","ROW","Sesameseed Oil","fabio" +"24908","RoW","ROW","Olive Oil","fabio" +"24909","RoW","ROW","Ricebran Oil","fabio" +"24910","RoW","ROW","Maize Germ Oil","fabio" +"24911","RoW","ROW","Oilcrops Oil, Other","fabio" +"24912","RoW","ROW","Soyabean Cake","fabio" +"24913","RoW","ROW","Groundnut Cake","fabio" +"24914","RoW","ROW","Sunflowerseed Cake","fabio" +"24915","RoW","ROW","Rape and Mustard Cake","fabio" +"24916","RoW","ROW","Cottonseed Cake","fabio" +"24917","RoW","ROW","Palmkernel Cake","fabio" +"24918","RoW","ROW","Copra Cake","fabio" +"24919","RoW","ROW","Sesameseed Cake","fabio" +"24920","RoW","ROW","Oilseed Cakes, Other","fabio" +"24921","RoW","ROW","Wine","fabio" +"24922","RoW","ROW","Beer","fabio" +"24923","RoW","ROW","Beverages, Fermented","fabio" +"24924","RoW","ROW","Beverages, Alcoholic","fabio" +"24925","RoW","ROW","Alcohol, Non-Food","fabio" +"24926","RoW","ROW","Cotton lint","fabio" +"24927","RoW","ROW","Cattle","fabio" +"24928","RoW","ROW","Buffaloes","fabio" +"24929","RoW","ROW","Sheep","fabio" +"24930","RoW","ROW","Goats","fabio" +"24931","RoW","ROW","Pigs","fabio" +"24932","RoW","ROW","Poultry Birds","fabio" +"24933","RoW","ROW","Horses","fabio" +"24934","RoW","ROW","Asses","fabio" +"24935","RoW","ROW","Mules","fabio" +"24936","RoW","ROW","Camels","fabio" +"24937","RoW","ROW","Camelids, other","fabio" +"24938","RoW","ROW","Rabbits and hares","fabio" +"24939","RoW","ROW","Rodents, other","fabio" +"24940","RoW","ROW","Live animals, other","fabio" +"24941","RoW","ROW","Milk - Excluding Butter","fabio" +"24942","RoW","ROW","Butter, Ghee","fabio" +"24943","RoW","ROW","Eggs","fabio" +"24944","RoW","ROW","Wool (Clean Eq.)","fabio" +"24945","RoW","ROW","Bovine Meat","fabio" +"24946","RoW","ROW","Mutton & Goat Meat","fabio" +"24947","RoW","ROW","Pigmeat","fabio" +"24948","RoW","ROW","Poultry Meat","fabio" +"24949","RoW","ROW","Meat, Other","fabio" +"24950","RoW","ROW","Offals, Edible","fabio" +"24951","RoW","ROW","Fats, Animals, Raw","fabio" +"24952","RoW","ROW","Hides and skins","fabio" +"24953","RoW","ROW","Meat Meal","fabio" +"24954","RoW","ROW","Pet food","fabio" +"24955","RoW","ROW","Honey","fabio" +"24956","RoW","ROW","Silk","fabio" +"24957","RoW","ROW","Fish, Seafood","fabio" +"24958","RoW","ROW","Wood fuel","fabio" +"24959","RoW","ROW","Industrial roundwood, coniferous","fabio" +"24960","RoW","ROW","Industrial roundwood, non-coniferous","fabio" +"24961","Austria","AT","Paddy rice","exio" +"24962","Austria","AT","Wheat","exio" +"24963","Austria","AT","Cereal grains nec","exio" +"24964","Austria","AT","Vegetables, fruit, nuts","exio" +"24965","Austria","AT","Oil seeds","exio" +"24966","Austria","AT","Sugar cane, sugar beet","exio" +"24967","Austria","AT","Plant-based fibers","exio" +"24968","Austria","AT","Crops nec","exio" +"24969","Austria","AT","Cattle","exio" +"24970","Austria","AT","Pigs","exio" +"24971","Austria","AT","Poultry","exio" +"24972","Austria","AT","Meat animals nec","exio" +"24973","Austria","AT","Animal products nec","exio" +"24974","Austria","AT","Raw milk","exio" +"24975","Austria","AT","Wool, silk-worm cocoons","exio" +"24976","Austria","AT","Manure (conventional treatment)","exio" +"24977","Austria","AT","Manure (biogas treatment)","exio" +"24978","Austria","AT","Products of forestry, logging and related services","exio" +"24979","Austria","AT","Fish and other fishing products; services incidental of fishing","exio" +"24980","Austria","AT","Anthracite","exio" +"24981","Austria","AT","Coking Coal","exio" +"24982","Austria","AT","Other Bituminous Coal","exio" +"24983","Austria","AT","Sub-Bituminous Coal","exio" +"24984","Austria","AT","Patent Fuel","exio" +"24985","Austria","AT","Lignite/Brown Coal","exio" +"24986","Austria","AT","BKB/Peat Briquettes","exio" +"24987","Austria","AT","Peat","exio" +"24988","Austria","AT","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"24989","Austria","AT","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"24990","Austria","AT","Natural Gas Liquids","exio" +"24991","Austria","AT","Other Hydrocarbons","exio" +"24992","Austria","AT","Uranium and thorium ores","exio" +"24993","Austria","AT","Iron ores","exio" +"24994","Austria","AT","Copper ores and concentrates","exio" +"24995","Austria","AT","Nickel ores and concentrates","exio" +"24996","Austria","AT","Aluminium ores and concentrates","exio" +"24997","Austria","AT","Precious metal ores and concentrates","exio" +"24998","Austria","AT","Lead, zinc and tin ores and concentrates","exio" +"24999","Austria","AT","Other non-ferrous metal ores and concentrates","exio" +"25000","Austria","AT","Stone","exio" +"25001","Austria","AT","Sand and clay","exio" +"25002","Austria","AT","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"25003","Austria","AT","Products of meat cattle","exio" +"25004","Austria","AT","Products of meat pigs","exio" +"25005","Austria","AT","Products of meat poultry","exio" +"25006","Austria","AT","Meat products nec","exio" +"25007","Austria","AT","products of Vegetable oils and fats","exio" +"25008","Austria","AT","Dairy products","exio" +"25009","Austria","AT","Processed rice","exio" +"25010","Austria","AT","Sugar","exio" +"25011","Austria","AT","Food products nec","exio" +"25012","Austria","AT","Beverages","exio" +"25013","Austria","AT","Fish products","exio" +"25014","Austria","AT","Tobacco products","exio" +"25015","Austria","AT","Textiles","exio" +"25016","Austria","AT","Wearing apparel; furs","exio" +"25017","Austria","AT","Leather and leather products","exio" +"25018","Austria","AT","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"25019","Austria","AT","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"25020","Austria","AT","Pulp","exio" +"25021","Austria","AT","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"25022","Austria","AT","Paper and paper products","exio" +"25023","Austria","AT","Printed matter and recorded media","exio" +"25024","Austria","AT","Coke Oven Coke","exio" +"25025","Austria","AT","Gas Coke","exio" +"25026","Austria","AT","Coal Tar","exio" +"25027","Austria","AT","Motor Gasoline","exio" +"25028","Austria","AT","Aviation Gasoline","exio" +"25029","Austria","AT","Gasoline Type Jet Fuel","exio" +"25030","Austria","AT","Kerosene Type Jet Fuel","exio" +"25031","Austria","AT","Kerosene","exio" +"25032","Austria","AT","Gas/Diesel Oil","exio" +"25033","Austria","AT","Heavy Fuel Oil","exio" +"25034","Austria","AT","Refinery Gas","exio" +"25035","Austria","AT","Liquefied Petroleum Gases (LPG)","exio" +"25036","Austria","AT","Refinery Feedstocks","exio" +"25037","Austria","AT","Ethane","exio" +"25038","Austria","AT","Naphtha","exio" +"25039","Austria","AT","White Spirit & SBP","exio" +"25040","Austria","AT","Lubricants","exio" +"25041","Austria","AT","Bitumen","exio" +"25042","Austria","AT","Paraffin Waxes","exio" +"25043","Austria","AT","Petroleum Coke","exio" +"25044","Austria","AT","Non-specified Petroleum Products","exio" +"25045","Austria","AT","Nuclear fuel","exio" +"25046","Austria","AT","Plastics, basic","exio" +"25047","Austria","AT","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"25048","Austria","AT","N-fertiliser","exio" +"25049","Austria","AT","P- and other fertiliser","exio" +"25050","Austria","AT","Chemicals nec","exio" +"25051","Austria","AT","Charcoal","exio" +"25052","Austria","AT","Additives/Blending Components","exio" +"25053","Austria","AT","Biogasoline","exio" +"25054","Austria","AT","Biodiesels","exio" +"25055","Austria","AT","Other Liquid Biofuels","exio" +"25056","Austria","AT","Rubber and plastic products","exio" +"25057","Austria","AT","Glass and glass products","exio" +"25058","Austria","AT","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"25059","Austria","AT","Ceramic goods","exio" +"25060","Austria","AT","Bricks, tiles and construction products, in baked clay","exio" +"25061","Austria","AT","Cement, lime and plaster","exio" +"25062","Austria","AT","Ash for treatment, Re-processing of ash into clinker","exio" +"25063","Austria","AT","Other non-metallic mineral products","exio" +"25064","Austria","AT","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"25065","Austria","AT","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"25066","Austria","AT","Precious metals","exio" +"25067","Austria","AT","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"25068","Austria","AT","Aluminium and aluminium products","exio" +"25069","Austria","AT","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"25070","Austria","AT","Lead, zinc and tin and products thereof","exio" +"25071","Austria","AT","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"25072","Austria","AT","Copper products","exio" +"25073","Austria","AT","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"25074","Austria","AT","Other non-ferrous metal products","exio" +"25075","Austria","AT","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"25076","Austria","AT","Foundry work services","exio" +"25077","Austria","AT","Fabricated metal products, except machinery and equipment","exio" +"25078","Austria","AT","Machinery and equipment n.e.c.","exio" +"25079","Austria","AT","Office machinery and computers","exio" +"25080","Austria","AT","Electrical machinery and apparatus n.e.c.","exio" +"25081","Austria","AT","Radio, television and communication equipment and apparatus","exio" +"25082","Austria","AT","Medical, precision and optical instruments, watches and clocks","exio" +"25083","Austria","AT","Motor vehicles, trailers and semi-trailers","exio" +"25084","Austria","AT","Other transport equipment","exio" +"25085","Austria","AT","Furniture; other manufactured goods n.e.c.","exio" +"25086","Austria","AT","Secondary raw materials","exio" +"25087","Austria","AT","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"25088","Austria","AT","Electricity by coal","exio" +"25089","Austria","AT","Electricity by gas","exio" +"25090","Austria","AT","Electricity by nuclear","exio" +"25091","Austria","AT","Electricity by hydro","exio" +"25092","Austria","AT","Electricity by wind","exio" +"25093","Austria","AT","Electricity by petroleum and other oil derivatives","exio" +"25094","Austria","AT","Electricity by biomass and waste","exio" +"25095","Austria","AT","Electricity by solar photovoltaic","exio" +"25096","Austria","AT","Electricity by solar thermal","exio" +"25097","Austria","AT","Electricity by tide, wave, ocean","exio" +"25098","Austria","AT","Electricity by Geothermal","exio" +"25099","Austria","AT","Electricity nec","exio" +"25100","Austria","AT","Transmission services of electricity","exio" +"25101","Austria","AT","Distribution and trade services of electricity","exio" +"25102","Austria","AT","Coke oven gas","exio" +"25103","Austria","AT","Blast Furnace Gas","exio" +"25104","Austria","AT","Oxygen Steel Furnace Gas","exio" +"25105","Austria","AT","Gas Works Gas","exio" +"25106","Austria","AT","Biogas","exio" +"25107","Austria","AT","Distribution services of gaseous fuels through mains","exio" +"25108","Austria","AT","Steam and hot water supply services","exio" +"25109","Austria","AT","Collected and purified water, distribution services of water","exio" +"25110","Austria","AT","Construction work","exio" +"25111","Austria","AT","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"25112","Austria","AT","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"25113","Austria","AT","Retail trade services of motor fuel","exio" +"25114","Austria","AT","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"25115","Austria","AT","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"25116","Austria","AT","Hotel and restaurant services","exio" +"25117","Austria","AT","Railway transportation services","exio" +"25118","Austria","AT","Other land transportation services","exio" +"25119","Austria","AT","Transportation services via pipelines","exio" +"25120","Austria","AT","Sea and coastal water transportation services","exio" +"25121","Austria","AT","Inland water transportation services","exio" +"25122","Austria","AT","Air transport services","exio" +"25123","Austria","AT","Supporting and auxiliary transport services; travel agency services","exio" +"25124","Austria","AT","Post and telecommunication services","exio" +"25125","Austria","AT","Financial intermediation services, except insurance and pension funding services","exio" +"25126","Austria","AT","Insurance and pension funding services, except compulsory social security services","exio" +"25127","Austria","AT","Services auxiliary to financial intermediation","exio" +"25128","Austria","AT","Real estate services","exio" +"25129","Austria","AT","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"25130","Austria","AT","Computer and related services","exio" +"25131","Austria","AT","Research and development services","exio" +"25132","Austria","AT","Other business services","exio" +"25133","Austria","AT","Public administration and defence services; compulsory social security services","exio" +"25134","Austria","AT","Education services","exio" +"25135","Austria","AT","Health and social work services","exio" +"25136","Austria","AT","Food waste for treatment: incineration","exio" +"25137","Austria","AT","Paper waste for treatment: incineration","exio" +"25138","Austria","AT","Plastic waste for treatment: incineration","exio" +"25139","Austria","AT","Intert/metal waste for treatment: incineration","exio" +"25140","Austria","AT","Textiles waste for treatment: incineration","exio" +"25141","Austria","AT","Wood waste for treatment: incineration","exio" +"25142","Austria","AT","Oil/hazardous waste for treatment: incineration","exio" +"25143","Austria","AT","Food waste for treatment: biogasification and land application","exio" +"25144","Austria","AT","Paper waste for treatment: biogasification and land application","exio" +"25145","Austria","AT","Sewage sludge for treatment: biogasification and land application","exio" +"25146","Austria","AT","Food waste for treatment: composting and land application","exio" +"25147","Austria","AT","Paper and wood waste for treatment: composting and land application","exio" +"25148","Austria","AT","Food waste for treatment: waste water treatment","exio" +"25149","Austria","AT","Other waste for treatment: waste water treatment","exio" +"25150","Austria","AT","Food waste for treatment: landfill","exio" +"25151","Austria","AT","Paper for treatment: landfill","exio" +"25152","Austria","AT","Plastic waste for treatment: landfill","exio" +"25153","Austria","AT","Inert/metal/hazardous waste for treatment: landfill","exio" +"25154","Austria","AT","Textiles waste for treatment: landfill","exio" +"25155","Austria","AT","Wood waste for treatment: landfill","exio" +"25156","Austria","AT","Membership organisation services n.e.c.","exio" +"25157","Austria","AT","Recreational, cultural and sporting services","exio" +"25158","Austria","AT","Other services","exio" +"25159","Austria","AT","Private households with employed persons","exio" +"25160","Austria","AT","Extra-territorial organizations and bodies","exio" +"25161","Belgium","BE","Paddy rice","exio" +"25162","Belgium","BE","Wheat","exio" +"25163","Belgium","BE","Cereal grains nec","exio" +"25164","Belgium","BE","Vegetables, fruit, nuts","exio" +"25165","Belgium","BE","Oil seeds","exio" +"25166","Belgium","BE","Sugar cane, sugar beet","exio" +"25167","Belgium","BE","Plant-based fibers","exio" +"25168","Belgium","BE","Crops nec","exio" +"25169","Belgium","BE","Cattle","exio" +"25170","Belgium","BE","Pigs","exio" +"25171","Belgium","BE","Poultry","exio" +"25172","Belgium","BE","Meat animals nec","exio" +"25173","Belgium","BE","Animal products nec","exio" +"25174","Belgium","BE","Raw milk","exio" +"25175","Belgium","BE","Wool, silk-worm cocoons","exio" +"25176","Belgium","BE","Manure (conventional treatment)","exio" +"25177","Belgium","BE","Manure (biogas treatment)","exio" +"25178","Belgium","BE","Products of forestry, logging and related services","exio" +"25179","Belgium","BE","Fish and other fishing products; services incidental of fishing","exio" +"25180","Belgium","BE","Anthracite","exio" +"25181","Belgium","BE","Coking Coal","exio" +"25182","Belgium","BE","Other Bituminous Coal","exio" +"25183","Belgium","BE","Sub-Bituminous Coal","exio" +"25184","Belgium","BE","Patent Fuel","exio" +"25185","Belgium","BE","Lignite/Brown Coal","exio" +"25186","Belgium","BE","BKB/Peat Briquettes","exio" +"25187","Belgium","BE","Peat","exio" +"25188","Belgium","BE","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"25189","Belgium","BE","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"25190","Belgium","BE","Natural Gas Liquids","exio" +"25191","Belgium","BE","Other Hydrocarbons","exio" +"25192","Belgium","BE","Uranium and thorium ores","exio" +"25193","Belgium","BE","Iron ores","exio" +"25194","Belgium","BE","Copper ores and concentrates","exio" +"25195","Belgium","BE","Nickel ores and concentrates","exio" +"25196","Belgium","BE","Aluminium ores and concentrates","exio" +"25197","Belgium","BE","Precious metal ores and concentrates","exio" +"25198","Belgium","BE","Lead, zinc and tin ores and concentrates","exio" +"25199","Belgium","BE","Other non-ferrous metal ores and concentrates","exio" +"25200","Belgium","BE","Stone","exio" +"25201","Belgium","BE","Sand and clay","exio" +"25202","Belgium","BE","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"25203","Belgium","BE","Products of meat cattle","exio" +"25204","Belgium","BE","Products of meat pigs","exio" +"25205","Belgium","BE","Products of meat poultry","exio" +"25206","Belgium","BE","Meat products nec","exio" +"25207","Belgium","BE","products of Vegetable oils and fats","exio" +"25208","Belgium","BE","Dairy products","exio" +"25209","Belgium","BE","Processed rice","exio" +"25210","Belgium","BE","Sugar","exio" +"25211","Belgium","BE","Food products nec","exio" +"25212","Belgium","BE","Beverages","exio" +"25213","Belgium","BE","Fish products","exio" +"25214","Belgium","BE","Tobacco products","exio" +"25215","Belgium","BE","Textiles","exio" +"25216","Belgium","BE","Wearing apparel; furs","exio" +"25217","Belgium","BE","Leather and leather products","exio" +"25218","Belgium","BE","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"25219","Belgium","BE","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"25220","Belgium","BE","Pulp","exio" +"25221","Belgium","BE","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"25222","Belgium","BE","Paper and paper products","exio" +"25223","Belgium","BE","Printed matter and recorded media","exio" +"25224","Belgium","BE","Coke Oven Coke","exio" +"25225","Belgium","BE","Gas Coke","exio" +"25226","Belgium","BE","Coal Tar","exio" +"25227","Belgium","BE","Motor Gasoline","exio" +"25228","Belgium","BE","Aviation Gasoline","exio" +"25229","Belgium","BE","Gasoline Type Jet Fuel","exio" +"25230","Belgium","BE","Kerosene Type Jet Fuel","exio" +"25231","Belgium","BE","Kerosene","exio" +"25232","Belgium","BE","Gas/Diesel Oil","exio" +"25233","Belgium","BE","Heavy Fuel Oil","exio" +"25234","Belgium","BE","Refinery Gas","exio" +"25235","Belgium","BE","Liquefied Petroleum Gases (LPG)","exio" +"25236","Belgium","BE","Refinery Feedstocks","exio" +"25237","Belgium","BE","Ethane","exio" +"25238","Belgium","BE","Naphtha","exio" +"25239","Belgium","BE","White Spirit & SBP","exio" +"25240","Belgium","BE","Lubricants","exio" +"25241","Belgium","BE","Bitumen","exio" +"25242","Belgium","BE","Paraffin Waxes","exio" +"25243","Belgium","BE","Petroleum Coke","exio" +"25244","Belgium","BE","Non-specified Petroleum Products","exio" +"25245","Belgium","BE","Nuclear fuel","exio" +"25246","Belgium","BE","Plastics, basic","exio" +"25247","Belgium","BE","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"25248","Belgium","BE","N-fertiliser","exio" +"25249","Belgium","BE","P- and other fertiliser","exio" +"25250","Belgium","BE","Chemicals nec","exio" +"25251","Belgium","BE","Charcoal","exio" +"25252","Belgium","BE","Additives/Blending Components","exio" +"25253","Belgium","BE","Biogasoline","exio" +"25254","Belgium","BE","Biodiesels","exio" +"25255","Belgium","BE","Other Liquid Biofuels","exio" +"25256","Belgium","BE","Rubber and plastic products","exio" +"25257","Belgium","BE","Glass and glass products","exio" +"25258","Belgium","BE","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"25259","Belgium","BE","Ceramic goods","exio" +"25260","Belgium","BE","Bricks, tiles and construction products, in baked clay","exio" +"25261","Belgium","BE","Cement, lime and plaster","exio" +"25262","Belgium","BE","Ash for treatment, Re-processing of ash into clinker","exio" +"25263","Belgium","BE","Other non-metallic mineral products","exio" +"25264","Belgium","BE","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"25265","Belgium","BE","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"25266","Belgium","BE","Precious metals","exio" +"25267","Belgium","BE","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"25268","Belgium","BE","Aluminium and aluminium products","exio" +"25269","Belgium","BE","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"25270","Belgium","BE","Lead, zinc and tin and products thereof","exio" +"25271","Belgium","BE","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"25272","Belgium","BE","Copper products","exio" +"25273","Belgium","BE","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"25274","Belgium","BE","Other non-ferrous metal products","exio" +"25275","Belgium","BE","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"25276","Belgium","BE","Foundry work services","exio" +"25277","Belgium","BE","Fabricated metal products, except machinery and equipment","exio" +"25278","Belgium","BE","Machinery and equipment n.e.c.","exio" +"25279","Belgium","BE","Office machinery and computers","exio" +"25280","Belgium","BE","Electrical machinery and apparatus n.e.c.","exio" +"25281","Belgium","BE","Radio, television and communication equipment and apparatus","exio" +"25282","Belgium","BE","Medical, precision and optical instruments, watches and clocks","exio" +"25283","Belgium","BE","Motor vehicles, trailers and semi-trailers","exio" +"25284","Belgium","BE","Other transport equipment","exio" +"25285","Belgium","BE","Furniture; other manufactured goods n.e.c.","exio" +"25286","Belgium","BE","Secondary raw materials","exio" +"25287","Belgium","BE","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"25288","Belgium","BE","Electricity by coal","exio" +"25289","Belgium","BE","Electricity by gas","exio" +"25290","Belgium","BE","Electricity by nuclear","exio" +"25291","Belgium","BE","Electricity by hydro","exio" +"25292","Belgium","BE","Electricity by wind","exio" +"25293","Belgium","BE","Electricity by petroleum and other oil derivatives","exio" +"25294","Belgium","BE","Electricity by biomass and waste","exio" +"25295","Belgium","BE","Electricity by solar photovoltaic","exio" +"25296","Belgium","BE","Electricity by solar thermal","exio" +"25297","Belgium","BE","Electricity by tide, wave, ocean","exio" +"25298","Belgium","BE","Electricity by Geothermal","exio" +"25299","Belgium","BE","Electricity nec","exio" +"25300","Belgium","BE","Transmission services of electricity","exio" +"25301","Belgium","BE","Distribution and trade services of electricity","exio" +"25302","Belgium","BE","Coke oven gas","exio" +"25303","Belgium","BE","Blast Furnace Gas","exio" +"25304","Belgium","BE","Oxygen Steel Furnace Gas","exio" +"25305","Belgium","BE","Gas Works Gas","exio" +"25306","Belgium","BE","Biogas","exio" +"25307","Belgium","BE","Distribution services of gaseous fuels through mains","exio" +"25308","Belgium","BE","Steam and hot water supply services","exio" +"25309","Belgium","BE","Collected and purified water, distribution services of water","exio" +"25310","Belgium","BE","Construction work","exio" +"25311","Belgium","BE","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"25312","Belgium","BE","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"25313","Belgium","BE","Retail trade services of motor fuel","exio" +"25314","Belgium","BE","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"25315","Belgium","BE","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"25316","Belgium","BE","Hotel and restaurant services","exio" +"25317","Belgium","BE","Railway transportation services","exio" +"25318","Belgium","BE","Other land transportation services","exio" +"25319","Belgium","BE","Transportation services via pipelines","exio" +"25320","Belgium","BE","Sea and coastal water transportation services","exio" +"25321","Belgium","BE","Inland water transportation services","exio" +"25322","Belgium","BE","Air transport services","exio" +"25323","Belgium","BE","Supporting and auxiliary transport services; travel agency services","exio" +"25324","Belgium","BE","Post and telecommunication services","exio" +"25325","Belgium","BE","Financial intermediation services, except insurance and pension funding services","exio" +"25326","Belgium","BE","Insurance and pension funding services, except compulsory social security services","exio" +"25327","Belgium","BE","Services auxiliary to financial intermediation","exio" +"25328","Belgium","BE","Real estate services","exio" +"25329","Belgium","BE","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"25330","Belgium","BE","Computer and related services","exio" +"25331","Belgium","BE","Research and development services","exio" +"25332","Belgium","BE","Other business services","exio" +"25333","Belgium","BE","Public administration and defence services; compulsory social security services","exio" +"25334","Belgium","BE","Education services","exio" +"25335","Belgium","BE","Health and social work services","exio" +"25336","Belgium","BE","Food waste for treatment: incineration","exio" +"25337","Belgium","BE","Paper waste for treatment: incineration","exio" +"25338","Belgium","BE","Plastic waste for treatment: incineration","exio" +"25339","Belgium","BE","Intert/metal waste for treatment: incineration","exio" +"25340","Belgium","BE","Textiles waste for treatment: incineration","exio" +"25341","Belgium","BE","Wood waste for treatment: incineration","exio" +"25342","Belgium","BE","Oil/hazardous waste for treatment: incineration","exio" +"25343","Belgium","BE","Food waste for treatment: biogasification and land application","exio" +"25344","Belgium","BE","Paper waste for treatment: biogasification and land application","exio" +"25345","Belgium","BE","Sewage sludge for treatment: biogasification and land application","exio" +"25346","Belgium","BE","Food waste for treatment: composting and land application","exio" +"25347","Belgium","BE","Paper and wood waste for treatment: composting and land application","exio" +"25348","Belgium","BE","Food waste for treatment: waste water treatment","exio" +"25349","Belgium","BE","Other waste for treatment: waste water treatment","exio" +"25350","Belgium","BE","Food waste for treatment: landfill","exio" +"25351","Belgium","BE","Paper for treatment: landfill","exio" +"25352","Belgium","BE","Plastic waste for treatment: landfill","exio" +"25353","Belgium","BE","Inert/metal/hazardous waste for treatment: landfill","exio" +"25354","Belgium","BE","Textiles waste for treatment: landfill","exio" +"25355","Belgium","BE","Wood waste for treatment: landfill","exio" +"25356","Belgium","BE","Membership organisation services n.e.c.","exio" +"25357","Belgium","BE","Recreational, cultural and sporting services","exio" +"25358","Belgium","BE","Other services","exio" +"25359","Belgium","BE","Private households with employed persons","exio" +"25360","Belgium","BE","Extra-territorial organizations and bodies","exio" +"25361","Bulgaria","BG","Paddy rice","exio" +"25362","Bulgaria","BG","Wheat","exio" +"25363","Bulgaria","BG","Cereal grains nec","exio" +"25364","Bulgaria","BG","Vegetables, fruit, nuts","exio" +"25365","Bulgaria","BG","Oil seeds","exio" +"25366","Bulgaria","BG","Sugar cane, sugar beet","exio" +"25367","Bulgaria","BG","Plant-based fibers","exio" +"25368","Bulgaria","BG","Crops nec","exio" +"25369","Bulgaria","BG","Cattle","exio" +"25370","Bulgaria","BG","Pigs","exio" +"25371","Bulgaria","BG","Poultry","exio" +"25372","Bulgaria","BG","Meat animals nec","exio" +"25373","Bulgaria","BG","Animal products nec","exio" +"25374","Bulgaria","BG","Raw milk","exio" +"25375","Bulgaria","BG","Wool, silk-worm cocoons","exio" +"25376","Bulgaria","BG","Manure (conventional treatment)","exio" +"25377","Bulgaria","BG","Manure (biogas treatment)","exio" +"25378","Bulgaria","BG","Products of forestry, logging and related services","exio" +"25379","Bulgaria","BG","Fish and other fishing products; services incidental of fishing","exio" +"25380","Bulgaria","BG","Anthracite","exio" +"25381","Bulgaria","BG","Coking Coal","exio" +"25382","Bulgaria","BG","Other Bituminous Coal","exio" +"25383","Bulgaria","BG","Sub-Bituminous Coal","exio" +"25384","Bulgaria","BG","Patent Fuel","exio" +"25385","Bulgaria","BG","Lignite/Brown Coal","exio" +"25386","Bulgaria","BG","BKB/Peat Briquettes","exio" +"25387","Bulgaria","BG","Peat","exio" +"25388","Bulgaria","BG","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"25389","Bulgaria","BG","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"25390","Bulgaria","BG","Natural Gas Liquids","exio" +"25391","Bulgaria","BG","Other Hydrocarbons","exio" +"25392","Bulgaria","BG","Uranium and thorium ores","exio" +"25393","Bulgaria","BG","Iron ores","exio" +"25394","Bulgaria","BG","Copper ores and concentrates","exio" +"25395","Bulgaria","BG","Nickel ores and concentrates","exio" +"25396","Bulgaria","BG","Aluminium ores and concentrates","exio" +"25397","Bulgaria","BG","Precious metal ores and concentrates","exio" +"25398","Bulgaria","BG","Lead, zinc and tin ores and concentrates","exio" +"25399","Bulgaria","BG","Other non-ferrous metal ores and concentrates","exio" +"25400","Bulgaria","BG","Stone","exio" +"25401","Bulgaria","BG","Sand and clay","exio" +"25402","Bulgaria","BG","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"25403","Bulgaria","BG","Products of meat cattle","exio" +"25404","Bulgaria","BG","Products of meat pigs","exio" +"25405","Bulgaria","BG","Products of meat poultry","exio" +"25406","Bulgaria","BG","Meat products nec","exio" +"25407","Bulgaria","BG","products of Vegetable oils and fats","exio" +"25408","Bulgaria","BG","Dairy products","exio" +"25409","Bulgaria","BG","Processed rice","exio" +"25410","Bulgaria","BG","Sugar","exio" +"25411","Bulgaria","BG","Food products nec","exio" +"25412","Bulgaria","BG","Beverages","exio" +"25413","Bulgaria","BG","Fish products","exio" +"25414","Bulgaria","BG","Tobacco products","exio" +"25415","Bulgaria","BG","Textiles","exio" +"25416","Bulgaria","BG","Wearing apparel; furs","exio" +"25417","Bulgaria","BG","Leather and leather products","exio" +"25418","Bulgaria","BG","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"25419","Bulgaria","BG","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"25420","Bulgaria","BG","Pulp","exio" +"25421","Bulgaria","BG","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"25422","Bulgaria","BG","Paper and paper products","exio" +"25423","Bulgaria","BG","Printed matter and recorded media","exio" +"25424","Bulgaria","BG","Coke Oven Coke","exio" +"25425","Bulgaria","BG","Gas Coke","exio" +"25426","Bulgaria","BG","Coal Tar","exio" +"25427","Bulgaria","BG","Motor Gasoline","exio" +"25428","Bulgaria","BG","Aviation Gasoline","exio" +"25429","Bulgaria","BG","Gasoline Type Jet Fuel","exio" +"25430","Bulgaria","BG","Kerosene Type Jet Fuel","exio" +"25431","Bulgaria","BG","Kerosene","exio" +"25432","Bulgaria","BG","Gas/Diesel Oil","exio" +"25433","Bulgaria","BG","Heavy Fuel Oil","exio" +"25434","Bulgaria","BG","Refinery Gas","exio" +"25435","Bulgaria","BG","Liquefied Petroleum Gases (LPG)","exio" +"25436","Bulgaria","BG","Refinery Feedstocks","exio" +"25437","Bulgaria","BG","Ethane","exio" +"25438","Bulgaria","BG","Naphtha","exio" +"25439","Bulgaria","BG","White Spirit & SBP","exio" +"25440","Bulgaria","BG","Lubricants","exio" +"25441","Bulgaria","BG","Bitumen","exio" +"25442","Bulgaria","BG","Paraffin Waxes","exio" +"25443","Bulgaria","BG","Petroleum Coke","exio" +"25444","Bulgaria","BG","Non-specified Petroleum Products","exio" +"25445","Bulgaria","BG","Nuclear fuel","exio" +"25446","Bulgaria","BG","Plastics, basic","exio" +"25447","Bulgaria","BG","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"25448","Bulgaria","BG","N-fertiliser","exio" +"25449","Bulgaria","BG","P- and other fertiliser","exio" +"25450","Bulgaria","BG","Chemicals nec","exio" +"25451","Bulgaria","BG","Charcoal","exio" +"25452","Bulgaria","BG","Additives/Blending Components","exio" +"25453","Bulgaria","BG","Biogasoline","exio" +"25454","Bulgaria","BG","Biodiesels","exio" +"25455","Bulgaria","BG","Other Liquid Biofuels","exio" +"25456","Bulgaria","BG","Rubber and plastic products","exio" +"25457","Bulgaria","BG","Glass and glass products","exio" +"25458","Bulgaria","BG","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"25459","Bulgaria","BG","Ceramic goods","exio" +"25460","Bulgaria","BG","Bricks, tiles and construction products, in baked clay","exio" +"25461","Bulgaria","BG","Cement, lime and plaster","exio" +"25462","Bulgaria","BG","Ash for treatment, Re-processing of ash into clinker","exio" +"25463","Bulgaria","BG","Other non-metallic mineral products","exio" +"25464","Bulgaria","BG","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"25465","Bulgaria","BG","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"25466","Bulgaria","BG","Precious metals","exio" +"25467","Bulgaria","BG","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"25468","Bulgaria","BG","Aluminium and aluminium products","exio" +"25469","Bulgaria","BG","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"25470","Bulgaria","BG","Lead, zinc and tin and products thereof","exio" +"25471","Bulgaria","BG","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"25472","Bulgaria","BG","Copper products","exio" +"25473","Bulgaria","BG","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"25474","Bulgaria","BG","Other non-ferrous metal products","exio" +"25475","Bulgaria","BG","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"25476","Bulgaria","BG","Foundry work services","exio" +"25477","Bulgaria","BG","Fabricated metal products, except machinery and equipment","exio" +"25478","Bulgaria","BG","Machinery and equipment n.e.c.","exio" +"25479","Bulgaria","BG","Office machinery and computers","exio" +"25480","Bulgaria","BG","Electrical machinery and apparatus n.e.c.","exio" +"25481","Bulgaria","BG","Radio, television and communication equipment and apparatus","exio" +"25482","Bulgaria","BG","Medical, precision and optical instruments, watches and clocks","exio" +"25483","Bulgaria","BG","Motor vehicles, trailers and semi-trailers","exio" +"25484","Bulgaria","BG","Other transport equipment","exio" +"25485","Bulgaria","BG","Furniture; other manufactured goods n.e.c.","exio" +"25486","Bulgaria","BG","Secondary raw materials","exio" +"25487","Bulgaria","BG","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"25488","Bulgaria","BG","Electricity by coal","exio" +"25489","Bulgaria","BG","Electricity by gas","exio" +"25490","Bulgaria","BG","Electricity by nuclear","exio" +"25491","Bulgaria","BG","Electricity by hydro","exio" +"25492","Bulgaria","BG","Electricity by wind","exio" +"25493","Bulgaria","BG","Electricity by petroleum and other oil derivatives","exio" +"25494","Bulgaria","BG","Electricity by biomass and waste","exio" +"25495","Bulgaria","BG","Electricity by solar photovoltaic","exio" +"25496","Bulgaria","BG","Electricity by solar thermal","exio" +"25497","Bulgaria","BG","Electricity by tide, wave, ocean","exio" +"25498","Bulgaria","BG","Electricity by Geothermal","exio" +"25499","Bulgaria","BG","Electricity nec","exio" +"25500","Bulgaria","BG","Transmission services of electricity","exio" +"25501","Bulgaria","BG","Distribution and trade services of electricity","exio" +"25502","Bulgaria","BG","Coke oven gas","exio" +"25503","Bulgaria","BG","Blast Furnace Gas","exio" +"25504","Bulgaria","BG","Oxygen Steel Furnace Gas","exio" +"25505","Bulgaria","BG","Gas Works Gas","exio" +"25506","Bulgaria","BG","Biogas","exio" +"25507","Bulgaria","BG","Distribution services of gaseous fuels through mains","exio" +"25508","Bulgaria","BG","Steam and hot water supply services","exio" +"25509","Bulgaria","BG","Collected and purified water, distribution services of water","exio" +"25510","Bulgaria","BG","Construction work","exio" +"25511","Bulgaria","BG","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"25512","Bulgaria","BG","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"25513","Bulgaria","BG","Retail trade services of motor fuel","exio" +"25514","Bulgaria","BG","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"25515","Bulgaria","BG","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"25516","Bulgaria","BG","Hotel and restaurant services","exio" +"25517","Bulgaria","BG","Railway transportation services","exio" +"25518","Bulgaria","BG","Other land transportation services","exio" +"25519","Bulgaria","BG","Transportation services via pipelines","exio" +"25520","Bulgaria","BG","Sea and coastal water transportation services","exio" +"25521","Bulgaria","BG","Inland water transportation services","exio" +"25522","Bulgaria","BG","Air transport services","exio" +"25523","Bulgaria","BG","Supporting and auxiliary transport services; travel agency services","exio" +"25524","Bulgaria","BG","Post and telecommunication services","exio" +"25525","Bulgaria","BG","Financial intermediation services, except insurance and pension funding services","exio" +"25526","Bulgaria","BG","Insurance and pension funding services, except compulsory social security services","exio" +"25527","Bulgaria","BG","Services auxiliary to financial intermediation","exio" +"25528","Bulgaria","BG","Real estate services","exio" +"25529","Bulgaria","BG","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"25530","Bulgaria","BG","Computer and related services","exio" +"25531","Bulgaria","BG","Research and development services","exio" +"25532","Bulgaria","BG","Other business services","exio" +"25533","Bulgaria","BG","Public administration and defence services; compulsory social security services","exio" +"25534","Bulgaria","BG","Education services","exio" +"25535","Bulgaria","BG","Health and social work services","exio" +"25536","Bulgaria","BG","Food waste for treatment: incineration","exio" +"25537","Bulgaria","BG","Paper waste for treatment: incineration","exio" +"25538","Bulgaria","BG","Plastic waste for treatment: incineration","exio" +"25539","Bulgaria","BG","Intert/metal waste for treatment: incineration","exio" +"25540","Bulgaria","BG","Textiles waste for treatment: incineration","exio" +"25541","Bulgaria","BG","Wood waste for treatment: incineration","exio" +"25542","Bulgaria","BG","Oil/hazardous waste for treatment: incineration","exio" +"25543","Bulgaria","BG","Food waste for treatment: biogasification and land application","exio" +"25544","Bulgaria","BG","Paper waste for treatment: biogasification and land application","exio" +"25545","Bulgaria","BG","Sewage sludge for treatment: biogasification and land application","exio" +"25546","Bulgaria","BG","Food waste for treatment: composting and land application","exio" +"25547","Bulgaria","BG","Paper and wood waste for treatment: composting and land application","exio" +"25548","Bulgaria","BG","Food waste for treatment: waste water treatment","exio" +"25549","Bulgaria","BG","Other waste for treatment: waste water treatment","exio" +"25550","Bulgaria","BG","Food waste for treatment: landfill","exio" +"25551","Bulgaria","BG","Paper for treatment: landfill","exio" +"25552","Bulgaria","BG","Plastic waste for treatment: landfill","exio" +"25553","Bulgaria","BG","Inert/metal/hazardous waste for treatment: landfill","exio" +"25554","Bulgaria","BG","Textiles waste for treatment: landfill","exio" +"25555","Bulgaria","BG","Wood waste for treatment: landfill","exio" +"25556","Bulgaria","BG","Membership organisation services n.e.c.","exio" +"25557","Bulgaria","BG","Recreational, cultural and sporting services","exio" +"25558","Bulgaria","BG","Other services","exio" +"25559","Bulgaria","BG","Private households with employed persons","exio" +"25560","Bulgaria","BG","Extra-territorial organizations and bodies","exio" +"25561","Cyprus","CY","Paddy rice","exio" +"25562","Cyprus","CY","Wheat","exio" +"25563","Cyprus","CY","Cereal grains nec","exio" +"25564","Cyprus","CY","Vegetables, fruit, nuts","exio" +"25565","Cyprus","CY","Oil seeds","exio" +"25566","Cyprus","CY","Sugar cane, sugar beet","exio" +"25567","Cyprus","CY","Plant-based fibers","exio" +"25568","Cyprus","CY","Crops nec","exio" +"25569","Cyprus","CY","Cattle","exio" +"25570","Cyprus","CY","Pigs","exio" +"25571","Cyprus","CY","Poultry","exio" +"25572","Cyprus","CY","Meat animals nec","exio" +"25573","Cyprus","CY","Animal products nec","exio" +"25574","Cyprus","CY","Raw milk","exio" +"25575","Cyprus","CY","Wool, silk-worm cocoons","exio" +"25576","Cyprus","CY","Manure (conventional treatment)","exio" +"25577","Cyprus","CY","Manure (biogas treatment)","exio" +"25578","Cyprus","CY","Products of forestry, logging and related services","exio" +"25579","Cyprus","CY","Fish and other fishing products; services incidental of fishing","exio" +"25580","Cyprus","CY","Anthracite","exio" +"25581","Cyprus","CY","Coking Coal","exio" +"25582","Cyprus","CY","Other Bituminous Coal","exio" +"25583","Cyprus","CY","Sub-Bituminous Coal","exio" +"25584","Cyprus","CY","Patent Fuel","exio" +"25585","Cyprus","CY","Lignite/Brown Coal","exio" +"25586","Cyprus","CY","BKB/Peat Briquettes","exio" +"25587","Cyprus","CY","Peat","exio" +"25588","Cyprus","CY","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"25589","Cyprus","CY","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"25590","Cyprus","CY","Natural Gas Liquids","exio" +"25591","Cyprus","CY","Other Hydrocarbons","exio" +"25592","Cyprus","CY","Uranium and thorium ores","exio" +"25593","Cyprus","CY","Iron ores","exio" +"25594","Cyprus","CY","Copper ores and concentrates","exio" +"25595","Cyprus","CY","Nickel ores and concentrates","exio" +"25596","Cyprus","CY","Aluminium ores and concentrates","exio" +"25597","Cyprus","CY","Precious metal ores and concentrates","exio" +"25598","Cyprus","CY","Lead, zinc and tin ores and concentrates","exio" +"25599","Cyprus","CY","Other non-ferrous metal ores and concentrates","exio" +"25600","Cyprus","CY","Stone","exio" +"25601","Cyprus","CY","Sand and clay","exio" +"25602","Cyprus","CY","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"25603","Cyprus","CY","Products of meat cattle","exio" +"25604","Cyprus","CY","Products of meat pigs","exio" +"25605","Cyprus","CY","Products of meat poultry","exio" +"25606","Cyprus","CY","Meat products nec","exio" +"25607","Cyprus","CY","products of Vegetable oils and fats","exio" +"25608","Cyprus","CY","Dairy products","exio" +"25609","Cyprus","CY","Processed rice","exio" +"25610","Cyprus","CY","Sugar","exio" +"25611","Cyprus","CY","Food products nec","exio" +"25612","Cyprus","CY","Beverages","exio" +"25613","Cyprus","CY","Fish products","exio" +"25614","Cyprus","CY","Tobacco products","exio" +"25615","Cyprus","CY","Textiles","exio" +"25616","Cyprus","CY","Wearing apparel; furs","exio" +"25617","Cyprus","CY","Leather and leather products","exio" +"25618","Cyprus","CY","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"25619","Cyprus","CY","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"25620","Cyprus","CY","Pulp","exio" +"25621","Cyprus","CY","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"25622","Cyprus","CY","Paper and paper products","exio" +"25623","Cyprus","CY","Printed matter and recorded media","exio" +"25624","Cyprus","CY","Coke Oven Coke","exio" +"25625","Cyprus","CY","Gas Coke","exio" +"25626","Cyprus","CY","Coal Tar","exio" +"25627","Cyprus","CY","Motor Gasoline","exio" +"25628","Cyprus","CY","Aviation Gasoline","exio" +"25629","Cyprus","CY","Gasoline Type Jet Fuel","exio" +"25630","Cyprus","CY","Kerosene Type Jet Fuel","exio" +"25631","Cyprus","CY","Kerosene","exio" +"25632","Cyprus","CY","Gas/Diesel Oil","exio" +"25633","Cyprus","CY","Heavy Fuel Oil","exio" +"25634","Cyprus","CY","Refinery Gas","exio" +"25635","Cyprus","CY","Liquefied Petroleum Gases (LPG)","exio" +"25636","Cyprus","CY","Refinery Feedstocks","exio" +"25637","Cyprus","CY","Ethane","exio" +"25638","Cyprus","CY","Naphtha","exio" +"25639","Cyprus","CY","White Spirit & SBP","exio" +"25640","Cyprus","CY","Lubricants","exio" +"25641","Cyprus","CY","Bitumen","exio" +"25642","Cyprus","CY","Paraffin Waxes","exio" +"25643","Cyprus","CY","Petroleum Coke","exio" +"25644","Cyprus","CY","Non-specified Petroleum Products","exio" +"25645","Cyprus","CY","Nuclear fuel","exio" +"25646","Cyprus","CY","Plastics, basic","exio" +"25647","Cyprus","CY","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"25648","Cyprus","CY","N-fertiliser","exio" +"25649","Cyprus","CY","P- and other fertiliser","exio" +"25650","Cyprus","CY","Chemicals nec","exio" +"25651","Cyprus","CY","Charcoal","exio" +"25652","Cyprus","CY","Additives/Blending Components","exio" +"25653","Cyprus","CY","Biogasoline","exio" +"25654","Cyprus","CY","Biodiesels","exio" +"25655","Cyprus","CY","Other Liquid Biofuels","exio" +"25656","Cyprus","CY","Rubber and plastic products","exio" +"25657","Cyprus","CY","Glass and glass products","exio" +"25658","Cyprus","CY","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"25659","Cyprus","CY","Ceramic goods","exio" +"25660","Cyprus","CY","Bricks, tiles and construction products, in baked clay","exio" +"25661","Cyprus","CY","Cement, lime and plaster","exio" +"25662","Cyprus","CY","Ash for treatment, Re-processing of ash into clinker","exio" +"25663","Cyprus","CY","Other non-metallic mineral products","exio" +"25664","Cyprus","CY","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"25665","Cyprus","CY","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"25666","Cyprus","CY","Precious metals","exio" +"25667","Cyprus","CY","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"25668","Cyprus","CY","Aluminium and aluminium products","exio" +"25669","Cyprus","CY","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"25670","Cyprus","CY","Lead, zinc and tin and products thereof","exio" +"25671","Cyprus","CY","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"25672","Cyprus","CY","Copper products","exio" +"25673","Cyprus","CY","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"25674","Cyprus","CY","Other non-ferrous metal products","exio" +"25675","Cyprus","CY","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"25676","Cyprus","CY","Foundry work services","exio" +"25677","Cyprus","CY","Fabricated metal products, except machinery and equipment","exio" +"25678","Cyprus","CY","Machinery and equipment n.e.c.","exio" +"25679","Cyprus","CY","Office machinery and computers","exio" +"25680","Cyprus","CY","Electrical machinery and apparatus n.e.c.","exio" +"25681","Cyprus","CY","Radio, television and communication equipment and apparatus","exio" +"25682","Cyprus","CY","Medical, precision and optical instruments, watches and clocks","exio" +"25683","Cyprus","CY","Motor vehicles, trailers and semi-trailers","exio" +"25684","Cyprus","CY","Other transport equipment","exio" +"25685","Cyprus","CY","Furniture; other manufactured goods n.e.c.","exio" +"25686","Cyprus","CY","Secondary raw materials","exio" +"25687","Cyprus","CY","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"25688","Cyprus","CY","Electricity by coal","exio" +"25689","Cyprus","CY","Electricity by gas","exio" +"25690","Cyprus","CY","Electricity by nuclear","exio" +"25691","Cyprus","CY","Electricity by hydro","exio" +"25692","Cyprus","CY","Electricity by wind","exio" +"25693","Cyprus","CY","Electricity by petroleum and other oil derivatives","exio" +"25694","Cyprus","CY","Electricity by biomass and waste","exio" +"25695","Cyprus","CY","Electricity by solar photovoltaic","exio" +"25696","Cyprus","CY","Electricity by solar thermal","exio" +"25697","Cyprus","CY","Electricity by tide, wave, ocean","exio" +"25698","Cyprus","CY","Electricity by Geothermal","exio" +"25699","Cyprus","CY","Electricity nec","exio" +"25700","Cyprus","CY","Transmission services of electricity","exio" +"25701","Cyprus","CY","Distribution and trade services of electricity","exio" +"25702","Cyprus","CY","Coke oven gas","exio" +"25703","Cyprus","CY","Blast Furnace Gas","exio" +"25704","Cyprus","CY","Oxygen Steel Furnace Gas","exio" +"25705","Cyprus","CY","Gas Works Gas","exio" +"25706","Cyprus","CY","Biogas","exio" +"25707","Cyprus","CY","Distribution services of gaseous fuels through mains","exio" +"25708","Cyprus","CY","Steam and hot water supply services","exio" +"25709","Cyprus","CY","Collected and purified water, distribution services of water","exio" +"25710","Cyprus","CY","Construction work","exio" +"25711","Cyprus","CY","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"25712","Cyprus","CY","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"25713","Cyprus","CY","Retail trade services of motor fuel","exio" +"25714","Cyprus","CY","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"25715","Cyprus","CY","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"25716","Cyprus","CY","Hotel and restaurant services","exio" +"25717","Cyprus","CY","Railway transportation services","exio" +"25718","Cyprus","CY","Other land transportation services","exio" +"25719","Cyprus","CY","Transportation services via pipelines","exio" +"25720","Cyprus","CY","Sea and coastal water transportation services","exio" +"25721","Cyprus","CY","Inland water transportation services","exio" +"25722","Cyprus","CY","Air transport services","exio" +"25723","Cyprus","CY","Supporting and auxiliary transport services; travel agency services","exio" +"25724","Cyprus","CY","Post and telecommunication services","exio" +"25725","Cyprus","CY","Financial intermediation services, except insurance and pension funding services","exio" +"25726","Cyprus","CY","Insurance and pension funding services, except compulsory social security services","exio" +"25727","Cyprus","CY","Services auxiliary to financial intermediation","exio" +"25728","Cyprus","CY","Real estate services","exio" +"25729","Cyprus","CY","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"25730","Cyprus","CY","Computer and related services","exio" +"25731","Cyprus","CY","Research and development services","exio" +"25732","Cyprus","CY","Other business services","exio" +"25733","Cyprus","CY","Public administration and defence services; compulsory social security services","exio" +"25734","Cyprus","CY","Education services","exio" +"25735","Cyprus","CY","Health and social work services","exio" +"25736","Cyprus","CY","Food waste for treatment: incineration","exio" +"25737","Cyprus","CY","Paper waste for treatment: incineration","exio" +"25738","Cyprus","CY","Plastic waste for treatment: incineration","exio" +"25739","Cyprus","CY","Intert/metal waste for treatment: incineration","exio" +"25740","Cyprus","CY","Textiles waste for treatment: incineration","exio" +"25741","Cyprus","CY","Wood waste for treatment: incineration","exio" +"25742","Cyprus","CY","Oil/hazardous waste for treatment: incineration","exio" +"25743","Cyprus","CY","Food waste for treatment: biogasification and land application","exio" +"25744","Cyprus","CY","Paper waste for treatment: biogasification and land application","exio" +"25745","Cyprus","CY","Sewage sludge for treatment: biogasification and land application","exio" +"25746","Cyprus","CY","Food waste for treatment: composting and land application","exio" +"25747","Cyprus","CY","Paper and wood waste for treatment: composting and land application","exio" +"25748","Cyprus","CY","Food waste for treatment: waste water treatment","exio" +"25749","Cyprus","CY","Other waste for treatment: waste water treatment","exio" +"25750","Cyprus","CY","Food waste for treatment: landfill","exio" +"25751","Cyprus","CY","Paper for treatment: landfill","exio" +"25752","Cyprus","CY","Plastic waste for treatment: landfill","exio" +"25753","Cyprus","CY","Inert/metal/hazardous waste for treatment: landfill","exio" +"25754","Cyprus","CY","Textiles waste for treatment: landfill","exio" +"25755","Cyprus","CY","Wood waste for treatment: landfill","exio" +"25756","Cyprus","CY","Membership organisation services n.e.c.","exio" +"25757","Cyprus","CY","Recreational, cultural and sporting services","exio" +"25758","Cyprus","CY","Other services","exio" +"25759","Cyprus","CY","Private households with employed persons","exio" +"25760","Cyprus","CY","Extra-territorial organizations and bodies","exio" +"25761","Czech Republic","CZ","Paddy rice","exio" +"25762","Czech Republic","CZ","Wheat","exio" +"25763","Czech Republic","CZ","Cereal grains nec","exio" +"25764","Czech Republic","CZ","Vegetables, fruit, nuts","exio" +"25765","Czech Republic","CZ","Oil seeds","exio" +"25766","Czech Republic","CZ","Sugar cane, sugar beet","exio" +"25767","Czech Republic","CZ","Plant-based fibers","exio" +"25768","Czech Republic","CZ","Crops nec","exio" +"25769","Czech Republic","CZ","Cattle","exio" +"25770","Czech Republic","CZ","Pigs","exio" +"25771","Czech Republic","CZ","Poultry","exio" +"25772","Czech Republic","CZ","Meat animals nec","exio" +"25773","Czech Republic","CZ","Animal products nec","exio" +"25774","Czech Republic","CZ","Raw milk","exio" +"25775","Czech Republic","CZ","Wool, silk-worm cocoons","exio" +"25776","Czech Republic","CZ","Manure (conventional treatment)","exio" +"25777","Czech Republic","CZ","Manure (biogas treatment)","exio" +"25778","Czech Republic","CZ","Products of forestry, logging and related services","exio" +"25779","Czech Republic","CZ","Fish and other fishing products; services incidental of fishing","exio" +"25780","Czech Republic","CZ","Anthracite","exio" +"25781","Czech Republic","CZ","Coking Coal","exio" +"25782","Czech Republic","CZ","Other Bituminous Coal","exio" +"25783","Czech Republic","CZ","Sub-Bituminous Coal","exio" +"25784","Czech Republic","CZ","Patent Fuel","exio" +"25785","Czech Republic","CZ","Lignite/Brown Coal","exio" +"25786","Czech Republic","CZ","BKB/Peat Briquettes","exio" +"25787","Czech Republic","CZ","Peat","exio" +"25788","Czech Republic","CZ","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"25789","Czech Republic","CZ","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"25790","Czech Republic","CZ","Natural Gas Liquids","exio" +"25791","Czech Republic","CZ","Other Hydrocarbons","exio" +"25792","Czech Republic","CZ","Uranium and thorium ores","exio" +"25793","Czech Republic","CZ","Iron ores","exio" +"25794","Czech Republic","CZ","Copper ores and concentrates","exio" +"25795","Czech Republic","CZ","Nickel ores and concentrates","exio" +"25796","Czech Republic","CZ","Aluminium ores and concentrates","exio" +"25797","Czech Republic","CZ","Precious metal ores and concentrates","exio" +"25798","Czech Republic","CZ","Lead, zinc and tin ores and concentrates","exio" +"25799","Czech Republic","CZ","Other non-ferrous metal ores and concentrates","exio" +"25800","Czech Republic","CZ","Stone","exio" +"25801","Czech Republic","CZ","Sand and clay","exio" +"25802","Czech Republic","CZ","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"25803","Czech Republic","CZ","Products of meat cattle","exio" +"25804","Czech Republic","CZ","Products of meat pigs","exio" +"25805","Czech Republic","CZ","Products of meat poultry","exio" +"25806","Czech Republic","CZ","Meat products nec","exio" +"25807","Czech Republic","CZ","products of Vegetable oils and fats","exio" +"25808","Czech Republic","CZ","Dairy products","exio" +"25809","Czech Republic","CZ","Processed rice","exio" +"25810","Czech Republic","CZ","Sugar","exio" +"25811","Czech Republic","CZ","Food products nec","exio" +"25812","Czech Republic","CZ","Beverages","exio" +"25813","Czech Republic","CZ","Fish products","exio" +"25814","Czech Republic","CZ","Tobacco products","exio" +"25815","Czech Republic","CZ","Textiles","exio" +"25816","Czech Republic","CZ","Wearing apparel; furs","exio" +"25817","Czech Republic","CZ","Leather and leather products","exio" +"25818","Czech Republic","CZ","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"25819","Czech Republic","CZ","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"25820","Czech Republic","CZ","Pulp","exio" +"25821","Czech Republic","CZ","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"25822","Czech Republic","CZ","Paper and paper products","exio" +"25823","Czech Republic","CZ","Printed matter and recorded media","exio" +"25824","Czech Republic","CZ","Coke Oven Coke","exio" +"25825","Czech Republic","CZ","Gas Coke","exio" +"25826","Czech Republic","CZ","Coal Tar","exio" +"25827","Czech Republic","CZ","Motor Gasoline","exio" +"25828","Czech Republic","CZ","Aviation Gasoline","exio" +"25829","Czech Republic","CZ","Gasoline Type Jet Fuel","exio" +"25830","Czech Republic","CZ","Kerosene Type Jet Fuel","exio" +"25831","Czech Republic","CZ","Kerosene","exio" +"25832","Czech Republic","CZ","Gas/Diesel Oil","exio" +"25833","Czech Republic","CZ","Heavy Fuel Oil","exio" +"25834","Czech Republic","CZ","Refinery Gas","exio" +"25835","Czech Republic","CZ","Liquefied Petroleum Gases (LPG)","exio" +"25836","Czech Republic","CZ","Refinery Feedstocks","exio" +"25837","Czech Republic","CZ","Ethane","exio" +"25838","Czech Republic","CZ","Naphtha","exio" +"25839","Czech Republic","CZ","White Spirit & SBP","exio" +"25840","Czech Republic","CZ","Lubricants","exio" +"25841","Czech Republic","CZ","Bitumen","exio" +"25842","Czech Republic","CZ","Paraffin Waxes","exio" +"25843","Czech Republic","CZ","Petroleum Coke","exio" +"25844","Czech Republic","CZ","Non-specified Petroleum Products","exio" +"25845","Czech Republic","CZ","Nuclear fuel","exio" +"25846","Czech Republic","CZ","Plastics, basic","exio" +"25847","Czech Republic","CZ","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"25848","Czech Republic","CZ","N-fertiliser","exio" +"25849","Czech Republic","CZ","P- and other fertiliser","exio" +"25850","Czech Republic","CZ","Chemicals nec","exio" +"25851","Czech Republic","CZ","Charcoal","exio" +"25852","Czech Republic","CZ","Additives/Blending Components","exio" +"25853","Czech Republic","CZ","Biogasoline","exio" +"25854","Czech Republic","CZ","Biodiesels","exio" +"25855","Czech Republic","CZ","Other Liquid Biofuels","exio" +"25856","Czech Republic","CZ","Rubber and plastic products","exio" +"25857","Czech Republic","CZ","Glass and glass products","exio" +"25858","Czech Republic","CZ","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"25859","Czech Republic","CZ","Ceramic goods","exio" +"25860","Czech Republic","CZ","Bricks, tiles and construction products, in baked clay","exio" +"25861","Czech Republic","CZ","Cement, lime and plaster","exio" +"25862","Czech Republic","CZ","Ash for treatment, Re-processing of ash into clinker","exio" +"25863","Czech Republic","CZ","Other non-metallic mineral products","exio" +"25864","Czech Republic","CZ","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"25865","Czech Republic","CZ","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"25866","Czech Republic","CZ","Precious metals","exio" +"25867","Czech Republic","CZ","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"25868","Czech Republic","CZ","Aluminium and aluminium products","exio" +"25869","Czech Republic","CZ","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"25870","Czech Republic","CZ","Lead, zinc and tin and products thereof","exio" +"25871","Czech Republic","CZ","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"25872","Czech Republic","CZ","Copper products","exio" +"25873","Czech Republic","CZ","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"25874","Czech Republic","CZ","Other non-ferrous metal products","exio" +"25875","Czech Republic","CZ","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"25876","Czech Republic","CZ","Foundry work services","exio" +"25877","Czech Republic","CZ","Fabricated metal products, except machinery and equipment","exio" +"25878","Czech Republic","CZ","Machinery and equipment n.e.c.","exio" +"25879","Czech Republic","CZ","Office machinery and computers","exio" +"25880","Czech Republic","CZ","Electrical machinery and apparatus n.e.c.","exio" +"25881","Czech Republic","CZ","Radio, television and communication equipment and apparatus","exio" +"25882","Czech Republic","CZ","Medical, precision and optical instruments, watches and clocks","exio" +"25883","Czech Republic","CZ","Motor vehicles, trailers and semi-trailers","exio" +"25884","Czech Republic","CZ","Other transport equipment","exio" +"25885","Czech Republic","CZ","Furniture; other manufactured goods n.e.c.","exio" +"25886","Czech Republic","CZ","Secondary raw materials","exio" +"25887","Czech Republic","CZ","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"25888","Czech Republic","CZ","Electricity by coal","exio" +"25889","Czech Republic","CZ","Electricity by gas","exio" +"25890","Czech Republic","CZ","Electricity by nuclear","exio" +"25891","Czech Republic","CZ","Electricity by hydro","exio" +"25892","Czech Republic","CZ","Electricity by wind","exio" +"25893","Czech Republic","CZ","Electricity by petroleum and other oil derivatives","exio" +"25894","Czech Republic","CZ","Electricity by biomass and waste","exio" +"25895","Czech Republic","CZ","Electricity by solar photovoltaic","exio" +"25896","Czech Republic","CZ","Electricity by solar thermal","exio" +"25897","Czech Republic","CZ","Electricity by tide, wave, ocean","exio" +"25898","Czech Republic","CZ","Electricity by Geothermal","exio" +"25899","Czech Republic","CZ","Electricity nec","exio" +"25900","Czech Republic","CZ","Transmission services of electricity","exio" +"25901","Czech Republic","CZ","Distribution and trade services of electricity","exio" +"25902","Czech Republic","CZ","Coke oven gas","exio" +"25903","Czech Republic","CZ","Blast Furnace Gas","exio" +"25904","Czech Republic","CZ","Oxygen Steel Furnace Gas","exio" +"25905","Czech Republic","CZ","Gas Works Gas","exio" +"25906","Czech Republic","CZ","Biogas","exio" +"25907","Czech Republic","CZ","Distribution services of gaseous fuels through mains","exio" +"25908","Czech Republic","CZ","Steam and hot water supply services","exio" +"25909","Czech Republic","CZ","Collected and purified water, distribution services of water","exio" +"25910","Czech Republic","CZ","Construction work","exio" +"25911","Czech Republic","CZ","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"25912","Czech Republic","CZ","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"25913","Czech Republic","CZ","Retail trade services of motor fuel","exio" +"25914","Czech Republic","CZ","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"25915","Czech Republic","CZ","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"25916","Czech Republic","CZ","Hotel and restaurant services","exio" +"25917","Czech Republic","CZ","Railway transportation services","exio" +"25918","Czech Republic","CZ","Other land transportation services","exio" +"25919","Czech Republic","CZ","Transportation services via pipelines","exio" +"25920","Czech Republic","CZ","Sea and coastal water transportation services","exio" +"25921","Czech Republic","CZ","Inland water transportation services","exio" +"25922","Czech Republic","CZ","Air transport services","exio" +"25923","Czech Republic","CZ","Supporting and auxiliary transport services; travel agency services","exio" +"25924","Czech Republic","CZ","Post and telecommunication services","exio" +"25925","Czech Republic","CZ","Financial intermediation services, except insurance and pension funding services","exio" +"25926","Czech Republic","CZ","Insurance and pension funding services, except compulsory social security services","exio" +"25927","Czech Republic","CZ","Services auxiliary to financial intermediation","exio" +"25928","Czech Republic","CZ","Real estate services","exio" +"25929","Czech Republic","CZ","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"25930","Czech Republic","CZ","Computer and related services","exio" +"25931","Czech Republic","CZ","Research and development services","exio" +"25932","Czech Republic","CZ","Other business services","exio" +"25933","Czech Republic","CZ","Public administration and defence services; compulsory social security services","exio" +"25934","Czech Republic","CZ","Education services","exio" +"25935","Czech Republic","CZ","Health and social work services","exio" +"25936","Czech Republic","CZ","Food waste for treatment: incineration","exio" +"25937","Czech Republic","CZ","Paper waste for treatment: incineration","exio" +"25938","Czech Republic","CZ","Plastic waste for treatment: incineration","exio" +"25939","Czech Republic","CZ","Intert/metal waste for treatment: incineration","exio" +"25940","Czech Republic","CZ","Textiles waste for treatment: incineration","exio" +"25941","Czech Republic","CZ","Wood waste for treatment: incineration","exio" +"25942","Czech Republic","CZ","Oil/hazardous waste for treatment: incineration","exio" +"25943","Czech Republic","CZ","Food waste for treatment: biogasification and land application","exio" +"25944","Czech Republic","CZ","Paper waste for treatment: biogasification and land application","exio" +"25945","Czech Republic","CZ","Sewage sludge for treatment: biogasification and land application","exio" +"25946","Czech Republic","CZ","Food waste for treatment: composting and land application","exio" +"25947","Czech Republic","CZ","Paper and wood waste for treatment: composting and land application","exio" +"25948","Czech Republic","CZ","Food waste for treatment: waste water treatment","exio" +"25949","Czech Republic","CZ","Other waste for treatment: waste water treatment","exio" +"25950","Czech Republic","CZ","Food waste for treatment: landfill","exio" +"25951","Czech Republic","CZ","Paper for treatment: landfill","exio" +"25952","Czech Republic","CZ","Plastic waste for treatment: landfill","exio" +"25953","Czech Republic","CZ","Inert/metal/hazardous waste for treatment: landfill","exio" +"25954","Czech Republic","CZ","Textiles waste for treatment: landfill","exio" +"25955","Czech Republic","CZ","Wood waste for treatment: landfill","exio" +"25956","Czech Republic","CZ","Membership organisation services n.e.c.","exio" +"25957","Czech Republic","CZ","Recreational, cultural and sporting services","exio" +"25958","Czech Republic","CZ","Other services","exio" +"25959","Czech Republic","CZ","Private households with employed persons","exio" +"25960","Czech Republic","CZ","Extra-territorial organizations and bodies","exio" +"25961","Germany","DE","Paddy rice","exio" +"25962","Germany","DE","Wheat","exio" +"25963","Germany","DE","Cereal grains nec","exio" +"25964","Germany","DE","Vegetables, fruit, nuts","exio" +"25965","Germany","DE","Oil seeds","exio" +"25966","Germany","DE","Sugar cane, sugar beet","exio" +"25967","Germany","DE","Plant-based fibers","exio" +"25968","Germany","DE","Crops nec","exio" +"25969","Germany","DE","Cattle","exio" +"25970","Germany","DE","Pigs","exio" +"25971","Germany","DE","Poultry","exio" +"25972","Germany","DE","Meat animals nec","exio" +"25973","Germany","DE","Animal products nec","exio" +"25974","Germany","DE","Raw milk","exio" +"25975","Germany","DE","Wool, silk-worm cocoons","exio" +"25976","Germany","DE","Manure (conventional treatment)","exio" +"25977","Germany","DE","Manure (biogas treatment)","exio" +"25978","Germany","DE","Products of forestry, logging and related services","exio" +"25979","Germany","DE","Fish and other fishing products; services incidental of fishing","exio" +"25980","Germany","DE","Anthracite","exio" +"25981","Germany","DE","Coking Coal","exio" +"25982","Germany","DE","Other Bituminous Coal","exio" +"25983","Germany","DE","Sub-Bituminous Coal","exio" +"25984","Germany","DE","Patent Fuel","exio" +"25985","Germany","DE","Lignite/Brown Coal","exio" +"25986","Germany","DE","BKB/Peat Briquettes","exio" +"25987","Germany","DE","Peat","exio" +"25988","Germany","DE","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"25989","Germany","DE","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"25990","Germany","DE","Natural Gas Liquids","exio" +"25991","Germany","DE","Other Hydrocarbons","exio" +"25992","Germany","DE","Uranium and thorium ores","exio" +"25993","Germany","DE","Iron ores","exio" +"25994","Germany","DE","Copper ores and concentrates","exio" +"25995","Germany","DE","Nickel ores and concentrates","exio" +"25996","Germany","DE","Aluminium ores and concentrates","exio" +"25997","Germany","DE","Precious metal ores and concentrates","exio" +"25998","Germany","DE","Lead, zinc and tin ores and concentrates","exio" +"25999","Germany","DE","Other non-ferrous metal ores and concentrates","exio" +"26000","Germany","DE","Stone","exio" +"26001","Germany","DE","Sand and clay","exio" +"26002","Germany","DE","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"26003","Germany","DE","Products of meat cattle","exio" +"26004","Germany","DE","Products of meat pigs","exio" +"26005","Germany","DE","Products of meat poultry","exio" +"26006","Germany","DE","Meat products nec","exio" +"26007","Germany","DE","products of Vegetable oils and fats","exio" +"26008","Germany","DE","Dairy products","exio" +"26009","Germany","DE","Processed rice","exio" +"26010","Germany","DE","Sugar","exio" +"26011","Germany","DE","Food products nec","exio" +"26012","Germany","DE","Beverages","exio" +"26013","Germany","DE","Fish products","exio" +"26014","Germany","DE","Tobacco products","exio" +"26015","Germany","DE","Textiles","exio" +"26016","Germany","DE","Wearing apparel; furs","exio" +"26017","Germany","DE","Leather and leather products","exio" +"26018","Germany","DE","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"26019","Germany","DE","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"26020","Germany","DE","Pulp","exio" +"26021","Germany","DE","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"26022","Germany","DE","Paper and paper products","exio" +"26023","Germany","DE","Printed matter and recorded media","exio" +"26024","Germany","DE","Coke Oven Coke","exio" +"26025","Germany","DE","Gas Coke","exio" +"26026","Germany","DE","Coal Tar","exio" +"26027","Germany","DE","Motor Gasoline","exio" +"26028","Germany","DE","Aviation Gasoline","exio" +"26029","Germany","DE","Gasoline Type Jet Fuel","exio" +"26030","Germany","DE","Kerosene Type Jet Fuel","exio" +"26031","Germany","DE","Kerosene","exio" +"26032","Germany","DE","Gas/Diesel Oil","exio" +"26033","Germany","DE","Heavy Fuel Oil","exio" +"26034","Germany","DE","Refinery Gas","exio" +"26035","Germany","DE","Liquefied Petroleum Gases (LPG)","exio" +"26036","Germany","DE","Refinery Feedstocks","exio" +"26037","Germany","DE","Ethane","exio" +"26038","Germany","DE","Naphtha","exio" +"26039","Germany","DE","White Spirit & SBP","exio" +"26040","Germany","DE","Lubricants","exio" +"26041","Germany","DE","Bitumen","exio" +"26042","Germany","DE","Paraffin Waxes","exio" +"26043","Germany","DE","Petroleum Coke","exio" +"26044","Germany","DE","Non-specified Petroleum Products","exio" +"26045","Germany","DE","Nuclear fuel","exio" +"26046","Germany","DE","Plastics, basic","exio" +"26047","Germany","DE","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"26048","Germany","DE","N-fertiliser","exio" +"26049","Germany","DE","P- and other fertiliser","exio" +"26050","Germany","DE","Chemicals nec","exio" +"26051","Germany","DE","Charcoal","exio" +"26052","Germany","DE","Additives/Blending Components","exio" +"26053","Germany","DE","Biogasoline","exio" +"26054","Germany","DE","Biodiesels","exio" +"26055","Germany","DE","Other Liquid Biofuels","exio" +"26056","Germany","DE","Rubber and plastic products","exio" +"26057","Germany","DE","Glass and glass products","exio" +"26058","Germany","DE","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"26059","Germany","DE","Ceramic goods","exio" +"26060","Germany","DE","Bricks, tiles and construction products, in baked clay","exio" +"26061","Germany","DE","Cement, lime and plaster","exio" +"26062","Germany","DE","Ash for treatment, Re-processing of ash into clinker","exio" +"26063","Germany","DE","Other non-metallic mineral products","exio" +"26064","Germany","DE","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"26065","Germany","DE","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"26066","Germany","DE","Precious metals","exio" +"26067","Germany","DE","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"26068","Germany","DE","Aluminium and aluminium products","exio" +"26069","Germany","DE","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"26070","Germany","DE","Lead, zinc and tin and products thereof","exio" +"26071","Germany","DE","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"26072","Germany","DE","Copper products","exio" +"26073","Germany","DE","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"26074","Germany","DE","Other non-ferrous metal products","exio" +"26075","Germany","DE","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"26076","Germany","DE","Foundry work services","exio" +"26077","Germany","DE","Fabricated metal products, except machinery and equipment","exio" +"26078","Germany","DE","Machinery and equipment n.e.c.","exio" +"26079","Germany","DE","Office machinery and computers","exio" +"26080","Germany","DE","Electrical machinery and apparatus n.e.c.","exio" +"26081","Germany","DE","Radio, television and communication equipment and apparatus","exio" +"26082","Germany","DE","Medical, precision and optical instruments, watches and clocks","exio" +"26083","Germany","DE","Motor vehicles, trailers and semi-trailers","exio" +"26084","Germany","DE","Other transport equipment","exio" +"26085","Germany","DE","Furniture; other manufactured goods n.e.c.","exio" +"26086","Germany","DE","Secondary raw materials","exio" +"26087","Germany","DE","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"26088","Germany","DE","Electricity by coal","exio" +"26089","Germany","DE","Electricity by gas","exio" +"26090","Germany","DE","Electricity by nuclear","exio" +"26091","Germany","DE","Electricity by hydro","exio" +"26092","Germany","DE","Electricity by wind","exio" +"26093","Germany","DE","Electricity by petroleum and other oil derivatives","exio" +"26094","Germany","DE","Electricity by biomass and waste","exio" +"26095","Germany","DE","Electricity by solar photovoltaic","exio" +"26096","Germany","DE","Electricity by solar thermal","exio" +"26097","Germany","DE","Electricity by tide, wave, ocean","exio" +"26098","Germany","DE","Electricity by Geothermal","exio" +"26099","Germany","DE","Electricity nec","exio" +"26100","Germany","DE","Transmission services of electricity","exio" +"26101","Germany","DE","Distribution and trade services of electricity","exio" +"26102","Germany","DE","Coke oven gas","exio" +"26103","Germany","DE","Blast Furnace Gas","exio" +"26104","Germany","DE","Oxygen Steel Furnace Gas","exio" +"26105","Germany","DE","Gas Works Gas","exio" +"26106","Germany","DE","Biogas","exio" +"26107","Germany","DE","Distribution services of gaseous fuels through mains","exio" +"26108","Germany","DE","Steam and hot water supply services","exio" +"26109","Germany","DE","Collected and purified water, distribution services of water","exio" +"26110","Germany","DE","Construction work","exio" +"26111","Germany","DE","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"26112","Germany","DE","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"26113","Germany","DE","Retail trade services of motor fuel","exio" +"26114","Germany","DE","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"26115","Germany","DE","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"26116","Germany","DE","Hotel and restaurant services","exio" +"26117","Germany","DE","Railway transportation services","exio" +"26118","Germany","DE","Other land transportation services","exio" +"26119","Germany","DE","Transportation services via pipelines","exio" +"26120","Germany","DE","Sea and coastal water transportation services","exio" +"26121","Germany","DE","Inland water transportation services","exio" +"26122","Germany","DE","Air transport services","exio" +"26123","Germany","DE","Supporting and auxiliary transport services; travel agency services","exio" +"26124","Germany","DE","Post and telecommunication services","exio" +"26125","Germany","DE","Financial intermediation services, except insurance and pension funding services","exio" +"26126","Germany","DE","Insurance and pension funding services, except compulsory social security services","exio" +"26127","Germany","DE","Services auxiliary to financial intermediation","exio" +"26128","Germany","DE","Real estate services","exio" +"26129","Germany","DE","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"26130","Germany","DE","Computer and related services","exio" +"26131","Germany","DE","Research and development services","exio" +"26132","Germany","DE","Other business services","exio" +"26133","Germany","DE","Public administration and defence services; compulsory social security services","exio" +"26134","Germany","DE","Education services","exio" +"26135","Germany","DE","Health and social work services","exio" +"26136","Germany","DE","Food waste for treatment: incineration","exio" +"26137","Germany","DE","Paper waste for treatment: incineration","exio" +"26138","Germany","DE","Plastic waste for treatment: incineration","exio" +"26139","Germany","DE","Intert/metal waste for treatment: incineration","exio" +"26140","Germany","DE","Textiles waste for treatment: incineration","exio" +"26141","Germany","DE","Wood waste for treatment: incineration","exio" +"26142","Germany","DE","Oil/hazardous waste for treatment: incineration","exio" +"26143","Germany","DE","Food waste for treatment: biogasification and land application","exio" +"26144","Germany","DE","Paper waste for treatment: biogasification and land application","exio" +"26145","Germany","DE","Sewage sludge for treatment: biogasification and land application","exio" +"26146","Germany","DE","Food waste for treatment: composting and land application","exio" +"26147","Germany","DE","Paper and wood waste for treatment: composting and land application","exio" +"26148","Germany","DE","Food waste for treatment: waste water treatment","exio" +"26149","Germany","DE","Other waste for treatment: waste water treatment","exio" +"26150","Germany","DE","Food waste for treatment: landfill","exio" +"26151","Germany","DE","Paper for treatment: landfill","exio" +"26152","Germany","DE","Plastic waste for treatment: landfill","exio" +"26153","Germany","DE","Inert/metal/hazardous waste for treatment: landfill","exio" +"26154","Germany","DE","Textiles waste for treatment: landfill","exio" +"26155","Germany","DE","Wood waste for treatment: landfill","exio" +"26156","Germany","DE","Membership organisation services n.e.c.","exio" +"26157","Germany","DE","Recreational, cultural and sporting services","exio" +"26158","Germany","DE","Other services","exio" +"26159","Germany","DE","Private households with employed persons","exio" +"26160","Germany","DE","Extra-territorial organizations and bodies","exio" +"26161","Denmark","DK","Paddy rice","exio" +"26162","Denmark","DK","Wheat","exio" +"26163","Denmark","DK","Cereal grains nec","exio" +"26164","Denmark","DK","Vegetables, fruit, nuts","exio" +"26165","Denmark","DK","Oil seeds","exio" +"26166","Denmark","DK","Sugar cane, sugar beet","exio" +"26167","Denmark","DK","Plant-based fibers","exio" +"26168","Denmark","DK","Crops nec","exio" +"26169","Denmark","DK","Cattle","exio" +"26170","Denmark","DK","Pigs","exio" +"26171","Denmark","DK","Poultry","exio" +"26172","Denmark","DK","Meat animals nec","exio" +"26173","Denmark","DK","Animal products nec","exio" +"26174","Denmark","DK","Raw milk","exio" +"26175","Denmark","DK","Wool, silk-worm cocoons","exio" +"26176","Denmark","DK","Manure (conventional treatment)","exio" +"26177","Denmark","DK","Manure (biogas treatment)","exio" +"26178","Denmark","DK","Products of forestry, logging and related services","exio" +"26179","Denmark","DK","Fish and other fishing products; services incidental of fishing","exio" +"26180","Denmark","DK","Anthracite","exio" +"26181","Denmark","DK","Coking Coal","exio" +"26182","Denmark","DK","Other Bituminous Coal","exio" +"26183","Denmark","DK","Sub-Bituminous Coal","exio" +"26184","Denmark","DK","Patent Fuel","exio" +"26185","Denmark","DK","Lignite/Brown Coal","exio" +"26186","Denmark","DK","BKB/Peat Briquettes","exio" +"26187","Denmark","DK","Peat","exio" +"26188","Denmark","DK","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"26189","Denmark","DK","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"26190","Denmark","DK","Natural Gas Liquids","exio" +"26191","Denmark","DK","Other Hydrocarbons","exio" +"26192","Denmark","DK","Uranium and thorium ores","exio" +"26193","Denmark","DK","Iron ores","exio" +"26194","Denmark","DK","Copper ores and concentrates","exio" +"26195","Denmark","DK","Nickel ores and concentrates","exio" +"26196","Denmark","DK","Aluminium ores and concentrates","exio" +"26197","Denmark","DK","Precious metal ores and concentrates","exio" +"26198","Denmark","DK","Lead, zinc and tin ores and concentrates","exio" +"26199","Denmark","DK","Other non-ferrous metal ores and concentrates","exio" +"26200","Denmark","DK","Stone","exio" +"26201","Denmark","DK","Sand and clay","exio" +"26202","Denmark","DK","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"26203","Denmark","DK","Products of meat cattle","exio" +"26204","Denmark","DK","Products of meat pigs","exio" +"26205","Denmark","DK","Products of meat poultry","exio" +"26206","Denmark","DK","Meat products nec","exio" +"26207","Denmark","DK","products of Vegetable oils and fats","exio" +"26208","Denmark","DK","Dairy products","exio" +"26209","Denmark","DK","Processed rice","exio" +"26210","Denmark","DK","Sugar","exio" +"26211","Denmark","DK","Food products nec","exio" +"26212","Denmark","DK","Beverages","exio" +"26213","Denmark","DK","Fish products","exio" +"26214","Denmark","DK","Tobacco products","exio" +"26215","Denmark","DK","Textiles","exio" +"26216","Denmark","DK","Wearing apparel; furs","exio" +"26217","Denmark","DK","Leather and leather products","exio" +"26218","Denmark","DK","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"26219","Denmark","DK","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"26220","Denmark","DK","Pulp","exio" +"26221","Denmark","DK","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"26222","Denmark","DK","Paper and paper products","exio" +"26223","Denmark","DK","Printed matter and recorded media","exio" +"26224","Denmark","DK","Coke Oven Coke","exio" +"26225","Denmark","DK","Gas Coke","exio" +"26226","Denmark","DK","Coal Tar","exio" +"26227","Denmark","DK","Motor Gasoline","exio" +"26228","Denmark","DK","Aviation Gasoline","exio" +"26229","Denmark","DK","Gasoline Type Jet Fuel","exio" +"26230","Denmark","DK","Kerosene Type Jet Fuel","exio" +"26231","Denmark","DK","Kerosene","exio" +"26232","Denmark","DK","Gas/Diesel Oil","exio" +"26233","Denmark","DK","Heavy Fuel Oil","exio" +"26234","Denmark","DK","Refinery Gas","exio" +"26235","Denmark","DK","Liquefied Petroleum Gases (LPG)","exio" +"26236","Denmark","DK","Refinery Feedstocks","exio" +"26237","Denmark","DK","Ethane","exio" +"26238","Denmark","DK","Naphtha","exio" +"26239","Denmark","DK","White Spirit & SBP","exio" +"26240","Denmark","DK","Lubricants","exio" +"26241","Denmark","DK","Bitumen","exio" +"26242","Denmark","DK","Paraffin Waxes","exio" +"26243","Denmark","DK","Petroleum Coke","exio" +"26244","Denmark","DK","Non-specified Petroleum Products","exio" +"26245","Denmark","DK","Nuclear fuel","exio" +"26246","Denmark","DK","Plastics, basic","exio" +"26247","Denmark","DK","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"26248","Denmark","DK","N-fertiliser","exio" +"26249","Denmark","DK","P- and other fertiliser","exio" +"26250","Denmark","DK","Chemicals nec","exio" +"26251","Denmark","DK","Charcoal","exio" +"26252","Denmark","DK","Additives/Blending Components","exio" +"26253","Denmark","DK","Biogasoline","exio" +"26254","Denmark","DK","Biodiesels","exio" +"26255","Denmark","DK","Other Liquid Biofuels","exio" +"26256","Denmark","DK","Rubber and plastic products","exio" +"26257","Denmark","DK","Glass and glass products","exio" +"26258","Denmark","DK","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"26259","Denmark","DK","Ceramic goods","exio" +"26260","Denmark","DK","Bricks, tiles and construction products, in baked clay","exio" +"26261","Denmark","DK","Cement, lime and plaster","exio" +"26262","Denmark","DK","Ash for treatment, Re-processing of ash into clinker","exio" +"26263","Denmark","DK","Other non-metallic mineral products","exio" +"26264","Denmark","DK","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"26265","Denmark","DK","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"26266","Denmark","DK","Precious metals","exio" +"26267","Denmark","DK","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"26268","Denmark","DK","Aluminium and aluminium products","exio" +"26269","Denmark","DK","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"26270","Denmark","DK","Lead, zinc and tin and products thereof","exio" +"26271","Denmark","DK","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"26272","Denmark","DK","Copper products","exio" +"26273","Denmark","DK","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"26274","Denmark","DK","Other non-ferrous metal products","exio" +"26275","Denmark","DK","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"26276","Denmark","DK","Foundry work services","exio" +"26277","Denmark","DK","Fabricated metal products, except machinery and equipment","exio" +"26278","Denmark","DK","Machinery and equipment n.e.c.","exio" +"26279","Denmark","DK","Office machinery and computers","exio" +"26280","Denmark","DK","Electrical machinery and apparatus n.e.c.","exio" +"26281","Denmark","DK","Radio, television and communication equipment and apparatus","exio" +"26282","Denmark","DK","Medical, precision and optical instruments, watches and clocks","exio" +"26283","Denmark","DK","Motor vehicles, trailers and semi-trailers","exio" +"26284","Denmark","DK","Other transport equipment","exio" +"26285","Denmark","DK","Furniture; other manufactured goods n.e.c.","exio" +"26286","Denmark","DK","Secondary raw materials","exio" +"26287","Denmark","DK","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"26288","Denmark","DK","Electricity by coal","exio" +"26289","Denmark","DK","Electricity by gas","exio" +"26290","Denmark","DK","Electricity by nuclear","exio" +"26291","Denmark","DK","Electricity by hydro","exio" +"26292","Denmark","DK","Electricity by wind","exio" +"26293","Denmark","DK","Electricity by petroleum and other oil derivatives","exio" +"26294","Denmark","DK","Electricity by biomass and waste","exio" +"26295","Denmark","DK","Electricity by solar photovoltaic","exio" +"26296","Denmark","DK","Electricity by solar thermal","exio" +"26297","Denmark","DK","Electricity by tide, wave, ocean","exio" +"26298","Denmark","DK","Electricity by Geothermal","exio" +"26299","Denmark","DK","Electricity nec","exio" +"26300","Denmark","DK","Transmission services of electricity","exio" +"26301","Denmark","DK","Distribution and trade services of electricity","exio" +"26302","Denmark","DK","Coke oven gas","exio" +"26303","Denmark","DK","Blast Furnace Gas","exio" +"26304","Denmark","DK","Oxygen Steel Furnace Gas","exio" +"26305","Denmark","DK","Gas Works Gas","exio" +"26306","Denmark","DK","Biogas","exio" +"26307","Denmark","DK","Distribution services of gaseous fuels through mains","exio" +"26308","Denmark","DK","Steam and hot water supply services","exio" +"26309","Denmark","DK","Collected and purified water, distribution services of water","exio" +"26310","Denmark","DK","Construction work","exio" +"26311","Denmark","DK","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"26312","Denmark","DK","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"26313","Denmark","DK","Retail trade services of motor fuel","exio" +"26314","Denmark","DK","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"26315","Denmark","DK","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"26316","Denmark","DK","Hotel and restaurant services","exio" +"26317","Denmark","DK","Railway transportation services","exio" +"26318","Denmark","DK","Other land transportation services","exio" +"26319","Denmark","DK","Transportation services via pipelines","exio" +"26320","Denmark","DK","Sea and coastal water transportation services","exio" +"26321","Denmark","DK","Inland water transportation services","exio" +"26322","Denmark","DK","Air transport services","exio" +"26323","Denmark","DK","Supporting and auxiliary transport services; travel agency services","exio" +"26324","Denmark","DK","Post and telecommunication services","exio" +"26325","Denmark","DK","Financial intermediation services, except insurance and pension funding services","exio" +"26326","Denmark","DK","Insurance and pension funding services, except compulsory social security services","exio" +"26327","Denmark","DK","Services auxiliary to financial intermediation","exio" +"26328","Denmark","DK","Real estate services","exio" +"26329","Denmark","DK","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"26330","Denmark","DK","Computer and related services","exio" +"26331","Denmark","DK","Research and development services","exio" +"26332","Denmark","DK","Other business services","exio" +"26333","Denmark","DK","Public administration and defence services; compulsory social security services","exio" +"26334","Denmark","DK","Education services","exio" +"26335","Denmark","DK","Health and social work services","exio" +"26336","Denmark","DK","Food waste for treatment: incineration","exio" +"26337","Denmark","DK","Paper waste for treatment: incineration","exio" +"26338","Denmark","DK","Plastic waste for treatment: incineration","exio" +"26339","Denmark","DK","Intert/metal waste for treatment: incineration","exio" +"26340","Denmark","DK","Textiles waste for treatment: incineration","exio" +"26341","Denmark","DK","Wood waste for treatment: incineration","exio" +"26342","Denmark","DK","Oil/hazardous waste for treatment: incineration","exio" +"26343","Denmark","DK","Food waste for treatment: biogasification and land application","exio" +"26344","Denmark","DK","Paper waste for treatment: biogasification and land application","exio" +"26345","Denmark","DK","Sewage sludge for treatment: biogasification and land application","exio" +"26346","Denmark","DK","Food waste for treatment: composting and land application","exio" +"26347","Denmark","DK","Paper and wood waste for treatment: composting and land application","exio" +"26348","Denmark","DK","Food waste for treatment: waste water treatment","exio" +"26349","Denmark","DK","Other waste for treatment: waste water treatment","exio" +"26350","Denmark","DK","Food waste for treatment: landfill","exio" +"26351","Denmark","DK","Paper for treatment: landfill","exio" +"26352","Denmark","DK","Plastic waste for treatment: landfill","exio" +"26353","Denmark","DK","Inert/metal/hazardous waste for treatment: landfill","exio" +"26354","Denmark","DK","Textiles waste for treatment: landfill","exio" +"26355","Denmark","DK","Wood waste for treatment: landfill","exio" +"26356","Denmark","DK","Membership organisation services n.e.c.","exio" +"26357","Denmark","DK","Recreational, cultural and sporting services","exio" +"26358","Denmark","DK","Other services","exio" +"26359","Denmark","DK","Private households with employed persons","exio" +"26360","Denmark","DK","Extra-territorial organizations and bodies","exio" +"26361","Estonia","EE","Paddy rice","exio" +"26362","Estonia","EE","Wheat","exio" +"26363","Estonia","EE","Cereal grains nec","exio" +"26364","Estonia","EE","Vegetables, fruit, nuts","exio" +"26365","Estonia","EE","Oil seeds","exio" +"26366","Estonia","EE","Sugar cane, sugar beet","exio" +"26367","Estonia","EE","Plant-based fibers","exio" +"26368","Estonia","EE","Crops nec","exio" +"26369","Estonia","EE","Cattle","exio" +"26370","Estonia","EE","Pigs","exio" +"26371","Estonia","EE","Poultry","exio" +"26372","Estonia","EE","Meat animals nec","exio" +"26373","Estonia","EE","Animal products nec","exio" +"26374","Estonia","EE","Raw milk","exio" +"26375","Estonia","EE","Wool, silk-worm cocoons","exio" +"26376","Estonia","EE","Manure (conventional treatment)","exio" +"26377","Estonia","EE","Manure (biogas treatment)","exio" +"26378","Estonia","EE","Products of forestry, logging and related services","exio" +"26379","Estonia","EE","Fish and other fishing products; services incidental of fishing","exio" +"26380","Estonia","EE","Anthracite","exio" +"26381","Estonia","EE","Coking Coal","exio" +"26382","Estonia","EE","Other Bituminous Coal","exio" +"26383","Estonia","EE","Sub-Bituminous Coal","exio" +"26384","Estonia","EE","Patent Fuel","exio" +"26385","Estonia","EE","Lignite/Brown Coal","exio" +"26386","Estonia","EE","BKB/Peat Briquettes","exio" +"26387","Estonia","EE","Peat","exio" +"26388","Estonia","EE","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"26389","Estonia","EE","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"26390","Estonia","EE","Natural Gas Liquids","exio" +"26391","Estonia","EE","Other Hydrocarbons","exio" +"26392","Estonia","EE","Uranium and thorium ores","exio" +"26393","Estonia","EE","Iron ores","exio" +"26394","Estonia","EE","Copper ores and concentrates","exio" +"26395","Estonia","EE","Nickel ores and concentrates","exio" +"26396","Estonia","EE","Aluminium ores and concentrates","exio" +"26397","Estonia","EE","Precious metal ores and concentrates","exio" +"26398","Estonia","EE","Lead, zinc and tin ores and concentrates","exio" +"26399","Estonia","EE","Other non-ferrous metal ores and concentrates","exio" +"26400","Estonia","EE","Stone","exio" +"26401","Estonia","EE","Sand and clay","exio" +"26402","Estonia","EE","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"26403","Estonia","EE","Products of meat cattle","exio" +"26404","Estonia","EE","Products of meat pigs","exio" +"26405","Estonia","EE","Products of meat poultry","exio" +"26406","Estonia","EE","Meat products nec","exio" +"26407","Estonia","EE","products of Vegetable oils and fats","exio" +"26408","Estonia","EE","Dairy products","exio" +"26409","Estonia","EE","Processed rice","exio" +"26410","Estonia","EE","Sugar","exio" +"26411","Estonia","EE","Food products nec","exio" +"26412","Estonia","EE","Beverages","exio" +"26413","Estonia","EE","Fish products","exio" +"26414","Estonia","EE","Tobacco products","exio" +"26415","Estonia","EE","Textiles","exio" +"26416","Estonia","EE","Wearing apparel; furs","exio" +"26417","Estonia","EE","Leather and leather products","exio" +"26418","Estonia","EE","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"26419","Estonia","EE","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"26420","Estonia","EE","Pulp","exio" +"26421","Estonia","EE","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"26422","Estonia","EE","Paper and paper products","exio" +"26423","Estonia","EE","Printed matter and recorded media","exio" +"26424","Estonia","EE","Coke Oven Coke","exio" +"26425","Estonia","EE","Gas Coke","exio" +"26426","Estonia","EE","Coal Tar","exio" +"26427","Estonia","EE","Motor Gasoline","exio" +"26428","Estonia","EE","Aviation Gasoline","exio" +"26429","Estonia","EE","Gasoline Type Jet Fuel","exio" +"26430","Estonia","EE","Kerosene Type Jet Fuel","exio" +"26431","Estonia","EE","Kerosene","exio" +"26432","Estonia","EE","Gas/Diesel Oil","exio" +"26433","Estonia","EE","Heavy Fuel Oil","exio" +"26434","Estonia","EE","Refinery Gas","exio" +"26435","Estonia","EE","Liquefied Petroleum Gases (LPG)","exio" +"26436","Estonia","EE","Refinery Feedstocks","exio" +"26437","Estonia","EE","Ethane","exio" +"26438","Estonia","EE","Naphtha","exio" +"26439","Estonia","EE","White Spirit & SBP","exio" +"26440","Estonia","EE","Lubricants","exio" +"26441","Estonia","EE","Bitumen","exio" +"26442","Estonia","EE","Paraffin Waxes","exio" +"26443","Estonia","EE","Petroleum Coke","exio" +"26444","Estonia","EE","Non-specified Petroleum Products","exio" +"26445","Estonia","EE","Nuclear fuel","exio" +"26446","Estonia","EE","Plastics, basic","exio" +"26447","Estonia","EE","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"26448","Estonia","EE","N-fertiliser","exio" +"26449","Estonia","EE","P- and other fertiliser","exio" +"26450","Estonia","EE","Chemicals nec","exio" +"26451","Estonia","EE","Charcoal","exio" +"26452","Estonia","EE","Additives/Blending Components","exio" +"26453","Estonia","EE","Biogasoline","exio" +"26454","Estonia","EE","Biodiesels","exio" +"26455","Estonia","EE","Other Liquid Biofuels","exio" +"26456","Estonia","EE","Rubber and plastic products","exio" +"26457","Estonia","EE","Glass and glass products","exio" +"26458","Estonia","EE","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"26459","Estonia","EE","Ceramic goods","exio" +"26460","Estonia","EE","Bricks, tiles and construction products, in baked clay","exio" +"26461","Estonia","EE","Cement, lime and plaster","exio" +"26462","Estonia","EE","Ash for treatment, Re-processing of ash into clinker","exio" +"26463","Estonia","EE","Other non-metallic mineral products","exio" +"26464","Estonia","EE","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"26465","Estonia","EE","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"26466","Estonia","EE","Precious metals","exio" +"26467","Estonia","EE","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"26468","Estonia","EE","Aluminium and aluminium products","exio" +"26469","Estonia","EE","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"26470","Estonia","EE","Lead, zinc and tin and products thereof","exio" +"26471","Estonia","EE","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"26472","Estonia","EE","Copper products","exio" +"26473","Estonia","EE","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"26474","Estonia","EE","Other non-ferrous metal products","exio" +"26475","Estonia","EE","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"26476","Estonia","EE","Foundry work services","exio" +"26477","Estonia","EE","Fabricated metal products, except machinery and equipment","exio" +"26478","Estonia","EE","Machinery and equipment n.e.c.","exio" +"26479","Estonia","EE","Office machinery and computers","exio" +"26480","Estonia","EE","Electrical machinery and apparatus n.e.c.","exio" +"26481","Estonia","EE","Radio, television and communication equipment and apparatus","exio" +"26482","Estonia","EE","Medical, precision and optical instruments, watches and clocks","exio" +"26483","Estonia","EE","Motor vehicles, trailers and semi-trailers","exio" +"26484","Estonia","EE","Other transport equipment","exio" +"26485","Estonia","EE","Furniture; other manufactured goods n.e.c.","exio" +"26486","Estonia","EE","Secondary raw materials","exio" +"26487","Estonia","EE","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"26488","Estonia","EE","Electricity by coal","exio" +"26489","Estonia","EE","Electricity by gas","exio" +"26490","Estonia","EE","Electricity by nuclear","exio" +"26491","Estonia","EE","Electricity by hydro","exio" +"26492","Estonia","EE","Electricity by wind","exio" +"26493","Estonia","EE","Electricity by petroleum and other oil derivatives","exio" +"26494","Estonia","EE","Electricity by biomass and waste","exio" +"26495","Estonia","EE","Electricity by solar photovoltaic","exio" +"26496","Estonia","EE","Electricity by solar thermal","exio" +"26497","Estonia","EE","Electricity by tide, wave, ocean","exio" +"26498","Estonia","EE","Electricity by Geothermal","exio" +"26499","Estonia","EE","Electricity nec","exio" +"26500","Estonia","EE","Transmission services of electricity","exio" +"26501","Estonia","EE","Distribution and trade services of electricity","exio" +"26502","Estonia","EE","Coke oven gas","exio" +"26503","Estonia","EE","Blast Furnace Gas","exio" +"26504","Estonia","EE","Oxygen Steel Furnace Gas","exio" +"26505","Estonia","EE","Gas Works Gas","exio" +"26506","Estonia","EE","Biogas","exio" +"26507","Estonia","EE","Distribution services of gaseous fuels through mains","exio" +"26508","Estonia","EE","Steam and hot water supply services","exio" +"26509","Estonia","EE","Collected and purified water, distribution services of water","exio" +"26510","Estonia","EE","Construction work","exio" +"26511","Estonia","EE","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"26512","Estonia","EE","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"26513","Estonia","EE","Retail trade services of motor fuel","exio" +"26514","Estonia","EE","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"26515","Estonia","EE","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"26516","Estonia","EE","Hotel and restaurant services","exio" +"26517","Estonia","EE","Railway transportation services","exio" +"26518","Estonia","EE","Other land transportation services","exio" +"26519","Estonia","EE","Transportation services via pipelines","exio" +"26520","Estonia","EE","Sea and coastal water transportation services","exio" +"26521","Estonia","EE","Inland water transportation services","exio" +"26522","Estonia","EE","Air transport services","exio" +"26523","Estonia","EE","Supporting and auxiliary transport services; travel agency services","exio" +"26524","Estonia","EE","Post and telecommunication services","exio" +"26525","Estonia","EE","Financial intermediation services, except insurance and pension funding services","exio" +"26526","Estonia","EE","Insurance and pension funding services, except compulsory social security services","exio" +"26527","Estonia","EE","Services auxiliary to financial intermediation","exio" +"26528","Estonia","EE","Real estate services","exio" +"26529","Estonia","EE","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"26530","Estonia","EE","Computer and related services","exio" +"26531","Estonia","EE","Research and development services","exio" +"26532","Estonia","EE","Other business services","exio" +"26533","Estonia","EE","Public administration and defence services; compulsory social security services","exio" +"26534","Estonia","EE","Education services","exio" +"26535","Estonia","EE","Health and social work services","exio" +"26536","Estonia","EE","Food waste for treatment: incineration","exio" +"26537","Estonia","EE","Paper waste for treatment: incineration","exio" +"26538","Estonia","EE","Plastic waste for treatment: incineration","exio" +"26539","Estonia","EE","Intert/metal waste for treatment: incineration","exio" +"26540","Estonia","EE","Textiles waste for treatment: incineration","exio" +"26541","Estonia","EE","Wood waste for treatment: incineration","exio" +"26542","Estonia","EE","Oil/hazardous waste for treatment: incineration","exio" +"26543","Estonia","EE","Food waste for treatment: biogasification and land application","exio" +"26544","Estonia","EE","Paper waste for treatment: biogasification and land application","exio" +"26545","Estonia","EE","Sewage sludge for treatment: biogasification and land application","exio" +"26546","Estonia","EE","Food waste for treatment: composting and land application","exio" +"26547","Estonia","EE","Paper and wood waste for treatment: composting and land application","exio" +"26548","Estonia","EE","Food waste for treatment: waste water treatment","exio" +"26549","Estonia","EE","Other waste for treatment: waste water treatment","exio" +"26550","Estonia","EE","Food waste for treatment: landfill","exio" +"26551","Estonia","EE","Paper for treatment: landfill","exio" +"26552","Estonia","EE","Plastic waste for treatment: landfill","exio" +"26553","Estonia","EE","Inert/metal/hazardous waste for treatment: landfill","exio" +"26554","Estonia","EE","Textiles waste for treatment: landfill","exio" +"26555","Estonia","EE","Wood waste for treatment: landfill","exio" +"26556","Estonia","EE","Membership organisation services n.e.c.","exio" +"26557","Estonia","EE","Recreational, cultural and sporting services","exio" +"26558","Estonia","EE","Other services","exio" +"26559","Estonia","EE","Private households with employed persons","exio" +"26560","Estonia","EE","Extra-territorial organizations and bodies","exio" +"26561","Spain","ES","Paddy rice","exio" +"26562","Spain","ES","Wheat","exio" +"26563","Spain","ES","Cereal grains nec","exio" +"26564","Spain","ES","Vegetables, fruit, nuts","exio" +"26565","Spain","ES","Oil seeds","exio" +"26566","Spain","ES","Sugar cane, sugar beet","exio" +"26567","Spain","ES","Plant-based fibers","exio" +"26568","Spain","ES","Crops nec","exio" +"26569","Spain","ES","Cattle","exio" +"26570","Spain","ES","Pigs","exio" +"26571","Spain","ES","Poultry","exio" +"26572","Spain","ES","Meat animals nec","exio" +"26573","Spain","ES","Animal products nec","exio" +"26574","Spain","ES","Raw milk","exio" +"26575","Spain","ES","Wool, silk-worm cocoons","exio" +"26576","Spain","ES","Manure (conventional treatment)","exio" +"26577","Spain","ES","Manure (biogas treatment)","exio" +"26578","Spain","ES","Products of forestry, logging and related services","exio" +"26579","Spain","ES","Fish and other fishing products; services incidental of fishing","exio" +"26580","Spain","ES","Anthracite","exio" +"26581","Spain","ES","Coking Coal","exio" +"26582","Spain","ES","Other Bituminous Coal","exio" +"26583","Spain","ES","Sub-Bituminous Coal","exio" +"26584","Spain","ES","Patent Fuel","exio" +"26585","Spain","ES","Lignite/Brown Coal","exio" +"26586","Spain","ES","BKB/Peat Briquettes","exio" +"26587","Spain","ES","Peat","exio" +"26588","Spain","ES","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"26589","Spain","ES","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"26590","Spain","ES","Natural Gas Liquids","exio" +"26591","Spain","ES","Other Hydrocarbons","exio" +"26592","Spain","ES","Uranium and thorium ores","exio" +"26593","Spain","ES","Iron ores","exio" +"26594","Spain","ES","Copper ores and concentrates","exio" +"26595","Spain","ES","Nickel ores and concentrates","exio" +"26596","Spain","ES","Aluminium ores and concentrates","exio" +"26597","Spain","ES","Precious metal ores and concentrates","exio" +"26598","Spain","ES","Lead, zinc and tin ores and concentrates","exio" +"26599","Spain","ES","Other non-ferrous metal ores and concentrates","exio" +"26600","Spain","ES","Stone","exio" +"26601","Spain","ES","Sand and clay","exio" +"26602","Spain","ES","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"26603","Spain","ES","Products of meat cattle","exio" +"26604","Spain","ES","Products of meat pigs","exio" +"26605","Spain","ES","Products of meat poultry","exio" +"26606","Spain","ES","Meat products nec","exio" +"26607","Spain","ES","products of Vegetable oils and fats","exio" +"26608","Spain","ES","Dairy products","exio" +"26609","Spain","ES","Processed rice","exio" +"26610","Spain","ES","Sugar","exio" +"26611","Spain","ES","Food products nec","exio" +"26612","Spain","ES","Beverages","exio" +"26613","Spain","ES","Fish products","exio" +"26614","Spain","ES","Tobacco products","exio" +"26615","Spain","ES","Textiles","exio" +"26616","Spain","ES","Wearing apparel; furs","exio" +"26617","Spain","ES","Leather and leather products","exio" +"26618","Spain","ES","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"26619","Spain","ES","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"26620","Spain","ES","Pulp","exio" +"26621","Spain","ES","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"26622","Spain","ES","Paper and paper products","exio" +"26623","Spain","ES","Printed matter and recorded media","exio" +"26624","Spain","ES","Coke Oven Coke","exio" +"26625","Spain","ES","Gas Coke","exio" +"26626","Spain","ES","Coal Tar","exio" +"26627","Spain","ES","Motor Gasoline","exio" +"26628","Spain","ES","Aviation Gasoline","exio" +"26629","Spain","ES","Gasoline Type Jet Fuel","exio" +"26630","Spain","ES","Kerosene Type Jet Fuel","exio" +"26631","Spain","ES","Kerosene","exio" +"26632","Spain","ES","Gas/Diesel Oil","exio" +"26633","Spain","ES","Heavy Fuel Oil","exio" +"26634","Spain","ES","Refinery Gas","exio" +"26635","Spain","ES","Liquefied Petroleum Gases (LPG)","exio" +"26636","Spain","ES","Refinery Feedstocks","exio" +"26637","Spain","ES","Ethane","exio" +"26638","Spain","ES","Naphtha","exio" +"26639","Spain","ES","White Spirit & SBP","exio" +"26640","Spain","ES","Lubricants","exio" +"26641","Spain","ES","Bitumen","exio" +"26642","Spain","ES","Paraffin Waxes","exio" +"26643","Spain","ES","Petroleum Coke","exio" +"26644","Spain","ES","Non-specified Petroleum Products","exio" +"26645","Spain","ES","Nuclear fuel","exio" +"26646","Spain","ES","Plastics, basic","exio" +"26647","Spain","ES","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"26648","Spain","ES","N-fertiliser","exio" +"26649","Spain","ES","P- and other fertiliser","exio" +"26650","Spain","ES","Chemicals nec","exio" +"26651","Spain","ES","Charcoal","exio" +"26652","Spain","ES","Additives/Blending Components","exio" +"26653","Spain","ES","Biogasoline","exio" +"26654","Spain","ES","Biodiesels","exio" +"26655","Spain","ES","Other Liquid Biofuels","exio" +"26656","Spain","ES","Rubber and plastic products","exio" +"26657","Spain","ES","Glass and glass products","exio" +"26658","Spain","ES","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"26659","Spain","ES","Ceramic goods","exio" +"26660","Spain","ES","Bricks, tiles and construction products, in baked clay","exio" +"26661","Spain","ES","Cement, lime and plaster","exio" +"26662","Spain","ES","Ash for treatment, Re-processing of ash into clinker","exio" +"26663","Spain","ES","Other non-metallic mineral products","exio" +"26664","Spain","ES","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"26665","Spain","ES","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"26666","Spain","ES","Precious metals","exio" +"26667","Spain","ES","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"26668","Spain","ES","Aluminium and aluminium products","exio" +"26669","Spain","ES","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"26670","Spain","ES","Lead, zinc and tin and products thereof","exio" +"26671","Spain","ES","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"26672","Spain","ES","Copper products","exio" +"26673","Spain","ES","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"26674","Spain","ES","Other non-ferrous metal products","exio" +"26675","Spain","ES","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"26676","Spain","ES","Foundry work services","exio" +"26677","Spain","ES","Fabricated metal products, except machinery and equipment","exio" +"26678","Spain","ES","Machinery and equipment n.e.c.","exio" +"26679","Spain","ES","Office machinery and computers","exio" +"26680","Spain","ES","Electrical machinery and apparatus n.e.c.","exio" +"26681","Spain","ES","Radio, television and communication equipment and apparatus","exio" +"26682","Spain","ES","Medical, precision and optical instruments, watches and clocks","exio" +"26683","Spain","ES","Motor vehicles, trailers and semi-trailers","exio" +"26684","Spain","ES","Other transport equipment","exio" +"26685","Spain","ES","Furniture; other manufactured goods n.e.c.","exio" +"26686","Spain","ES","Secondary raw materials","exio" +"26687","Spain","ES","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"26688","Spain","ES","Electricity by coal","exio" +"26689","Spain","ES","Electricity by gas","exio" +"26690","Spain","ES","Electricity by nuclear","exio" +"26691","Spain","ES","Electricity by hydro","exio" +"26692","Spain","ES","Electricity by wind","exio" +"26693","Spain","ES","Electricity by petroleum and other oil derivatives","exio" +"26694","Spain","ES","Electricity by biomass and waste","exio" +"26695","Spain","ES","Electricity by solar photovoltaic","exio" +"26696","Spain","ES","Electricity by solar thermal","exio" +"26697","Spain","ES","Electricity by tide, wave, ocean","exio" +"26698","Spain","ES","Electricity by Geothermal","exio" +"26699","Spain","ES","Electricity nec","exio" +"26700","Spain","ES","Transmission services of electricity","exio" +"26701","Spain","ES","Distribution and trade services of electricity","exio" +"26702","Spain","ES","Coke oven gas","exio" +"26703","Spain","ES","Blast Furnace Gas","exio" +"26704","Spain","ES","Oxygen Steel Furnace Gas","exio" +"26705","Spain","ES","Gas Works Gas","exio" +"26706","Spain","ES","Biogas","exio" +"26707","Spain","ES","Distribution services of gaseous fuels through mains","exio" +"26708","Spain","ES","Steam and hot water supply services","exio" +"26709","Spain","ES","Collected and purified water, distribution services of water","exio" +"26710","Spain","ES","Construction work","exio" +"26711","Spain","ES","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"26712","Spain","ES","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"26713","Spain","ES","Retail trade services of motor fuel","exio" +"26714","Spain","ES","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"26715","Spain","ES","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"26716","Spain","ES","Hotel and restaurant services","exio" +"26717","Spain","ES","Railway transportation services","exio" +"26718","Spain","ES","Other land transportation services","exio" +"26719","Spain","ES","Transportation services via pipelines","exio" +"26720","Spain","ES","Sea and coastal water transportation services","exio" +"26721","Spain","ES","Inland water transportation services","exio" +"26722","Spain","ES","Air transport services","exio" +"26723","Spain","ES","Supporting and auxiliary transport services; travel agency services","exio" +"26724","Spain","ES","Post and telecommunication services","exio" +"26725","Spain","ES","Financial intermediation services, except insurance and pension funding services","exio" +"26726","Spain","ES","Insurance and pension funding services, except compulsory social security services","exio" +"26727","Spain","ES","Services auxiliary to financial intermediation","exio" +"26728","Spain","ES","Real estate services","exio" +"26729","Spain","ES","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"26730","Spain","ES","Computer and related services","exio" +"26731","Spain","ES","Research and development services","exio" +"26732","Spain","ES","Other business services","exio" +"26733","Spain","ES","Public administration and defence services; compulsory social security services","exio" +"26734","Spain","ES","Education services","exio" +"26735","Spain","ES","Health and social work services","exio" +"26736","Spain","ES","Food waste for treatment: incineration","exio" +"26737","Spain","ES","Paper waste for treatment: incineration","exio" +"26738","Spain","ES","Plastic waste for treatment: incineration","exio" +"26739","Spain","ES","Intert/metal waste for treatment: incineration","exio" +"26740","Spain","ES","Textiles waste for treatment: incineration","exio" +"26741","Spain","ES","Wood waste for treatment: incineration","exio" +"26742","Spain","ES","Oil/hazardous waste for treatment: incineration","exio" +"26743","Spain","ES","Food waste for treatment: biogasification and land application","exio" +"26744","Spain","ES","Paper waste for treatment: biogasification and land application","exio" +"26745","Spain","ES","Sewage sludge for treatment: biogasification and land application","exio" +"26746","Spain","ES","Food waste for treatment: composting and land application","exio" +"26747","Spain","ES","Paper and wood waste for treatment: composting and land application","exio" +"26748","Spain","ES","Food waste for treatment: waste water treatment","exio" +"26749","Spain","ES","Other waste for treatment: waste water treatment","exio" +"26750","Spain","ES","Food waste for treatment: landfill","exio" +"26751","Spain","ES","Paper for treatment: landfill","exio" +"26752","Spain","ES","Plastic waste for treatment: landfill","exio" +"26753","Spain","ES","Inert/metal/hazardous waste for treatment: landfill","exio" +"26754","Spain","ES","Textiles waste for treatment: landfill","exio" +"26755","Spain","ES","Wood waste for treatment: landfill","exio" +"26756","Spain","ES","Membership organisation services n.e.c.","exio" +"26757","Spain","ES","Recreational, cultural and sporting services","exio" +"26758","Spain","ES","Other services","exio" +"26759","Spain","ES","Private households with employed persons","exio" +"26760","Spain","ES","Extra-territorial organizations and bodies","exio" +"26761","Finland","FI","Paddy rice","exio" +"26762","Finland","FI","Wheat","exio" +"26763","Finland","FI","Cereal grains nec","exio" +"26764","Finland","FI","Vegetables, fruit, nuts","exio" +"26765","Finland","FI","Oil seeds","exio" +"26766","Finland","FI","Sugar cane, sugar beet","exio" +"26767","Finland","FI","Plant-based fibers","exio" +"26768","Finland","FI","Crops nec","exio" +"26769","Finland","FI","Cattle","exio" +"26770","Finland","FI","Pigs","exio" +"26771","Finland","FI","Poultry","exio" +"26772","Finland","FI","Meat animals nec","exio" +"26773","Finland","FI","Animal products nec","exio" +"26774","Finland","FI","Raw milk","exio" +"26775","Finland","FI","Wool, silk-worm cocoons","exio" +"26776","Finland","FI","Manure (conventional treatment)","exio" +"26777","Finland","FI","Manure (biogas treatment)","exio" +"26778","Finland","FI","Products of forestry, logging and related services","exio" +"26779","Finland","FI","Fish and other fishing products; services incidental of fishing","exio" +"26780","Finland","FI","Anthracite","exio" +"26781","Finland","FI","Coking Coal","exio" +"26782","Finland","FI","Other Bituminous Coal","exio" +"26783","Finland","FI","Sub-Bituminous Coal","exio" +"26784","Finland","FI","Patent Fuel","exio" +"26785","Finland","FI","Lignite/Brown Coal","exio" +"26786","Finland","FI","BKB/Peat Briquettes","exio" +"26787","Finland","FI","Peat","exio" +"26788","Finland","FI","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"26789","Finland","FI","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"26790","Finland","FI","Natural Gas Liquids","exio" +"26791","Finland","FI","Other Hydrocarbons","exio" +"26792","Finland","FI","Uranium and thorium ores","exio" +"26793","Finland","FI","Iron ores","exio" +"26794","Finland","FI","Copper ores and concentrates","exio" +"26795","Finland","FI","Nickel ores and concentrates","exio" +"26796","Finland","FI","Aluminium ores and concentrates","exio" +"26797","Finland","FI","Precious metal ores and concentrates","exio" +"26798","Finland","FI","Lead, zinc and tin ores and concentrates","exio" +"26799","Finland","FI","Other non-ferrous metal ores and concentrates","exio" +"26800","Finland","FI","Stone","exio" +"26801","Finland","FI","Sand and clay","exio" +"26802","Finland","FI","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"26803","Finland","FI","Products of meat cattle","exio" +"26804","Finland","FI","Products of meat pigs","exio" +"26805","Finland","FI","Products of meat poultry","exio" +"26806","Finland","FI","Meat products nec","exio" +"26807","Finland","FI","products of Vegetable oils and fats","exio" +"26808","Finland","FI","Dairy products","exio" +"26809","Finland","FI","Processed rice","exio" +"26810","Finland","FI","Sugar","exio" +"26811","Finland","FI","Food products nec","exio" +"26812","Finland","FI","Beverages","exio" +"26813","Finland","FI","Fish products","exio" +"26814","Finland","FI","Tobacco products","exio" +"26815","Finland","FI","Textiles","exio" +"26816","Finland","FI","Wearing apparel; furs","exio" +"26817","Finland","FI","Leather and leather products","exio" +"26818","Finland","FI","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"26819","Finland","FI","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"26820","Finland","FI","Pulp","exio" +"26821","Finland","FI","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"26822","Finland","FI","Paper and paper products","exio" +"26823","Finland","FI","Printed matter and recorded media","exio" +"26824","Finland","FI","Coke Oven Coke","exio" +"26825","Finland","FI","Gas Coke","exio" +"26826","Finland","FI","Coal Tar","exio" +"26827","Finland","FI","Motor Gasoline","exio" +"26828","Finland","FI","Aviation Gasoline","exio" +"26829","Finland","FI","Gasoline Type Jet Fuel","exio" +"26830","Finland","FI","Kerosene Type Jet Fuel","exio" +"26831","Finland","FI","Kerosene","exio" +"26832","Finland","FI","Gas/Diesel Oil","exio" +"26833","Finland","FI","Heavy Fuel Oil","exio" +"26834","Finland","FI","Refinery Gas","exio" +"26835","Finland","FI","Liquefied Petroleum Gases (LPG)","exio" +"26836","Finland","FI","Refinery Feedstocks","exio" +"26837","Finland","FI","Ethane","exio" +"26838","Finland","FI","Naphtha","exio" +"26839","Finland","FI","White Spirit & SBP","exio" +"26840","Finland","FI","Lubricants","exio" +"26841","Finland","FI","Bitumen","exio" +"26842","Finland","FI","Paraffin Waxes","exio" +"26843","Finland","FI","Petroleum Coke","exio" +"26844","Finland","FI","Non-specified Petroleum Products","exio" +"26845","Finland","FI","Nuclear fuel","exio" +"26846","Finland","FI","Plastics, basic","exio" +"26847","Finland","FI","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"26848","Finland","FI","N-fertiliser","exio" +"26849","Finland","FI","P- and other fertiliser","exio" +"26850","Finland","FI","Chemicals nec","exio" +"26851","Finland","FI","Charcoal","exio" +"26852","Finland","FI","Additives/Blending Components","exio" +"26853","Finland","FI","Biogasoline","exio" +"26854","Finland","FI","Biodiesels","exio" +"26855","Finland","FI","Other Liquid Biofuels","exio" +"26856","Finland","FI","Rubber and plastic products","exio" +"26857","Finland","FI","Glass and glass products","exio" +"26858","Finland","FI","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"26859","Finland","FI","Ceramic goods","exio" +"26860","Finland","FI","Bricks, tiles and construction products, in baked clay","exio" +"26861","Finland","FI","Cement, lime and plaster","exio" +"26862","Finland","FI","Ash for treatment, Re-processing of ash into clinker","exio" +"26863","Finland","FI","Other non-metallic mineral products","exio" +"26864","Finland","FI","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"26865","Finland","FI","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"26866","Finland","FI","Precious metals","exio" +"26867","Finland","FI","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"26868","Finland","FI","Aluminium and aluminium products","exio" +"26869","Finland","FI","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"26870","Finland","FI","Lead, zinc and tin and products thereof","exio" +"26871","Finland","FI","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"26872","Finland","FI","Copper products","exio" +"26873","Finland","FI","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"26874","Finland","FI","Other non-ferrous metal products","exio" +"26875","Finland","FI","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"26876","Finland","FI","Foundry work services","exio" +"26877","Finland","FI","Fabricated metal products, except machinery and equipment","exio" +"26878","Finland","FI","Machinery and equipment n.e.c.","exio" +"26879","Finland","FI","Office machinery and computers","exio" +"26880","Finland","FI","Electrical machinery and apparatus n.e.c.","exio" +"26881","Finland","FI","Radio, television and communication equipment and apparatus","exio" +"26882","Finland","FI","Medical, precision and optical instruments, watches and clocks","exio" +"26883","Finland","FI","Motor vehicles, trailers and semi-trailers","exio" +"26884","Finland","FI","Other transport equipment","exio" +"26885","Finland","FI","Furniture; other manufactured goods n.e.c.","exio" +"26886","Finland","FI","Secondary raw materials","exio" +"26887","Finland","FI","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"26888","Finland","FI","Electricity by coal","exio" +"26889","Finland","FI","Electricity by gas","exio" +"26890","Finland","FI","Electricity by nuclear","exio" +"26891","Finland","FI","Electricity by hydro","exio" +"26892","Finland","FI","Electricity by wind","exio" +"26893","Finland","FI","Electricity by petroleum and other oil derivatives","exio" +"26894","Finland","FI","Electricity by biomass and waste","exio" +"26895","Finland","FI","Electricity by solar photovoltaic","exio" +"26896","Finland","FI","Electricity by solar thermal","exio" +"26897","Finland","FI","Electricity by tide, wave, ocean","exio" +"26898","Finland","FI","Electricity by Geothermal","exio" +"26899","Finland","FI","Electricity nec","exio" +"26900","Finland","FI","Transmission services of electricity","exio" +"26901","Finland","FI","Distribution and trade services of electricity","exio" +"26902","Finland","FI","Coke oven gas","exio" +"26903","Finland","FI","Blast Furnace Gas","exio" +"26904","Finland","FI","Oxygen Steel Furnace Gas","exio" +"26905","Finland","FI","Gas Works Gas","exio" +"26906","Finland","FI","Biogas","exio" +"26907","Finland","FI","Distribution services of gaseous fuels through mains","exio" +"26908","Finland","FI","Steam and hot water supply services","exio" +"26909","Finland","FI","Collected and purified water, distribution services of water","exio" +"26910","Finland","FI","Construction work","exio" +"26911","Finland","FI","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"26912","Finland","FI","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"26913","Finland","FI","Retail trade services of motor fuel","exio" +"26914","Finland","FI","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"26915","Finland","FI","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"26916","Finland","FI","Hotel and restaurant services","exio" +"26917","Finland","FI","Railway transportation services","exio" +"26918","Finland","FI","Other land transportation services","exio" +"26919","Finland","FI","Transportation services via pipelines","exio" +"26920","Finland","FI","Sea and coastal water transportation services","exio" +"26921","Finland","FI","Inland water transportation services","exio" +"26922","Finland","FI","Air transport services","exio" +"26923","Finland","FI","Supporting and auxiliary transport services; travel agency services","exio" +"26924","Finland","FI","Post and telecommunication services","exio" +"26925","Finland","FI","Financial intermediation services, except insurance and pension funding services","exio" +"26926","Finland","FI","Insurance and pension funding services, except compulsory social security services","exio" +"26927","Finland","FI","Services auxiliary to financial intermediation","exio" +"26928","Finland","FI","Real estate services","exio" +"26929","Finland","FI","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"26930","Finland","FI","Computer and related services","exio" +"26931","Finland","FI","Research and development services","exio" +"26932","Finland","FI","Other business services","exio" +"26933","Finland","FI","Public administration and defence services; compulsory social security services","exio" +"26934","Finland","FI","Education services","exio" +"26935","Finland","FI","Health and social work services","exio" +"26936","Finland","FI","Food waste for treatment: incineration","exio" +"26937","Finland","FI","Paper waste for treatment: incineration","exio" +"26938","Finland","FI","Plastic waste for treatment: incineration","exio" +"26939","Finland","FI","Intert/metal waste for treatment: incineration","exio" +"26940","Finland","FI","Textiles waste for treatment: incineration","exio" +"26941","Finland","FI","Wood waste for treatment: incineration","exio" +"26942","Finland","FI","Oil/hazardous waste for treatment: incineration","exio" +"26943","Finland","FI","Food waste for treatment: biogasification and land application","exio" +"26944","Finland","FI","Paper waste for treatment: biogasification and land application","exio" +"26945","Finland","FI","Sewage sludge for treatment: biogasification and land application","exio" +"26946","Finland","FI","Food waste for treatment: composting and land application","exio" +"26947","Finland","FI","Paper and wood waste for treatment: composting and land application","exio" +"26948","Finland","FI","Food waste for treatment: waste water treatment","exio" +"26949","Finland","FI","Other waste for treatment: waste water treatment","exio" +"26950","Finland","FI","Food waste for treatment: landfill","exio" +"26951","Finland","FI","Paper for treatment: landfill","exio" +"26952","Finland","FI","Plastic waste for treatment: landfill","exio" +"26953","Finland","FI","Inert/metal/hazardous waste for treatment: landfill","exio" +"26954","Finland","FI","Textiles waste for treatment: landfill","exio" +"26955","Finland","FI","Wood waste for treatment: landfill","exio" +"26956","Finland","FI","Membership organisation services n.e.c.","exio" +"26957","Finland","FI","Recreational, cultural and sporting services","exio" +"26958","Finland","FI","Other services","exio" +"26959","Finland","FI","Private households with employed persons","exio" +"26960","Finland","FI","Extra-territorial organizations and bodies","exio" +"26961","France","FR","Paddy rice","exio" +"26962","France","FR","Wheat","exio" +"26963","France","FR","Cereal grains nec","exio" +"26964","France","FR","Vegetables, fruit, nuts","exio" +"26965","France","FR","Oil seeds","exio" +"26966","France","FR","Sugar cane, sugar beet","exio" +"26967","France","FR","Plant-based fibers","exio" +"26968","France","FR","Crops nec","exio" +"26969","France","FR","Cattle","exio" +"26970","France","FR","Pigs","exio" +"26971","France","FR","Poultry","exio" +"26972","France","FR","Meat animals nec","exio" +"26973","France","FR","Animal products nec","exio" +"26974","France","FR","Raw milk","exio" +"26975","France","FR","Wool, silk-worm cocoons","exio" +"26976","France","FR","Manure (conventional treatment)","exio" +"26977","France","FR","Manure (biogas treatment)","exio" +"26978","France","FR","Products of forestry, logging and related services","exio" +"26979","France","FR","Fish and other fishing products; services incidental of fishing","exio" +"26980","France","FR","Anthracite","exio" +"26981","France","FR","Coking Coal","exio" +"26982","France","FR","Other Bituminous Coal","exio" +"26983","France","FR","Sub-Bituminous Coal","exio" +"26984","France","FR","Patent Fuel","exio" +"26985","France","FR","Lignite/Brown Coal","exio" +"26986","France","FR","BKB/Peat Briquettes","exio" +"26987","France","FR","Peat","exio" +"26988","France","FR","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"26989","France","FR","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"26990","France","FR","Natural Gas Liquids","exio" +"26991","France","FR","Other Hydrocarbons","exio" +"26992","France","FR","Uranium and thorium ores","exio" +"26993","France","FR","Iron ores","exio" +"26994","France","FR","Copper ores and concentrates","exio" +"26995","France","FR","Nickel ores and concentrates","exio" +"26996","France","FR","Aluminium ores and concentrates","exio" +"26997","France","FR","Precious metal ores and concentrates","exio" +"26998","France","FR","Lead, zinc and tin ores and concentrates","exio" +"26999","France","FR","Other non-ferrous metal ores and concentrates","exio" +"27000","France","FR","Stone","exio" +"27001","France","FR","Sand and clay","exio" +"27002","France","FR","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"27003","France","FR","Products of meat cattle","exio" +"27004","France","FR","Products of meat pigs","exio" +"27005","France","FR","Products of meat poultry","exio" +"27006","France","FR","Meat products nec","exio" +"27007","France","FR","products of Vegetable oils and fats","exio" +"27008","France","FR","Dairy products","exio" +"27009","France","FR","Processed rice","exio" +"27010","France","FR","Sugar","exio" +"27011","France","FR","Food products nec","exio" +"27012","France","FR","Beverages","exio" +"27013","France","FR","Fish products","exio" +"27014","France","FR","Tobacco products","exio" +"27015","France","FR","Textiles","exio" +"27016","France","FR","Wearing apparel; furs","exio" +"27017","France","FR","Leather and leather products","exio" +"27018","France","FR","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"27019","France","FR","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"27020","France","FR","Pulp","exio" +"27021","France","FR","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"27022","France","FR","Paper and paper products","exio" +"27023","France","FR","Printed matter and recorded media","exio" +"27024","France","FR","Coke Oven Coke","exio" +"27025","France","FR","Gas Coke","exio" +"27026","France","FR","Coal Tar","exio" +"27027","France","FR","Motor Gasoline","exio" +"27028","France","FR","Aviation Gasoline","exio" +"27029","France","FR","Gasoline Type Jet Fuel","exio" +"27030","France","FR","Kerosene Type Jet Fuel","exio" +"27031","France","FR","Kerosene","exio" +"27032","France","FR","Gas/Diesel Oil","exio" +"27033","France","FR","Heavy Fuel Oil","exio" +"27034","France","FR","Refinery Gas","exio" +"27035","France","FR","Liquefied Petroleum Gases (LPG)","exio" +"27036","France","FR","Refinery Feedstocks","exio" +"27037","France","FR","Ethane","exio" +"27038","France","FR","Naphtha","exio" +"27039","France","FR","White Spirit & SBP","exio" +"27040","France","FR","Lubricants","exio" +"27041","France","FR","Bitumen","exio" +"27042","France","FR","Paraffin Waxes","exio" +"27043","France","FR","Petroleum Coke","exio" +"27044","France","FR","Non-specified Petroleum Products","exio" +"27045","France","FR","Nuclear fuel","exio" +"27046","France","FR","Plastics, basic","exio" +"27047","France","FR","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"27048","France","FR","N-fertiliser","exio" +"27049","France","FR","P- and other fertiliser","exio" +"27050","France","FR","Chemicals nec","exio" +"27051","France","FR","Charcoal","exio" +"27052","France","FR","Additives/Blending Components","exio" +"27053","France","FR","Biogasoline","exio" +"27054","France","FR","Biodiesels","exio" +"27055","France","FR","Other Liquid Biofuels","exio" +"27056","France","FR","Rubber and plastic products","exio" +"27057","France","FR","Glass and glass products","exio" +"27058","France","FR","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"27059","France","FR","Ceramic goods","exio" +"27060","France","FR","Bricks, tiles and construction products, in baked clay","exio" +"27061","France","FR","Cement, lime and plaster","exio" +"27062","France","FR","Ash for treatment, Re-processing of ash into clinker","exio" +"27063","France","FR","Other non-metallic mineral products","exio" +"27064","France","FR","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"27065","France","FR","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"27066","France","FR","Precious metals","exio" +"27067","France","FR","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"27068","France","FR","Aluminium and aluminium products","exio" +"27069","France","FR","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"27070","France","FR","Lead, zinc and tin and products thereof","exio" +"27071","France","FR","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"27072","France","FR","Copper products","exio" +"27073","France","FR","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"27074","France","FR","Other non-ferrous metal products","exio" +"27075","France","FR","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"27076","France","FR","Foundry work services","exio" +"27077","France","FR","Fabricated metal products, except machinery and equipment","exio" +"27078","France","FR","Machinery and equipment n.e.c.","exio" +"27079","France","FR","Office machinery and computers","exio" +"27080","France","FR","Electrical machinery and apparatus n.e.c.","exio" +"27081","France","FR","Radio, television and communication equipment and apparatus","exio" +"27082","France","FR","Medical, precision and optical instruments, watches and clocks","exio" +"27083","France","FR","Motor vehicles, trailers and semi-trailers","exio" +"27084","France","FR","Other transport equipment","exio" +"27085","France","FR","Furniture; other manufactured goods n.e.c.","exio" +"27086","France","FR","Secondary raw materials","exio" +"27087","France","FR","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"27088","France","FR","Electricity by coal","exio" +"27089","France","FR","Electricity by gas","exio" +"27090","France","FR","Electricity by nuclear","exio" +"27091","France","FR","Electricity by hydro","exio" +"27092","France","FR","Electricity by wind","exio" +"27093","France","FR","Electricity by petroleum and other oil derivatives","exio" +"27094","France","FR","Electricity by biomass and waste","exio" +"27095","France","FR","Electricity by solar photovoltaic","exio" +"27096","France","FR","Electricity by solar thermal","exio" +"27097","France","FR","Electricity by tide, wave, ocean","exio" +"27098","France","FR","Electricity by Geothermal","exio" +"27099","France","FR","Electricity nec","exio" +"27100","France","FR","Transmission services of electricity","exio" +"27101","France","FR","Distribution and trade services of electricity","exio" +"27102","France","FR","Coke oven gas","exio" +"27103","France","FR","Blast Furnace Gas","exio" +"27104","France","FR","Oxygen Steel Furnace Gas","exio" +"27105","France","FR","Gas Works Gas","exio" +"27106","France","FR","Biogas","exio" +"27107","France","FR","Distribution services of gaseous fuels through mains","exio" +"27108","France","FR","Steam and hot water supply services","exio" +"27109","France","FR","Collected and purified water, distribution services of water","exio" +"27110","France","FR","Construction work","exio" +"27111","France","FR","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"27112","France","FR","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"27113","France","FR","Retail trade services of motor fuel","exio" +"27114","France","FR","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"27115","France","FR","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"27116","France","FR","Hotel and restaurant services","exio" +"27117","France","FR","Railway transportation services","exio" +"27118","France","FR","Other land transportation services","exio" +"27119","France","FR","Transportation services via pipelines","exio" +"27120","France","FR","Sea and coastal water transportation services","exio" +"27121","France","FR","Inland water transportation services","exio" +"27122","France","FR","Air transport services","exio" +"27123","France","FR","Supporting and auxiliary transport services; travel agency services","exio" +"27124","France","FR","Post and telecommunication services","exio" +"27125","France","FR","Financial intermediation services, except insurance and pension funding services","exio" +"27126","France","FR","Insurance and pension funding services, except compulsory social security services","exio" +"27127","France","FR","Services auxiliary to financial intermediation","exio" +"27128","France","FR","Real estate services","exio" +"27129","France","FR","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"27130","France","FR","Computer and related services","exio" +"27131","France","FR","Research and development services","exio" +"27132","France","FR","Other business services","exio" +"27133","France","FR","Public administration and defence services; compulsory social security services","exio" +"27134","France","FR","Education services","exio" +"27135","France","FR","Health and social work services","exio" +"27136","France","FR","Food waste for treatment: incineration","exio" +"27137","France","FR","Paper waste for treatment: incineration","exio" +"27138","France","FR","Plastic waste for treatment: incineration","exio" +"27139","France","FR","Intert/metal waste for treatment: incineration","exio" +"27140","France","FR","Textiles waste for treatment: incineration","exio" +"27141","France","FR","Wood waste for treatment: incineration","exio" +"27142","France","FR","Oil/hazardous waste for treatment: incineration","exio" +"27143","France","FR","Food waste for treatment: biogasification and land application","exio" +"27144","France","FR","Paper waste for treatment: biogasification and land application","exio" +"27145","France","FR","Sewage sludge for treatment: biogasification and land application","exio" +"27146","France","FR","Food waste for treatment: composting and land application","exio" +"27147","France","FR","Paper and wood waste for treatment: composting and land application","exio" +"27148","France","FR","Food waste for treatment: waste water treatment","exio" +"27149","France","FR","Other waste for treatment: waste water treatment","exio" +"27150","France","FR","Food waste for treatment: landfill","exio" +"27151","France","FR","Paper for treatment: landfill","exio" +"27152","France","FR","Plastic waste for treatment: landfill","exio" +"27153","France","FR","Inert/metal/hazardous waste for treatment: landfill","exio" +"27154","France","FR","Textiles waste for treatment: landfill","exio" +"27155","France","FR","Wood waste for treatment: landfill","exio" +"27156","France","FR","Membership organisation services n.e.c.","exio" +"27157","France","FR","Recreational, cultural and sporting services","exio" +"27158","France","FR","Other services","exio" +"27159","France","FR","Private households with employed persons","exio" +"27160","France","FR","Extra-territorial organizations and bodies","exio" +"27161","Greece","GR","Paddy rice","exio" +"27162","Greece","GR","Wheat","exio" +"27163","Greece","GR","Cereal grains nec","exio" +"27164","Greece","GR","Vegetables, fruit, nuts","exio" +"27165","Greece","GR","Oil seeds","exio" +"27166","Greece","GR","Sugar cane, sugar beet","exio" +"27167","Greece","GR","Plant-based fibers","exio" +"27168","Greece","GR","Crops nec","exio" +"27169","Greece","GR","Cattle","exio" +"27170","Greece","GR","Pigs","exio" +"27171","Greece","GR","Poultry","exio" +"27172","Greece","GR","Meat animals nec","exio" +"27173","Greece","GR","Animal products nec","exio" +"27174","Greece","GR","Raw milk","exio" +"27175","Greece","GR","Wool, silk-worm cocoons","exio" +"27176","Greece","GR","Manure (conventional treatment)","exio" +"27177","Greece","GR","Manure (biogas treatment)","exio" +"27178","Greece","GR","Products of forestry, logging and related services","exio" +"27179","Greece","GR","Fish and other fishing products; services incidental of fishing","exio" +"27180","Greece","GR","Anthracite","exio" +"27181","Greece","GR","Coking Coal","exio" +"27182","Greece","GR","Other Bituminous Coal","exio" +"27183","Greece","GR","Sub-Bituminous Coal","exio" +"27184","Greece","GR","Patent Fuel","exio" +"27185","Greece","GR","Lignite/Brown Coal","exio" +"27186","Greece","GR","BKB/Peat Briquettes","exio" +"27187","Greece","GR","Peat","exio" +"27188","Greece","GR","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"27189","Greece","GR","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"27190","Greece","GR","Natural Gas Liquids","exio" +"27191","Greece","GR","Other Hydrocarbons","exio" +"27192","Greece","GR","Uranium and thorium ores","exio" +"27193","Greece","GR","Iron ores","exio" +"27194","Greece","GR","Copper ores and concentrates","exio" +"27195","Greece","GR","Nickel ores and concentrates","exio" +"27196","Greece","GR","Aluminium ores and concentrates","exio" +"27197","Greece","GR","Precious metal ores and concentrates","exio" +"27198","Greece","GR","Lead, zinc and tin ores and concentrates","exio" +"27199","Greece","GR","Other non-ferrous metal ores and concentrates","exio" +"27200","Greece","GR","Stone","exio" +"27201","Greece","GR","Sand and clay","exio" +"27202","Greece","GR","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"27203","Greece","GR","Products of meat cattle","exio" +"27204","Greece","GR","Products of meat pigs","exio" +"27205","Greece","GR","Products of meat poultry","exio" +"27206","Greece","GR","Meat products nec","exio" +"27207","Greece","GR","products of Vegetable oils and fats","exio" +"27208","Greece","GR","Dairy products","exio" +"27209","Greece","GR","Processed rice","exio" +"27210","Greece","GR","Sugar","exio" +"27211","Greece","GR","Food products nec","exio" +"27212","Greece","GR","Beverages","exio" +"27213","Greece","GR","Fish products","exio" +"27214","Greece","GR","Tobacco products","exio" +"27215","Greece","GR","Textiles","exio" +"27216","Greece","GR","Wearing apparel; furs","exio" +"27217","Greece","GR","Leather and leather products","exio" +"27218","Greece","GR","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"27219","Greece","GR","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"27220","Greece","GR","Pulp","exio" +"27221","Greece","GR","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"27222","Greece","GR","Paper and paper products","exio" +"27223","Greece","GR","Printed matter and recorded media","exio" +"27224","Greece","GR","Coke Oven Coke","exio" +"27225","Greece","GR","Gas Coke","exio" +"27226","Greece","GR","Coal Tar","exio" +"27227","Greece","GR","Motor Gasoline","exio" +"27228","Greece","GR","Aviation Gasoline","exio" +"27229","Greece","GR","Gasoline Type Jet Fuel","exio" +"27230","Greece","GR","Kerosene Type Jet Fuel","exio" +"27231","Greece","GR","Kerosene","exio" +"27232","Greece","GR","Gas/Diesel Oil","exio" +"27233","Greece","GR","Heavy Fuel Oil","exio" +"27234","Greece","GR","Refinery Gas","exio" +"27235","Greece","GR","Liquefied Petroleum Gases (LPG)","exio" +"27236","Greece","GR","Refinery Feedstocks","exio" +"27237","Greece","GR","Ethane","exio" +"27238","Greece","GR","Naphtha","exio" +"27239","Greece","GR","White Spirit & SBP","exio" +"27240","Greece","GR","Lubricants","exio" +"27241","Greece","GR","Bitumen","exio" +"27242","Greece","GR","Paraffin Waxes","exio" +"27243","Greece","GR","Petroleum Coke","exio" +"27244","Greece","GR","Non-specified Petroleum Products","exio" +"27245","Greece","GR","Nuclear fuel","exio" +"27246","Greece","GR","Plastics, basic","exio" +"27247","Greece","GR","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"27248","Greece","GR","N-fertiliser","exio" +"27249","Greece","GR","P- and other fertiliser","exio" +"27250","Greece","GR","Chemicals nec","exio" +"27251","Greece","GR","Charcoal","exio" +"27252","Greece","GR","Additives/Blending Components","exio" +"27253","Greece","GR","Biogasoline","exio" +"27254","Greece","GR","Biodiesels","exio" +"27255","Greece","GR","Other Liquid Biofuels","exio" +"27256","Greece","GR","Rubber and plastic products","exio" +"27257","Greece","GR","Glass and glass products","exio" +"27258","Greece","GR","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"27259","Greece","GR","Ceramic goods","exio" +"27260","Greece","GR","Bricks, tiles and construction products, in baked clay","exio" +"27261","Greece","GR","Cement, lime and plaster","exio" +"27262","Greece","GR","Ash for treatment, Re-processing of ash into clinker","exio" +"27263","Greece","GR","Other non-metallic mineral products","exio" +"27264","Greece","GR","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"27265","Greece","GR","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"27266","Greece","GR","Precious metals","exio" +"27267","Greece","GR","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"27268","Greece","GR","Aluminium and aluminium products","exio" +"27269","Greece","GR","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"27270","Greece","GR","Lead, zinc and tin and products thereof","exio" +"27271","Greece","GR","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"27272","Greece","GR","Copper products","exio" +"27273","Greece","GR","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"27274","Greece","GR","Other non-ferrous metal products","exio" +"27275","Greece","GR","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"27276","Greece","GR","Foundry work services","exio" +"27277","Greece","GR","Fabricated metal products, except machinery and equipment","exio" +"27278","Greece","GR","Machinery and equipment n.e.c.","exio" +"27279","Greece","GR","Office machinery and computers","exio" +"27280","Greece","GR","Electrical machinery and apparatus n.e.c.","exio" +"27281","Greece","GR","Radio, television and communication equipment and apparatus","exio" +"27282","Greece","GR","Medical, precision and optical instruments, watches and clocks","exio" +"27283","Greece","GR","Motor vehicles, trailers and semi-trailers","exio" +"27284","Greece","GR","Other transport equipment","exio" +"27285","Greece","GR","Furniture; other manufactured goods n.e.c.","exio" +"27286","Greece","GR","Secondary raw materials","exio" +"27287","Greece","GR","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"27288","Greece","GR","Electricity by coal","exio" +"27289","Greece","GR","Electricity by gas","exio" +"27290","Greece","GR","Electricity by nuclear","exio" +"27291","Greece","GR","Electricity by hydro","exio" +"27292","Greece","GR","Electricity by wind","exio" +"27293","Greece","GR","Electricity by petroleum and other oil derivatives","exio" +"27294","Greece","GR","Electricity by biomass and waste","exio" +"27295","Greece","GR","Electricity by solar photovoltaic","exio" +"27296","Greece","GR","Electricity by solar thermal","exio" +"27297","Greece","GR","Electricity by tide, wave, ocean","exio" +"27298","Greece","GR","Electricity by Geothermal","exio" +"27299","Greece","GR","Electricity nec","exio" +"27300","Greece","GR","Transmission services of electricity","exio" +"27301","Greece","GR","Distribution and trade services of electricity","exio" +"27302","Greece","GR","Coke oven gas","exio" +"27303","Greece","GR","Blast Furnace Gas","exio" +"27304","Greece","GR","Oxygen Steel Furnace Gas","exio" +"27305","Greece","GR","Gas Works Gas","exio" +"27306","Greece","GR","Biogas","exio" +"27307","Greece","GR","Distribution services of gaseous fuels through mains","exio" +"27308","Greece","GR","Steam and hot water supply services","exio" +"27309","Greece","GR","Collected and purified water, distribution services of water","exio" +"27310","Greece","GR","Construction work","exio" +"27311","Greece","GR","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"27312","Greece","GR","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"27313","Greece","GR","Retail trade services of motor fuel","exio" +"27314","Greece","GR","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"27315","Greece","GR","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"27316","Greece","GR","Hotel and restaurant services","exio" +"27317","Greece","GR","Railway transportation services","exio" +"27318","Greece","GR","Other land transportation services","exio" +"27319","Greece","GR","Transportation services via pipelines","exio" +"27320","Greece","GR","Sea and coastal water transportation services","exio" +"27321","Greece","GR","Inland water transportation services","exio" +"27322","Greece","GR","Air transport services","exio" +"27323","Greece","GR","Supporting and auxiliary transport services; travel agency services","exio" +"27324","Greece","GR","Post and telecommunication services","exio" +"27325","Greece","GR","Financial intermediation services, except insurance and pension funding services","exio" +"27326","Greece","GR","Insurance and pension funding services, except compulsory social security services","exio" +"27327","Greece","GR","Services auxiliary to financial intermediation","exio" +"27328","Greece","GR","Real estate services","exio" +"27329","Greece","GR","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"27330","Greece","GR","Computer and related services","exio" +"27331","Greece","GR","Research and development services","exio" +"27332","Greece","GR","Other business services","exio" +"27333","Greece","GR","Public administration and defence services; compulsory social security services","exio" +"27334","Greece","GR","Education services","exio" +"27335","Greece","GR","Health and social work services","exio" +"27336","Greece","GR","Food waste for treatment: incineration","exio" +"27337","Greece","GR","Paper waste for treatment: incineration","exio" +"27338","Greece","GR","Plastic waste for treatment: incineration","exio" +"27339","Greece","GR","Intert/metal waste for treatment: incineration","exio" +"27340","Greece","GR","Textiles waste for treatment: incineration","exio" +"27341","Greece","GR","Wood waste for treatment: incineration","exio" +"27342","Greece","GR","Oil/hazardous waste for treatment: incineration","exio" +"27343","Greece","GR","Food waste for treatment: biogasification and land application","exio" +"27344","Greece","GR","Paper waste for treatment: biogasification and land application","exio" +"27345","Greece","GR","Sewage sludge for treatment: biogasification and land application","exio" +"27346","Greece","GR","Food waste for treatment: composting and land application","exio" +"27347","Greece","GR","Paper and wood waste for treatment: composting and land application","exio" +"27348","Greece","GR","Food waste for treatment: waste water treatment","exio" +"27349","Greece","GR","Other waste for treatment: waste water treatment","exio" +"27350","Greece","GR","Food waste for treatment: landfill","exio" +"27351","Greece","GR","Paper for treatment: landfill","exio" +"27352","Greece","GR","Plastic waste for treatment: landfill","exio" +"27353","Greece","GR","Inert/metal/hazardous waste for treatment: landfill","exio" +"27354","Greece","GR","Textiles waste for treatment: landfill","exio" +"27355","Greece","GR","Wood waste for treatment: landfill","exio" +"27356","Greece","GR","Membership organisation services n.e.c.","exio" +"27357","Greece","GR","Recreational, cultural and sporting services","exio" +"27358","Greece","GR","Other services","exio" +"27359","Greece","GR","Private households with employed persons","exio" +"27360","Greece","GR","Extra-territorial organizations and bodies","exio" +"27361","Croatia","HR","Paddy rice","exio" +"27362","Croatia","HR","Wheat","exio" +"27363","Croatia","HR","Cereal grains nec","exio" +"27364","Croatia","HR","Vegetables, fruit, nuts","exio" +"27365","Croatia","HR","Oil seeds","exio" +"27366","Croatia","HR","Sugar cane, sugar beet","exio" +"27367","Croatia","HR","Plant-based fibers","exio" +"27368","Croatia","HR","Crops nec","exio" +"27369","Croatia","HR","Cattle","exio" +"27370","Croatia","HR","Pigs","exio" +"27371","Croatia","HR","Poultry","exio" +"27372","Croatia","HR","Meat animals nec","exio" +"27373","Croatia","HR","Animal products nec","exio" +"27374","Croatia","HR","Raw milk","exio" +"27375","Croatia","HR","Wool, silk-worm cocoons","exio" +"27376","Croatia","HR","Manure (conventional treatment)","exio" +"27377","Croatia","HR","Manure (biogas treatment)","exio" +"27378","Croatia","HR","Products of forestry, logging and related services","exio" +"27379","Croatia","HR","Fish and other fishing products; services incidental of fishing","exio" +"27380","Croatia","HR","Anthracite","exio" +"27381","Croatia","HR","Coking Coal","exio" +"27382","Croatia","HR","Other Bituminous Coal","exio" +"27383","Croatia","HR","Sub-Bituminous Coal","exio" +"27384","Croatia","HR","Patent Fuel","exio" +"27385","Croatia","HR","Lignite/Brown Coal","exio" +"27386","Croatia","HR","BKB/Peat Briquettes","exio" +"27387","Croatia","HR","Peat","exio" +"27388","Croatia","HR","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"27389","Croatia","HR","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"27390","Croatia","HR","Natural Gas Liquids","exio" +"27391","Croatia","HR","Other Hydrocarbons","exio" +"27392","Croatia","HR","Uranium and thorium ores","exio" +"27393","Croatia","HR","Iron ores","exio" +"27394","Croatia","HR","Copper ores and concentrates","exio" +"27395","Croatia","HR","Nickel ores and concentrates","exio" +"27396","Croatia","HR","Aluminium ores and concentrates","exio" +"27397","Croatia","HR","Precious metal ores and concentrates","exio" +"27398","Croatia","HR","Lead, zinc and tin ores and concentrates","exio" +"27399","Croatia","HR","Other non-ferrous metal ores and concentrates","exio" +"27400","Croatia","HR","Stone","exio" +"27401","Croatia","HR","Sand and clay","exio" +"27402","Croatia","HR","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"27403","Croatia","HR","Products of meat cattle","exio" +"27404","Croatia","HR","Products of meat pigs","exio" +"27405","Croatia","HR","Products of meat poultry","exio" +"27406","Croatia","HR","Meat products nec","exio" +"27407","Croatia","HR","products of Vegetable oils and fats","exio" +"27408","Croatia","HR","Dairy products","exio" +"27409","Croatia","HR","Processed rice","exio" +"27410","Croatia","HR","Sugar","exio" +"27411","Croatia","HR","Food products nec","exio" +"27412","Croatia","HR","Beverages","exio" +"27413","Croatia","HR","Fish products","exio" +"27414","Croatia","HR","Tobacco products","exio" +"27415","Croatia","HR","Textiles","exio" +"27416","Croatia","HR","Wearing apparel; furs","exio" +"27417","Croatia","HR","Leather and leather products","exio" +"27418","Croatia","HR","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"27419","Croatia","HR","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"27420","Croatia","HR","Pulp","exio" +"27421","Croatia","HR","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"27422","Croatia","HR","Paper and paper products","exio" +"27423","Croatia","HR","Printed matter and recorded media","exio" +"27424","Croatia","HR","Coke Oven Coke","exio" +"27425","Croatia","HR","Gas Coke","exio" +"27426","Croatia","HR","Coal Tar","exio" +"27427","Croatia","HR","Motor Gasoline","exio" +"27428","Croatia","HR","Aviation Gasoline","exio" +"27429","Croatia","HR","Gasoline Type Jet Fuel","exio" +"27430","Croatia","HR","Kerosene Type Jet Fuel","exio" +"27431","Croatia","HR","Kerosene","exio" +"27432","Croatia","HR","Gas/Diesel Oil","exio" +"27433","Croatia","HR","Heavy Fuel Oil","exio" +"27434","Croatia","HR","Refinery Gas","exio" +"27435","Croatia","HR","Liquefied Petroleum Gases (LPG)","exio" +"27436","Croatia","HR","Refinery Feedstocks","exio" +"27437","Croatia","HR","Ethane","exio" +"27438","Croatia","HR","Naphtha","exio" +"27439","Croatia","HR","White Spirit & SBP","exio" +"27440","Croatia","HR","Lubricants","exio" +"27441","Croatia","HR","Bitumen","exio" +"27442","Croatia","HR","Paraffin Waxes","exio" +"27443","Croatia","HR","Petroleum Coke","exio" +"27444","Croatia","HR","Non-specified Petroleum Products","exio" +"27445","Croatia","HR","Nuclear fuel","exio" +"27446","Croatia","HR","Plastics, basic","exio" +"27447","Croatia","HR","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"27448","Croatia","HR","N-fertiliser","exio" +"27449","Croatia","HR","P- and other fertiliser","exio" +"27450","Croatia","HR","Chemicals nec","exio" +"27451","Croatia","HR","Charcoal","exio" +"27452","Croatia","HR","Additives/Blending Components","exio" +"27453","Croatia","HR","Biogasoline","exio" +"27454","Croatia","HR","Biodiesels","exio" +"27455","Croatia","HR","Other Liquid Biofuels","exio" +"27456","Croatia","HR","Rubber and plastic products","exio" +"27457","Croatia","HR","Glass and glass products","exio" +"27458","Croatia","HR","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"27459","Croatia","HR","Ceramic goods","exio" +"27460","Croatia","HR","Bricks, tiles and construction products, in baked clay","exio" +"27461","Croatia","HR","Cement, lime and plaster","exio" +"27462","Croatia","HR","Ash for treatment, Re-processing of ash into clinker","exio" +"27463","Croatia","HR","Other non-metallic mineral products","exio" +"27464","Croatia","HR","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"27465","Croatia","HR","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"27466","Croatia","HR","Precious metals","exio" +"27467","Croatia","HR","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"27468","Croatia","HR","Aluminium and aluminium products","exio" +"27469","Croatia","HR","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"27470","Croatia","HR","Lead, zinc and tin and products thereof","exio" +"27471","Croatia","HR","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"27472","Croatia","HR","Copper products","exio" +"27473","Croatia","HR","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"27474","Croatia","HR","Other non-ferrous metal products","exio" +"27475","Croatia","HR","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"27476","Croatia","HR","Foundry work services","exio" +"27477","Croatia","HR","Fabricated metal products, except machinery and equipment","exio" +"27478","Croatia","HR","Machinery and equipment n.e.c.","exio" +"27479","Croatia","HR","Office machinery and computers","exio" +"27480","Croatia","HR","Electrical machinery and apparatus n.e.c.","exio" +"27481","Croatia","HR","Radio, television and communication equipment and apparatus","exio" +"27482","Croatia","HR","Medical, precision and optical instruments, watches and clocks","exio" +"27483","Croatia","HR","Motor vehicles, trailers and semi-trailers","exio" +"27484","Croatia","HR","Other transport equipment","exio" +"27485","Croatia","HR","Furniture; other manufactured goods n.e.c.","exio" +"27486","Croatia","HR","Secondary raw materials","exio" +"27487","Croatia","HR","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"27488","Croatia","HR","Electricity by coal","exio" +"27489","Croatia","HR","Electricity by gas","exio" +"27490","Croatia","HR","Electricity by nuclear","exio" +"27491","Croatia","HR","Electricity by hydro","exio" +"27492","Croatia","HR","Electricity by wind","exio" +"27493","Croatia","HR","Electricity by petroleum and other oil derivatives","exio" +"27494","Croatia","HR","Electricity by biomass and waste","exio" +"27495","Croatia","HR","Electricity by solar photovoltaic","exio" +"27496","Croatia","HR","Electricity by solar thermal","exio" +"27497","Croatia","HR","Electricity by tide, wave, ocean","exio" +"27498","Croatia","HR","Electricity by Geothermal","exio" +"27499","Croatia","HR","Electricity nec","exio" +"27500","Croatia","HR","Transmission services of electricity","exio" +"27501","Croatia","HR","Distribution and trade services of electricity","exio" +"27502","Croatia","HR","Coke oven gas","exio" +"27503","Croatia","HR","Blast Furnace Gas","exio" +"27504","Croatia","HR","Oxygen Steel Furnace Gas","exio" +"27505","Croatia","HR","Gas Works Gas","exio" +"27506","Croatia","HR","Biogas","exio" +"27507","Croatia","HR","Distribution services of gaseous fuels through mains","exio" +"27508","Croatia","HR","Steam and hot water supply services","exio" +"27509","Croatia","HR","Collected and purified water, distribution services of water","exio" +"27510","Croatia","HR","Construction work","exio" +"27511","Croatia","HR","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"27512","Croatia","HR","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"27513","Croatia","HR","Retail trade services of motor fuel","exio" +"27514","Croatia","HR","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"27515","Croatia","HR","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"27516","Croatia","HR","Hotel and restaurant services","exio" +"27517","Croatia","HR","Railway transportation services","exio" +"27518","Croatia","HR","Other land transportation services","exio" +"27519","Croatia","HR","Transportation services via pipelines","exio" +"27520","Croatia","HR","Sea and coastal water transportation services","exio" +"27521","Croatia","HR","Inland water transportation services","exio" +"27522","Croatia","HR","Air transport services","exio" +"27523","Croatia","HR","Supporting and auxiliary transport services; travel agency services","exio" +"27524","Croatia","HR","Post and telecommunication services","exio" +"27525","Croatia","HR","Financial intermediation services, except insurance and pension funding services","exio" +"27526","Croatia","HR","Insurance and pension funding services, except compulsory social security services","exio" +"27527","Croatia","HR","Services auxiliary to financial intermediation","exio" +"27528","Croatia","HR","Real estate services","exio" +"27529","Croatia","HR","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"27530","Croatia","HR","Computer and related services","exio" +"27531","Croatia","HR","Research and development services","exio" +"27532","Croatia","HR","Other business services","exio" +"27533","Croatia","HR","Public administration and defence services; compulsory social security services","exio" +"27534","Croatia","HR","Education services","exio" +"27535","Croatia","HR","Health and social work services","exio" +"27536","Croatia","HR","Food waste for treatment: incineration","exio" +"27537","Croatia","HR","Paper waste for treatment: incineration","exio" +"27538","Croatia","HR","Plastic waste for treatment: incineration","exio" +"27539","Croatia","HR","Intert/metal waste for treatment: incineration","exio" +"27540","Croatia","HR","Textiles waste for treatment: incineration","exio" +"27541","Croatia","HR","Wood waste for treatment: incineration","exio" +"27542","Croatia","HR","Oil/hazardous waste for treatment: incineration","exio" +"27543","Croatia","HR","Food waste for treatment: biogasification and land application","exio" +"27544","Croatia","HR","Paper waste for treatment: biogasification and land application","exio" +"27545","Croatia","HR","Sewage sludge for treatment: biogasification and land application","exio" +"27546","Croatia","HR","Food waste for treatment: composting and land application","exio" +"27547","Croatia","HR","Paper and wood waste for treatment: composting and land application","exio" +"27548","Croatia","HR","Food waste for treatment: waste water treatment","exio" +"27549","Croatia","HR","Other waste for treatment: waste water treatment","exio" +"27550","Croatia","HR","Food waste for treatment: landfill","exio" +"27551","Croatia","HR","Paper for treatment: landfill","exio" +"27552","Croatia","HR","Plastic waste for treatment: landfill","exio" +"27553","Croatia","HR","Inert/metal/hazardous waste for treatment: landfill","exio" +"27554","Croatia","HR","Textiles waste for treatment: landfill","exio" +"27555","Croatia","HR","Wood waste for treatment: landfill","exio" +"27556","Croatia","HR","Membership organisation services n.e.c.","exio" +"27557","Croatia","HR","Recreational, cultural and sporting services","exio" +"27558","Croatia","HR","Other services","exio" +"27559","Croatia","HR","Private households with employed persons","exio" +"27560","Croatia","HR","Extra-territorial organizations and bodies","exio" +"27561","Hungary","HU","Paddy rice","exio" +"27562","Hungary","HU","Wheat","exio" +"27563","Hungary","HU","Cereal grains nec","exio" +"27564","Hungary","HU","Vegetables, fruit, nuts","exio" +"27565","Hungary","HU","Oil seeds","exio" +"27566","Hungary","HU","Sugar cane, sugar beet","exio" +"27567","Hungary","HU","Plant-based fibers","exio" +"27568","Hungary","HU","Crops nec","exio" +"27569","Hungary","HU","Cattle","exio" +"27570","Hungary","HU","Pigs","exio" +"27571","Hungary","HU","Poultry","exio" +"27572","Hungary","HU","Meat animals nec","exio" +"27573","Hungary","HU","Animal products nec","exio" +"27574","Hungary","HU","Raw milk","exio" +"27575","Hungary","HU","Wool, silk-worm cocoons","exio" +"27576","Hungary","HU","Manure (conventional treatment)","exio" +"27577","Hungary","HU","Manure (biogas treatment)","exio" +"27578","Hungary","HU","Products of forestry, logging and related services","exio" +"27579","Hungary","HU","Fish and other fishing products; services incidental of fishing","exio" +"27580","Hungary","HU","Anthracite","exio" +"27581","Hungary","HU","Coking Coal","exio" +"27582","Hungary","HU","Other Bituminous Coal","exio" +"27583","Hungary","HU","Sub-Bituminous Coal","exio" +"27584","Hungary","HU","Patent Fuel","exio" +"27585","Hungary","HU","Lignite/Brown Coal","exio" +"27586","Hungary","HU","BKB/Peat Briquettes","exio" +"27587","Hungary","HU","Peat","exio" +"27588","Hungary","HU","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"27589","Hungary","HU","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"27590","Hungary","HU","Natural Gas Liquids","exio" +"27591","Hungary","HU","Other Hydrocarbons","exio" +"27592","Hungary","HU","Uranium and thorium ores","exio" +"27593","Hungary","HU","Iron ores","exio" +"27594","Hungary","HU","Copper ores and concentrates","exio" +"27595","Hungary","HU","Nickel ores and concentrates","exio" +"27596","Hungary","HU","Aluminium ores and concentrates","exio" +"27597","Hungary","HU","Precious metal ores and concentrates","exio" +"27598","Hungary","HU","Lead, zinc and tin ores and concentrates","exio" +"27599","Hungary","HU","Other non-ferrous metal ores and concentrates","exio" +"27600","Hungary","HU","Stone","exio" +"27601","Hungary","HU","Sand and clay","exio" +"27602","Hungary","HU","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"27603","Hungary","HU","Products of meat cattle","exio" +"27604","Hungary","HU","Products of meat pigs","exio" +"27605","Hungary","HU","Products of meat poultry","exio" +"27606","Hungary","HU","Meat products nec","exio" +"27607","Hungary","HU","products of Vegetable oils and fats","exio" +"27608","Hungary","HU","Dairy products","exio" +"27609","Hungary","HU","Processed rice","exio" +"27610","Hungary","HU","Sugar","exio" +"27611","Hungary","HU","Food products nec","exio" +"27612","Hungary","HU","Beverages","exio" +"27613","Hungary","HU","Fish products","exio" +"27614","Hungary","HU","Tobacco products","exio" +"27615","Hungary","HU","Textiles","exio" +"27616","Hungary","HU","Wearing apparel; furs","exio" +"27617","Hungary","HU","Leather and leather products","exio" +"27618","Hungary","HU","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"27619","Hungary","HU","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"27620","Hungary","HU","Pulp","exio" +"27621","Hungary","HU","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"27622","Hungary","HU","Paper and paper products","exio" +"27623","Hungary","HU","Printed matter and recorded media","exio" +"27624","Hungary","HU","Coke Oven Coke","exio" +"27625","Hungary","HU","Gas Coke","exio" +"27626","Hungary","HU","Coal Tar","exio" +"27627","Hungary","HU","Motor Gasoline","exio" +"27628","Hungary","HU","Aviation Gasoline","exio" +"27629","Hungary","HU","Gasoline Type Jet Fuel","exio" +"27630","Hungary","HU","Kerosene Type Jet Fuel","exio" +"27631","Hungary","HU","Kerosene","exio" +"27632","Hungary","HU","Gas/Diesel Oil","exio" +"27633","Hungary","HU","Heavy Fuel Oil","exio" +"27634","Hungary","HU","Refinery Gas","exio" +"27635","Hungary","HU","Liquefied Petroleum Gases (LPG)","exio" +"27636","Hungary","HU","Refinery Feedstocks","exio" +"27637","Hungary","HU","Ethane","exio" +"27638","Hungary","HU","Naphtha","exio" +"27639","Hungary","HU","White Spirit & SBP","exio" +"27640","Hungary","HU","Lubricants","exio" +"27641","Hungary","HU","Bitumen","exio" +"27642","Hungary","HU","Paraffin Waxes","exio" +"27643","Hungary","HU","Petroleum Coke","exio" +"27644","Hungary","HU","Non-specified Petroleum Products","exio" +"27645","Hungary","HU","Nuclear fuel","exio" +"27646","Hungary","HU","Plastics, basic","exio" +"27647","Hungary","HU","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"27648","Hungary","HU","N-fertiliser","exio" +"27649","Hungary","HU","P- and other fertiliser","exio" +"27650","Hungary","HU","Chemicals nec","exio" +"27651","Hungary","HU","Charcoal","exio" +"27652","Hungary","HU","Additives/Blending Components","exio" +"27653","Hungary","HU","Biogasoline","exio" +"27654","Hungary","HU","Biodiesels","exio" +"27655","Hungary","HU","Other Liquid Biofuels","exio" +"27656","Hungary","HU","Rubber and plastic products","exio" +"27657","Hungary","HU","Glass and glass products","exio" +"27658","Hungary","HU","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"27659","Hungary","HU","Ceramic goods","exio" +"27660","Hungary","HU","Bricks, tiles and construction products, in baked clay","exio" +"27661","Hungary","HU","Cement, lime and plaster","exio" +"27662","Hungary","HU","Ash for treatment, Re-processing of ash into clinker","exio" +"27663","Hungary","HU","Other non-metallic mineral products","exio" +"27664","Hungary","HU","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"27665","Hungary","HU","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"27666","Hungary","HU","Precious metals","exio" +"27667","Hungary","HU","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"27668","Hungary","HU","Aluminium and aluminium products","exio" +"27669","Hungary","HU","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"27670","Hungary","HU","Lead, zinc and tin and products thereof","exio" +"27671","Hungary","HU","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"27672","Hungary","HU","Copper products","exio" +"27673","Hungary","HU","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"27674","Hungary","HU","Other non-ferrous metal products","exio" +"27675","Hungary","HU","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"27676","Hungary","HU","Foundry work services","exio" +"27677","Hungary","HU","Fabricated metal products, except machinery and equipment","exio" +"27678","Hungary","HU","Machinery and equipment n.e.c.","exio" +"27679","Hungary","HU","Office machinery and computers","exio" +"27680","Hungary","HU","Electrical machinery and apparatus n.e.c.","exio" +"27681","Hungary","HU","Radio, television and communication equipment and apparatus","exio" +"27682","Hungary","HU","Medical, precision and optical instruments, watches and clocks","exio" +"27683","Hungary","HU","Motor vehicles, trailers and semi-trailers","exio" +"27684","Hungary","HU","Other transport equipment","exio" +"27685","Hungary","HU","Furniture; other manufactured goods n.e.c.","exio" +"27686","Hungary","HU","Secondary raw materials","exio" +"27687","Hungary","HU","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"27688","Hungary","HU","Electricity by coal","exio" +"27689","Hungary","HU","Electricity by gas","exio" +"27690","Hungary","HU","Electricity by nuclear","exio" +"27691","Hungary","HU","Electricity by hydro","exio" +"27692","Hungary","HU","Electricity by wind","exio" +"27693","Hungary","HU","Electricity by petroleum and other oil derivatives","exio" +"27694","Hungary","HU","Electricity by biomass and waste","exio" +"27695","Hungary","HU","Electricity by solar photovoltaic","exio" +"27696","Hungary","HU","Electricity by solar thermal","exio" +"27697","Hungary","HU","Electricity by tide, wave, ocean","exio" +"27698","Hungary","HU","Electricity by Geothermal","exio" +"27699","Hungary","HU","Electricity nec","exio" +"27700","Hungary","HU","Transmission services of electricity","exio" +"27701","Hungary","HU","Distribution and trade services of electricity","exio" +"27702","Hungary","HU","Coke oven gas","exio" +"27703","Hungary","HU","Blast Furnace Gas","exio" +"27704","Hungary","HU","Oxygen Steel Furnace Gas","exio" +"27705","Hungary","HU","Gas Works Gas","exio" +"27706","Hungary","HU","Biogas","exio" +"27707","Hungary","HU","Distribution services of gaseous fuels through mains","exio" +"27708","Hungary","HU","Steam and hot water supply services","exio" +"27709","Hungary","HU","Collected and purified water, distribution services of water","exio" +"27710","Hungary","HU","Construction work","exio" +"27711","Hungary","HU","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"27712","Hungary","HU","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"27713","Hungary","HU","Retail trade services of motor fuel","exio" +"27714","Hungary","HU","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"27715","Hungary","HU","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"27716","Hungary","HU","Hotel and restaurant services","exio" +"27717","Hungary","HU","Railway transportation services","exio" +"27718","Hungary","HU","Other land transportation services","exio" +"27719","Hungary","HU","Transportation services via pipelines","exio" +"27720","Hungary","HU","Sea and coastal water transportation services","exio" +"27721","Hungary","HU","Inland water transportation services","exio" +"27722","Hungary","HU","Air transport services","exio" +"27723","Hungary","HU","Supporting and auxiliary transport services; travel agency services","exio" +"27724","Hungary","HU","Post and telecommunication services","exio" +"27725","Hungary","HU","Financial intermediation services, except insurance and pension funding services","exio" +"27726","Hungary","HU","Insurance and pension funding services, except compulsory social security services","exio" +"27727","Hungary","HU","Services auxiliary to financial intermediation","exio" +"27728","Hungary","HU","Real estate services","exio" +"27729","Hungary","HU","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"27730","Hungary","HU","Computer and related services","exio" +"27731","Hungary","HU","Research and development services","exio" +"27732","Hungary","HU","Other business services","exio" +"27733","Hungary","HU","Public administration and defence services; compulsory social security services","exio" +"27734","Hungary","HU","Education services","exio" +"27735","Hungary","HU","Health and social work services","exio" +"27736","Hungary","HU","Food waste for treatment: incineration","exio" +"27737","Hungary","HU","Paper waste for treatment: incineration","exio" +"27738","Hungary","HU","Plastic waste for treatment: incineration","exio" +"27739","Hungary","HU","Intert/metal waste for treatment: incineration","exio" +"27740","Hungary","HU","Textiles waste for treatment: incineration","exio" +"27741","Hungary","HU","Wood waste for treatment: incineration","exio" +"27742","Hungary","HU","Oil/hazardous waste for treatment: incineration","exio" +"27743","Hungary","HU","Food waste for treatment: biogasification and land application","exio" +"27744","Hungary","HU","Paper waste for treatment: biogasification and land application","exio" +"27745","Hungary","HU","Sewage sludge for treatment: biogasification and land application","exio" +"27746","Hungary","HU","Food waste for treatment: composting and land application","exio" +"27747","Hungary","HU","Paper and wood waste for treatment: composting and land application","exio" +"27748","Hungary","HU","Food waste for treatment: waste water treatment","exio" +"27749","Hungary","HU","Other waste for treatment: waste water treatment","exio" +"27750","Hungary","HU","Food waste for treatment: landfill","exio" +"27751","Hungary","HU","Paper for treatment: landfill","exio" +"27752","Hungary","HU","Plastic waste for treatment: landfill","exio" +"27753","Hungary","HU","Inert/metal/hazardous waste for treatment: landfill","exio" +"27754","Hungary","HU","Textiles waste for treatment: landfill","exio" +"27755","Hungary","HU","Wood waste for treatment: landfill","exio" +"27756","Hungary","HU","Membership organisation services n.e.c.","exio" +"27757","Hungary","HU","Recreational, cultural and sporting services","exio" +"27758","Hungary","HU","Other services","exio" +"27759","Hungary","HU","Private households with employed persons","exio" +"27760","Hungary","HU","Extra-territorial organizations and bodies","exio" +"27761","Ireland","IE","Paddy rice","exio" +"27762","Ireland","IE","Wheat","exio" +"27763","Ireland","IE","Cereal grains nec","exio" +"27764","Ireland","IE","Vegetables, fruit, nuts","exio" +"27765","Ireland","IE","Oil seeds","exio" +"27766","Ireland","IE","Sugar cane, sugar beet","exio" +"27767","Ireland","IE","Plant-based fibers","exio" +"27768","Ireland","IE","Crops nec","exio" +"27769","Ireland","IE","Cattle","exio" +"27770","Ireland","IE","Pigs","exio" +"27771","Ireland","IE","Poultry","exio" +"27772","Ireland","IE","Meat animals nec","exio" +"27773","Ireland","IE","Animal products nec","exio" +"27774","Ireland","IE","Raw milk","exio" +"27775","Ireland","IE","Wool, silk-worm cocoons","exio" +"27776","Ireland","IE","Manure (conventional treatment)","exio" +"27777","Ireland","IE","Manure (biogas treatment)","exio" +"27778","Ireland","IE","Products of forestry, logging and related services","exio" +"27779","Ireland","IE","Fish and other fishing products; services incidental of fishing","exio" +"27780","Ireland","IE","Anthracite","exio" +"27781","Ireland","IE","Coking Coal","exio" +"27782","Ireland","IE","Other Bituminous Coal","exio" +"27783","Ireland","IE","Sub-Bituminous Coal","exio" +"27784","Ireland","IE","Patent Fuel","exio" +"27785","Ireland","IE","Lignite/Brown Coal","exio" +"27786","Ireland","IE","BKB/Peat Briquettes","exio" +"27787","Ireland","IE","Peat","exio" +"27788","Ireland","IE","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"27789","Ireland","IE","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"27790","Ireland","IE","Natural Gas Liquids","exio" +"27791","Ireland","IE","Other Hydrocarbons","exio" +"27792","Ireland","IE","Uranium and thorium ores","exio" +"27793","Ireland","IE","Iron ores","exio" +"27794","Ireland","IE","Copper ores and concentrates","exio" +"27795","Ireland","IE","Nickel ores and concentrates","exio" +"27796","Ireland","IE","Aluminium ores and concentrates","exio" +"27797","Ireland","IE","Precious metal ores and concentrates","exio" +"27798","Ireland","IE","Lead, zinc and tin ores and concentrates","exio" +"27799","Ireland","IE","Other non-ferrous metal ores and concentrates","exio" +"27800","Ireland","IE","Stone","exio" +"27801","Ireland","IE","Sand and clay","exio" +"27802","Ireland","IE","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"27803","Ireland","IE","Products of meat cattle","exio" +"27804","Ireland","IE","Products of meat pigs","exio" +"27805","Ireland","IE","Products of meat poultry","exio" +"27806","Ireland","IE","Meat products nec","exio" +"27807","Ireland","IE","products of Vegetable oils and fats","exio" +"27808","Ireland","IE","Dairy products","exio" +"27809","Ireland","IE","Processed rice","exio" +"27810","Ireland","IE","Sugar","exio" +"27811","Ireland","IE","Food products nec","exio" +"27812","Ireland","IE","Beverages","exio" +"27813","Ireland","IE","Fish products","exio" +"27814","Ireland","IE","Tobacco products","exio" +"27815","Ireland","IE","Textiles","exio" +"27816","Ireland","IE","Wearing apparel; furs","exio" +"27817","Ireland","IE","Leather and leather products","exio" +"27818","Ireland","IE","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"27819","Ireland","IE","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"27820","Ireland","IE","Pulp","exio" +"27821","Ireland","IE","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"27822","Ireland","IE","Paper and paper products","exio" +"27823","Ireland","IE","Printed matter and recorded media","exio" +"27824","Ireland","IE","Coke Oven Coke","exio" +"27825","Ireland","IE","Gas Coke","exio" +"27826","Ireland","IE","Coal Tar","exio" +"27827","Ireland","IE","Motor Gasoline","exio" +"27828","Ireland","IE","Aviation Gasoline","exio" +"27829","Ireland","IE","Gasoline Type Jet Fuel","exio" +"27830","Ireland","IE","Kerosene Type Jet Fuel","exio" +"27831","Ireland","IE","Kerosene","exio" +"27832","Ireland","IE","Gas/Diesel Oil","exio" +"27833","Ireland","IE","Heavy Fuel Oil","exio" +"27834","Ireland","IE","Refinery Gas","exio" +"27835","Ireland","IE","Liquefied Petroleum Gases (LPG)","exio" +"27836","Ireland","IE","Refinery Feedstocks","exio" +"27837","Ireland","IE","Ethane","exio" +"27838","Ireland","IE","Naphtha","exio" +"27839","Ireland","IE","White Spirit & SBP","exio" +"27840","Ireland","IE","Lubricants","exio" +"27841","Ireland","IE","Bitumen","exio" +"27842","Ireland","IE","Paraffin Waxes","exio" +"27843","Ireland","IE","Petroleum Coke","exio" +"27844","Ireland","IE","Non-specified Petroleum Products","exio" +"27845","Ireland","IE","Nuclear fuel","exio" +"27846","Ireland","IE","Plastics, basic","exio" +"27847","Ireland","IE","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"27848","Ireland","IE","N-fertiliser","exio" +"27849","Ireland","IE","P- and other fertiliser","exio" +"27850","Ireland","IE","Chemicals nec","exio" +"27851","Ireland","IE","Charcoal","exio" +"27852","Ireland","IE","Additives/Blending Components","exio" +"27853","Ireland","IE","Biogasoline","exio" +"27854","Ireland","IE","Biodiesels","exio" +"27855","Ireland","IE","Other Liquid Biofuels","exio" +"27856","Ireland","IE","Rubber and plastic products","exio" +"27857","Ireland","IE","Glass and glass products","exio" +"27858","Ireland","IE","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"27859","Ireland","IE","Ceramic goods","exio" +"27860","Ireland","IE","Bricks, tiles and construction products, in baked clay","exio" +"27861","Ireland","IE","Cement, lime and plaster","exio" +"27862","Ireland","IE","Ash for treatment, Re-processing of ash into clinker","exio" +"27863","Ireland","IE","Other non-metallic mineral products","exio" +"27864","Ireland","IE","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"27865","Ireland","IE","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"27866","Ireland","IE","Precious metals","exio" +"27867","Ireland","IE","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"27868","Ireland","IE","Aluminium and aluminium products","exio" +"27869","Ireland","IE","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"27870","Ireland","IE","Lead, zinc and tin and products thereof","exio" +"27871","Ireland","IE","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"27872","Ireland","IE","Copper products","exio" +"27873","Ireland","IE","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"27874","Ireland","IE","Other non-ferrous metal products","exio" +"27875","Ireland","IE","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"27876","Ireland","IE","Foundry work services","exio" +"27877","Ireland","IE","Fabricated metal products, except machinery and equipment","exio" +"27878","Ireland","IE","Machinery and equipment n.e.c.","exio" +"27879","Ireland","IE","Office machinery and computers","exio" +"27880","Ireland","IE","Electrical machinery and apparatus n.e.c.","exio" +"27881","Ireland","IE","Radio, television and communication equipment and apparatus","exio" +"27882","Ireland","IE","Medical, precision and optical instruments, watches and clocks","exio" +"27883","Ireland","IE","Motor vehicles, trailers and semi-trailers","exio" +"27884","Ireland","IE","Other transport equipment","exio" +"27885","Ireland","IE","Furniture; other manufactured goods n.e.c.","exio" +"27886","Ireland","IE","Secondary raw materials","exio" +"27887","Ireland","IE","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"27888","Ireland","IE","Electricity by coal","exio" +"27889","Ireland","IE","Electricity by gas","exio" +"27890","Ireland","IE","Electricity by nuclear","exio" +"27891","Ireland","IE","Electricity by hydro","exio" +"27892","Ireland","IE","Electricity by wind","exio" +"27893","Ireland","IE","Electricity by petroleum and other oil derivatives","exio" +"27894","Ireland","IE","Electricity by biomass and waste","exio" +"27895","Ireland","IE","Electricity by solar photovoltaic","exio" +"27896","Ireland","IE","Electricity by solar thermal","exio" +"27897","Ireland","IE","Electricity by tide, wave, ocean","exio" +"27898","Ireland","IE","Electricity by Geothermal","exio" +"27899","Ireland","IE","Electricity nec","exio" +"27900","Ireland","IE","Transmission services of electricity","exio" +"27901","Ireland","IE","Distribution and trade services of electricity","exio" +"27902","Ireland","IE","Coke oven gas","exio" +"27903","Ireland","IE","Blast Furnace Gas","exio" +"27904","Ireland","IE","Oxygen Steel Furnace Gas","exio" +"27905","Ireland","IE","Gas Works Gas","exio" +"27906","Ireland","IE","Biogas","exio" +"27907","Ireland","IE","Distribution services of gaseous fuels through mains","exio" +"27908","Ireland","IE","Steam and hot water supply services","exio" +"27909","Ireland","IE","Collected and purified water, distribution services of water","exio" +"27910","Ireland","IE","Construction work","exio" +"27911","Ireland","IE","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"27912","Ireland","IE","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"27913","Ireland","IE","Retail trade services of motor fuel","exio" +"27914","Ireland","IE","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"27915","Ireland","IE","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"27916","Ireland","IE","Hotel and restaurant services","exio" +"27917","Ireland","IE","Railway transportation services","exio" +"27918","Ireland","IE","Other land transportation services","exio" +"27919","Ireland","IE","Transportation services via pipelines","exio" +"27920","Ireland","IE","Sea and coastal water transportation services","exio" +"27921","Ireland","IE","Inland water transportation services","exio" +"27922","Ireland","IE","Air transport services","exio" +"27923","Ireland","IE","Supporting and auxiliary transport services; travel agency services","exio" +"27924","Ireland","IE","Post and telecommunication services","exio" +"27925","Ireland","IE","Financial intermediation services, except insurance and pension funding services","exio" +"27926","Ireland","IE","Insurance and pension funding services, except compulsory social security services","exio" +"27927","Ireland","IE","Services auxiliary to financial intermediation","exio" +"27928","Ireland","IE","Real estate services","exio" +"27929","Ireland","IE","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"27930","Ireland","IE","Computer and related services","exio" +"27931","Ireland","IE","Research and development services","exio" +"27932","Ireland","IE","Other business services","exio" +"27933","Ireland","IE","Public administration and defence services; compulsory social security services","exio" +"27934","Ireland","IE","Education services","exio" +"27935","Ireland","IE","Health and social work services","exio" +"27936","Ireland","IE","Food waste for treatment: incineration","exio" +"27937","Ireland","IE","Paper waste for treatment: incineration","exio" +"27938","Ireland","IE","Plastic waste for treatment: incineration","exio" +"27939","Ireland","IE","Intert/metal waste for treatment: incineration","exio" +"27940","Ireland","IE","Textiles waste for treatment: incineration","exio" +"27941","Ireland","IE","Wood waste for treatment: incineration","exio" +"27942","Ireland","IE","Oil/hazardous waste for treatment: incineration","exio" +"27943","Ireland","IE","Food waste for treatment: biogasification and land application","exio" +"27944","Ireland","IE","Paper waste for treatment: biogasification and land application","exio" +"27945","Ireland","IE","Sewage sludge for treatment: biogasification and land application","exio" +"27946","Ireland","IE","Food waste for treatment: composting and land application","exio" +"27947","Ireland","IE","Paper and wood waste for treatment: composting and land application","exio" +"27948","Ireland","IE","Food waste for treatment: waste water treatment","exio" +"27949","Ireland","IE","Other waste for treatment: waste water treatment","exio" +"27950","Ireland","IE","Food waste for treatment: landfill","exio" +"27951","Ireland","IE","Paper for treatment: landfill","exio" +"27952","Ireland","IE","Plastic waste for treatment: landfill","exio" +"27953","Ireland","IE","Inert/metal/hazardous waste for treatment: landfill","exio" +"27954","Ireland","IE","Textiles waste for treatment: landfill","exio" +"27955","Ireland","IE","Wood waste for treatment: landfill","exio" +"27956","Ireland","IE","Membership organisation services n.e.c.","exio" +"27957","Ireland","IE","Recreational, cultural and sporting services","exio" +"27958","Ireland","IE","Other services","exio" +"27959","Ireland","IE","Private households with employed persons","exio" +"27960","Ireland","IE","Extra-territorial organizations and bodies","exio" +"27961","Italy","IT","Paddy rice","exio" +"27962","Italy","IT","Wheat","exio" +"27963","Italy","IT","Cereal grains nec","exio" +"27964","Italy","IT","Vegetables, fruit, nuts","exio" +"27965","Italy","IT","Oil seeds","exio" +"27966","Italy","IT","Sugar cane, sugar beet","exio" +"27967","Italy","IT","Plant-based fibers","exio" +"27968","Italy","IT","Crops nec","exio" +"27969","Italy","IT","Cattle","exio" +"27970","Italy","IT","Pigs","exio" +"27971","Italy","IT","Poultry","exio" +"27972","Italy","IT","Meat animals nec","exio" +"27973","Italy","IT","Animal products nec","exio" +"27974","Italy","IT","Raw milk","exio" +"27975","Italy","IT","Wool, silk-worm cocoons","exio" +"27976","Italy","IT","Manure (conventional treatment)","exio" +"27977","Italy","IT","Manure (biogas treatment)","exio" +"27978","Italy","IT","Products of forestry, logging and related services","exio" +"27979","Italy","IT","Fish and other fishing products; services incidental of fishing","exio" +"27980","Italy","IT","Anthracite","exio" +"27981","Italy","IT","Coking Coal","exio" +"27982","Italy","IT","Other Bituminous Coal","exio" +"27983","Italy","IT","Sub-Bituminous Coal","exio" +"27984","Italy","IT","Patent Fuel","exio" +"27985","Italy","IT","Lignite/Brown Coal","exio" +"27986","Italy","IT","BKB/Peat Briquettes","exio" +"27987","Italy","IT","Peat","exio" +"27988","Italy","IT","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"27989","Italy","IT","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"27990","Italy","IT","Natural Gas Liquids","exio" +"27991","Italy","IT","Other Hydrocarbons","exio" +"27992","Italy","IT","Uranium and thorium ores","exio" +"27993","Italy","IT","Iron ores","exio" +"27994","Italy","IT","Copper ores and concentrates","exio" +"27995","Italy","IT","Nickel ores and concentrates","exio" +"27996","Italy","IT","Aluminium ores and concentrates","exio" +"27997","Italy","IT","Precious metal ores and concentrates","exio" +"27998","Italy","IT","Lead, zinc and tin ores and concentrates","exio" +"27999","Italy","IT","Other non-ferrous metal ores and concentrates","exio" +"28000","Italy","IT","Stone","exio" +"28001","Italy","IT","Sand and clay","exio" +"28002","Italy","IT","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"28003","Italy","IT","Products of meat cattle","exio" +"28004","Italy","IT","Products of meat pigs","exio" +"28005","Italy","IT","Products of meat poultry","exio" +"28006","Italy","IT","Meat products nec","exio" +"28007","Italy","IT","products of Vegetable oils and fats","exio" +"28008","Italy","IT","Dairy products","exio" +"28009","Italy","IT","Processed rice","exio" +"28010","Italy","IT","Sugar","exio" +"28011","Italy","IT","Food products nec","exio" +"28012","Italy","IT","Beverages","exio" +"28013","Italy","IT","Fish products","exio" +"28014","Italy","IT","Tobacco products","exio" +"28015","Italy","IT","Textiles","exio" +"28016","Italy","IT","Wearing apparel; furs","exio" +"28017","Italy","IT","Leather and leather products","exio" +"28018","Italy","IT","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"28019","Italy","IT","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"28020","Italy","IT","Pulp","exio" +"28021","Italy","IT","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"28022","Italy","IT","Paper and paper products","exio" +"28023","Italy","IT","Printed matter and recorded media","exio" +"28024","Italy","IT","Coke Oven Coke","exio" +"28025","Italy","IT","Gas Coke","exio" +"28026","Italy","IT","Coal Tar","exio" +"28027","Italy","IT","Motor Gasoline","exio" +"28028","Italy","IT","Aviation Gasoline","exio" +"28029","Italy","IT","Gasoline Type Jet Fuel","exio" +"28030","Italy","IT","Kerosene Type Jet Fuel","exio" +"28031","Italy","IT","Kerosene","exio" +"28032","Italy","IT","Gas/Diesel Oil","exio" +"28033","Italy","IT","Heavy Fuel Oil","exio" +"28034","Italy","IT","Refinery Gas","exio" +"28035","Italy","IT","Liquefied Petroleum Gases (LPG)","exio" +"28036","Italy","IT","Refinery Feedstocks","exio" +"28037","Italy","IT","Ethane","exio" +"28038","Italy","IT","Naphtha","exio" +"28039","Italy","IT","White Spirit & SBP","exio" +"28040","Italy","IT","Lubricants","exio" +"28041","Italy","IT","Bitumen","exio" +"28042","Italy","IT","Paraffin Waxes","exio" +"28043","Italy","IT","Petroleum Coke","exio" +"28044","Italy","IT","Non-specified Petroleum Products","exio" +"28045","Italy","IT","Nuclear fuel","exio" +"28046","Italy","IT","Plastics, basic","exio" +"28047","Italy","IT","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"28048","Italy","IT","N-fertiliser","exio" +"28049","Italy","IT","P- and other fertiliser","exio" +"28050","Italy","IT","Chemicals nec","exio" +"28051","Italy","IT","Charcoal","exio" +"28052","Italy","IT","Additives/Blending Components","exio" +"28053","Italy","IT","Biogasoline","exio" +"28054","Italy","IT","Biodiesels","exio" +"28055","Italy","IT","Other Liquid Biofuels","exio" +"28056","Italy","IT","Rubber and plastic products","exio" +"28057","Italy","IT","Glass and glass products","exio" +"28058","Italy","IT","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"28059","Italy","IT","Ceramic goods","exio" +"28060","Italy","IT","Bricks, tiles and construction products, in baked clay","exio" +"28061","Italy","IT","Cement, lime and plaster","exio" +"28062","Italy","IT","Ash for treatment, Re-processing of ash into clinker","exio" +"28063","Italy","IT","Other non-metallic mineral products","exio" +"28064","Italy","IT","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"28065","Italy","IT","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"28066","Italy","IT","Precious metals","exio" +"28067","Italy","IT","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"28068","Italy","IT","Aluminium and aluminium products","exio" +"28069","Italy","IT","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"28070","Italy","IT","Lead, zinc and tin and products thereof","exio" +"28071","Italy","IT","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"28072","Italy","IT","Copper products","exio" +"28073","Italy","IT","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"28074","Italy","IT","Other non-ferrous metal products","exio" +"28075","Italy","IT","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"28076","Italy","IT","Foundry work services","exio" +"28077","Italy","IT","Fabricated metal products, except machinery and equipment","exio" +"28078","Italy","IT","Machinery and equipment n.e.c.","exio" +"28079","Italy","IT","Office machinery and computers","exio" +"28080","Italy","IT","Electrical machinery and apparatus n.e.c.","exio" +"28081","Italy","IT","Radio, television and communication equipment and apparatus","exio" +"28082","Italy","IT","Medical, precision and optical instruments, watches and clocks","exio" +"28083","Italy","IT","Motor vehicles, trailers and semi-trailers","exio" +"28084","Italy","IT","Other transport equipment","exio" +"28085","Italy","IT","Furniture; other manufactured goods n.e.c.","exio" +"28086","Italy","IT","Secondary raw materials","exio" +"28087","Italy","IT","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"28088","Italy","IT","Electricity by coal","exio" +"28089","Italy","IT","Electricity by gas","exio" +"28090","Italy","IT","Electricity by nuclear","exio" +"28091","Italy","IT","Electricity by hydro","exio" +"28092","Italy","IT","Electricity by wind","exio" +"28093","Italy","IT","Electricity by petroleum and other oil derivatives","exio" +"28094","Italy","IT","Electricity by biomass and waste","exio" +"28095","Italy","IT","Electricity by solar photovoltaic","exio" +"28096","Italy","IT","Electricity by solar thermal","exio" +"28097","Italy","IT","Electricity by tide, wave, ocean","exio" +"28098","Italy","IT","Electricity by Geothermal","exio" +"28099","Italy","IT","Electricity nec","exio" +"28100","Italy","IT","Transmission services of electricity","exio" +"28101","Italy","IT","Distribution and trade services of electricity","exio" +"28102","Italy","IT","Coke oven gas","exio" +"28103","Italy","IT","Blast Furnace Gas","exio" +"28104","Italy","IT","Oxygen Steel Furnace Gas","exio" +"28105","Italy","IT","Gas Works Gas","exio" +"28106","Italy","IT","Biogas","exio" +"28107","Italy","IT","Distribution services of gaseous fuels through mains","exio" +"28108","Italy","IT","Steam and hot water supply services","exio" +"28109","Italy","IT","Collected and purified water, distribution services of water","exio" +"28110","Italy","IT","Construction work","exio" +"28111","Italy","IT","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"28112","Italy","IT","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"28113","Italy","IT","Retail trade services of motor fuel","exio" +"28114","Italy","IT","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"28115","Italy","IT","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"28116","Italy","IT","Hotel and restaurant services","exio" +"28117","Italy","IT","Railway transportation services","exio" +"28118","Italy","IT","Other land transportation services","exio" +"28119","Italy","IT","Transportation services via pipelines","exio" +"28120","Italy","IT","Sea and coastal water transportation services","exio" +"28121","Italy","IT","Inland water transportation services","exio" +"28122","Italy","IT","Air transport services","exio" +"28123","Italy","IT","Supporting and auxiliary transport services; travel agency services","exio" +"28124","Italy","IT","Post and telecommunication services","exio" +"28125","Italy","IT","Financial intermediation services, except insurance and pension funding services","exio" +"28126","Italy","IT","Insurance and pension funding services, except compulsory social security services","exio" +"28127","Italy","IT","Services auxiliary to financial intermediation","exio" +"28128","Italy","IT","Real estate services","exio" +"28129","Italy","IT","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"28130","Italy","IT","Computer and related services","exio" +"28131","Italy","IT","Research and development services","exio" +"28132","Italy","IT","Other business services","exio" +"28133","Italy","IT","Public administration and defence services; compulsory social security services","exio" +"28134","Italy","IT","Education services","exio" +"28135","Italy","IT","Health and social work services","exio" +"28136","Italy","IT","Food waste for treatment: incineration","exio" +"28137","Italy","IT","Paper waste for treatment: incineration","exio" +"28138","Italy","IT","Plastic waste for treatment: incineration","exio" +"28139","Italy","IT","Intert/metal waste for treatment: incineration","exio" +"28140","Italy","IT","Textiles waste for treatment: incineration","exio" +"28141","Italy","IT","Wood waste for treatment: incineration","exio" +"28142","Italy","IT","Oil/hazardous waste for treatment: incineration","exio" +"28143","Italy","IT","Food waste for treatment: biogasification and land application","exio" +"28144","Italy","IT","Paper waste for treatment: biogasification and land application","exio" +"28145","Italy","IT","Sewage sludge for treatment: biogasification and land application","exio" +"28146","Italy","IT","Food waste for treatment: composting and land application","exio" +"28147","Italy","IT","Paper and wood waste for treatment: composting and land application","exio" +"28148","Italy","IT","Food waste for treatment: waste water treatment","exio" +"28149","Italy","IT","Other waste for treatment: waste water treatment","exio" +"28150","Italy","IT","Food waste for treatment: landfill","exio" +"28151","Italy","IT","Paper for treatment: landfill","exio" +"28152","Italy","IT","Plastic waste for treatment: landfill","exio" +"28153","Italy","IT","Inert/metal/hazardous waste for treatment: landfill","exio" +"28154","Italy","IT","Textiles waste for treatment: landfill","exio" +"28155","Italy","IT","Wood waste for treatment: landfill","exio" +"28156","Italy","IT","Membership organisation services n.e.c.","exio" +"28157","Italy","IT","Recreational, cultural and sporting services","exio" +"28158","Italy","IT","Other services","exio" +"28159","Italy","IT","Private households with employed persons","exio" +"28160","Italy","IT","Extra-territorial organizations and bodies","exio" +"28161","Lithuania","LT","Paddy rice","exio" +"28162","Lithuania","LT","Wheat","exio" +"28163","Lithuania","LT","Cereal grains nec","exio" +"28164","Lithuania","LT","Vegetables, fruit, nuts","exio" +"28165","Lithuania","LT","Oil seeds","exio" +"28166","Lithuania","LT","Sugar cane, sugar beet","exio" +"28167","Lithuania","LT","Plant-based fibers","exio" +"28168","Lithuania","LT","Crops nec","exio" +"28169","Lithuania","LT","Cattle","exio" +"28170","Lithuania","LT","Pigs","exio" +"28171","Lithuania","LT","Poultry","exio" +"28172","Lithuania","LT","Meat animals nec","exio" +"28173","Lithuania","LT","Animal products nec","exio" +"28174","Lithuania","LT","Raw milk","exio" +"28175","Lithuania","LT","Wool, silk-worm cocoons","exio" +"28176","Lithuania","LT","Manure (conventional treatment)","exio" +"28177","Lithuania","LT","Manure (biogas treatment)","exio" +"28178","Lithuania","LT","Products of forestry, logging and related services","exio" +"28179","Lithuania","LT","Fish and other fishing products; services incidental of fishing","exio" +"28180","Lithuania","LT","Anthracite","exio" +"28181","Lithuania","LT","Coking Coal","exio" +"28182","Lithuania","LT","Other Bituminous Coal","exio" +"28183","Lithuania","LT","Sub-Bituminous Coal","exio" +"28184","Lithuania","LT","Patent Fuel","exio" +"28185","Lithuania","LT","Lignite/Brown Coal","exio" +"28186","Lithuania","LT","BKB/Peat Briquettes","exio" +"28187","Lithuania","LT","Peat","exio" +"28188","Lithuania","LT","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"28189","Lithuania","LT","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"28190","Lithuania","LT","Natural Gas Liquids","exio" +"28191","Lithuania","LT","Other Hydrocarbons","exio" +"28192","Lithuania","LT","Uranium and thorium ores","exio" +"28193","Lithuania","LT","Iron ores","exio" +"28194","Lithuania","LT","Copper ores and concentrates","exio" +"28195","Lithuania","LT","Nickel ores and concentrates","exio" +"28196","Lithuania","LT","Aluminium ores and concentrates","exio" +"28197","Lithuania","LT","Precious metal ores and concentrates","exio" +"28198","Lithuania","LT","Lead, zinc and tin ores and concentrates","exio" +"28199","Lithuania","LT","Other non-ferrous metal ores and concentrates","exio" +"28200","Lithuania","LT","Stone","exio" +"28201","Lithuania","LT","Sand and clay","exio" +"28202","Lithuania","LT","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"28203","Lithuania","LT","Products of meat cattle","exio" +"28204","Lithuania","LT","Products of meat pigs","exio" +"28205","Lithuania","LT","Products of meat poultry","exio" +"28206","Lithuania","LT","Meat products nec","exio" +"28207","Lithuania","LT","products of Vegetable oils and fats","exio" +"28208","Lithuania","LT","Dairy products","exio" +"28209","Lithuania","LT","Processed rice","exio" +"28210","Lithuania","LT","Sugar","exio" +"28211","Lithuania","LT","Food products nec","exio" +"28212","Lithuania","LT","Beverages","exio" +"28213","Lithuania","LT","Fish products","exio" +"28214","Lithuania","LT","Tobacco products","exio" +"28215","Lithuania","LT","Textiles","exio" +"28216","Lithuania","LT","Wearing apparel; furs","exio" +"28217","Lithuania","LT","Leather and leather products","exio" +"28218","Lithuania","LT","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"28219","Lithuania","LT","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"28220","Lithuania","LT","Pulp","exio" +"28221","Lithuania","LT","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"28222","Lithuania","LT","Paper and paper products","exio" +"28223","Lithuania","LT","Printed matter and recorded media","exio" +"28224","Lithuania","LT","Coke Oven Coke","exio" +"28225","Lithuania","LT","Gas Coke","exio" +"28226","Lithuania","LT","Coal Tar","exio" +"28227","Lithuania","LT","Motor Gasoline","exio" +"28228","Lithuania","LT","Aviation Gasoline","exio" +"28229","Lithuania","LT","Gasoline Type Jet Fuel","exio" +"28230","Lithuania","LT","Kerosene Type Jet Fuel","exio" +"28231","Lithuania","LT","Kerosene","exio" +"28232","Lithuania","LT","Gas/Diesel Oil","exio" +"28233","Lithuania","LT","Heavy Fuel Oil","exio" +"28234","Lithuania","LT","Refinery Gas","exio" +"28235","Lithuania","LT","Liquefied Petroleum Gases (LPG)","exio" +"28236","Lithuania","LT","Refinery Feedstocks","exio" +"28237","Lithuania","LT","Ethane","exio" +"28238","Lithuania","LT","Naphtha","exio" +"28239","Lithuania","LT","White Spirit & SBP","exio" +"28240","Lithuania","LT","Lubricants","exio" +"28241","Lithuania","LT","Bitumen","exio" +"28242","Lithuania","LT","Paraffin Waxes","exio" +"28243","Lithuania","LT","Petroleum Coke","exio" +"28244","Lithuania","LT","Non-specified Petroleum Products","exio" +"28245","Lithuania","LT","Nuclear fuel","exio" +"28246","Lithuania","LT","Plastics, basic","exio" +"28247","Lithuania","LT","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"28248","Lithuania","LT","N-fertiliser","exio" +"28249","Lithuania","LT","P- and other fertiliser","exio" +"28250","Lithuania","LT","Chemicals nec","exio" +"28251","Lithuania","LT","Charcoal","exio" +"28252","Lithuania","LT","Additives/Blending Components","exio" +"28253","Lithuania","LT","Biogasoline","exio" +"28254","Lithuania","LT","Biodiesels","exio" +"28255","Lithuania","LT","Other Liquid Biofuels","exio" +"28256","Lithuania","LT","Rubber and plastic products","exio" +"28257","Lithuania","LT","Glass and glass products","exio" +"28258","Lithuania","LT","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"28259","Lithuania","LT","Ceramic goods","exio" +"28260","Lithuania","LT","Bricks, tiles and construction products, in baked clay","exio" +"28261","Lithuania","LT","Cement, lime and plaster","exio" +"28262","Lithuania","LT","Ash for treatment, Re-processing of ash into clinker","exio" +"28263","Lithuania","LT","Other non-metallic mineral products","exio" +"28264","Lithuania","LT","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"28265","Lithuania","LT","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"28266","Lithuania","LT","Precious metals","exio" +"28267","Lithuania","LT","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"28268","Lithuania","LT","Aluminium and aluminium products","exio" +"28269","Lithuania","LT","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"28270","Lithuania","LT","Lead, zinc and tin and products thereof","exio" +"28271","Lithuania","LT","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"28272","Lithuania","LT","Copper products","exio" +"28273","Lithuania","LT","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"28274","Lithuania","LT","Other non-ferrous metal products","exio" +"28275","Lithuania","LT","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"28276","Lithuania","LT","Foundry work services","exio" +"28277","Lithuania","LT","Fabricated metal products, except machinery and equipment","exio" +"28278","Lithuania","LT","Machinery and equipment n.e.c.","exio" +"28279","Lithuania","LT","Office machinery and computers","exio" +"28280","Lithuania","LT","Electrical machinery and apparatus n.e.c.","exio" +"28281","Lithuania","LT","Radio, television and communication equipment and apparatus","exio" +"28282","Lithuania","LT","Medical, precision and optical instruments, watches and clocks","exio" +"28283","Lithuania","LT","Motor vehicles, trailers and semi-trailers","exio" +"28284","Lithuania","LT","Other transport equipment","exio" +"28285","Lithuania","LT","Furniture; other manufactured goods n.e.c.","exio" +"28286","Lithuania","LT","Secondary raw materials","exio" +"28287","Lithuania","LT","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"28288","Lithuania","LT","Electricity by coal","exio" +"28289","Lithuania","LT","Electricity by gas","exio" +"28290","Lithuania","LT","Electricity by nuclear","exio" +"28291","Lithuania","LT","Electricity by hydro","exio" +"28292","Lithuania","LT","Electricity by wind","exio" +"28293","Lithuania","LT","Electricity by petroleum and other oil derivatives","exio" +"28294","Lithuania","LT","Electricity by biomass and waste","exio" +"28295","Lithuania","LT","Electricity by solar photovoltaic","exio" +"28296","Lithuania","LT","Electricity by solar thermal","exio" +"28297","Lithuania","LT","Electricity by tide, wave, ocean","exio" +"28298","Lithuania","LT","Electricity by Geothermal","exio" +"28299","Lithuania","LT","Electricity nec","exio" +"28300","Lithuania","LT","Transmission services of electricity","exio" +"28301","Lithuania","LT","Distribution and trade services of electricity","exio" +"28302","Lithuania","LT","Coke oven gas","exio" +"28303","Lithuania","LT","Blast Furnace Gas","exio" +"28304","Lithuania","LT","Oxygen Steel Furnace Gas","exio" +"28305","Lithuania","LT","Gas Works Gas","exio" +"28306","Lithuania","LT","Biogas","exio" +"28307","Lithuania","LT","Distribution services of gaseous fuels through mains","exio" +"28308","Lithuania","LT","Steam and hot water supply services","exio" +"28309","Lithuania","LT","Collected and purified water, distribution services of water","exio" +"28310","Lithuania","LT","Construction work","exio" +"28311","Lithuania","LT","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"28312","Lithuania","LT","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"28313","Lithuania","LT","Retail trade services of motor fuel","exio" +"28314","Lithuania","LT","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"28315","Lithuania","LT","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"28316","Lithuania","LT","Hotel and restaurant services","exio" +"28317","Lithuania","LT","Railway transportation services","exio" +"28318","Lithuania","LT","Other land transportation services","exio" +"28319","Lithuania","LT","Transportation services via pipelines","exio" +"28320","Lithuania","LT","Sea and coastal water transportation services","exio" +"28321","Lithuania","LT","Inland water transportation services","exio" +"28322","Lithuania","LT","Air transport services","exio" +"28323","Lithuania","LT","Supporting and auxiliary transport services; travel agency services","exio" +"28324","Lithuania","LT","Post and telecommunication services","exio" +"28325","Lithuania","LT","Financial intermediation services, except insurance and pension funding services","exio" +"28326","Lithuania","LT","Insurance and pension funding services, except compulsory social security services","exio" +"28327","Lithuania","LT","Services auxiliary to financial intermediation","exio" +"28328","Lithuania","LT","Real estate services","exio" +"28329","Lithuania","LT","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"28330","Lithuania","LT","Computer and related services","exio" +"28331","Lithuania","LT","Research and development services","exio" +"28332","Lithuania","LT","Other business services","exio" +"28333","Lithuania","LT","Public administration and defence services; compulsory social security services","exio" +"28334","Lithuania","LT","Education services","exio" +"28335","Lithuania","LT","Health and social work services","exio" +"28336","Lithuania","LT","Food waste for treatment: incineration","exio" +"28337","Lithuania","LT","Paper waste for treatment: incineration","exio" +"28338","Lithuania","LT","Plastic waste for treatment: incineration","exio" +"28339","Lithuania","LT","Intert/metal waste for treatment: incineration","exio" +"28340","Lithuania","LT","Textiles waste for treatment: incineration","exio" +"28341","Lithuania","LT","Wood waste for treatment: incineration","exio" +"28342","Lithuania","LT","Oil/hazardous waste for treatment: incineration","exio" +"28343","Lithuania","LT","Food waste for treatment: biogasification and land application","exio" +"28344","Lithuania","LT","Paper waste for treatment: biogasification and land application","exio" +"28345","Lithuania","LT","Sewage sludge for treatment: biogasification and land application","exio" +"28346","Lithuania","LT","Food waste for treatment: composting and land application","exio" +"28347","Lithuania","LT","Paper and wood waste for treatment: composting and land application","exio" +"28348","Lithuania","LT","Food waste for treatment: waste water treatment","exio" +"28349","Lithuania","LT","Other waste for treatment: waste water treatment","exio" +"28350","Lithuania","LT","Food waste for treatment: landfill","exio" +"28351","Lithuania","LT","Paper for treatment: landfill","exio" +"28352","Lithuania","LT","Plastic waste for treatment: landfill","exio" +"28353","Lithuania","LT","Inert/metal/hazardous waste for treatment: landfill","exio" +"28354","Lithuania","LT","Textiles waste for treatment: landfill","exio" +"28355","Lithuania","LT","Wood waste for treatment: landfill","exio" +"28356","Lithuania","LT","Membership organisation services n.e.c.","exio" +"28357","Lithuania","LT","Recreational, cultural and sporting services","exio" +"28358","Lithuania","LT","Other services","exio" +"28359","Lithuania","LT","Private households with employed persons","exio" +"28360","Lithuania","LT","Extra-territorial organizations and bodies","exio" +"28361","Luxembourg","LU","Paddy rice","exio" +"28362","Luxembourg","LU","Wheat","exio" +"28363","Luxembourg","LU","Cereal grains nec","exio" +"28364","Luxembourg","LU","Vegetables, fruit, nuts","exio" +"28365","Luxembourg","LU","Oil seeds","exio" +"28366","Luxembourg","LU","Sugar cane, sugar beet","exio" +"28367","Luxembourg","LU","Plant-based fibers","exio" +"28368","Luxembourg","LU","Crops nec","exio" +"28369","Luxembourg","LU","Cattle","exio" +"28370","Luxembourg","LU","Pigs","exio" +"28371","Luxembourg","LU","Poultry","exio" +"28372","Luxembourg","LU","Meat animals nec","exio" +"28373","Luxembourg","LU","Animal products nec","exio" +"28374","Luxembourg","LU","Raw milk","exio" +"28375","Luxembourg","LU","Wool, silk-worm cocoons","exio" +"28376","Luxembourg","LU","Manure (conventional treatment)","exio" +"28377","Luxembourg","LU","Manure (biogas treatment)","exio" +"28378","Luxembourg","LU","Products of forestry, logging and related services","exio" +"28379","Luxembourg","LU","Fish and other fishing products; services incidental of fishing","exio" +"28380","Luxembourg","LU","Anthracite","exio" +"28381","Luxembourg","LU","Coking Coal","exio" +"28382","Luxembourg","LU","Other Bituminous Coal","exio" +"28383","Luxembourg","LU","Sub-Bituminous Coal","exio" +"28384","Luxembourg","LU","Patent Fuel","exio" +"28385","Luxembourg","LU","Lignite/Brown Coal","exio" +"28386","Luxembourg","LU","BKB/Peat Briquettes","exio" +"28387","Luxembourg","LU","Peat","exio" +"28388","Luxembourg","LU","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"28389","Luxembourg","LU","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"28390","Luxembourg","LU","Natural Gas Liquids","exio" +"28391","Luxembourg","LU","Other Hydrocarbons","exio" +"28392","Luxembourg","LU","Uranium and thorium ores","exio" +"28393","Luxembourg","LU","Iron ores","exio" +"28394","Luxembourg","LU","Copper ores and concentrates","exio" +"28395","Luxembourg","LU","Nickel ores and concentrates","exio" +"28396","Luxembourg","LU","Aluminium ores and concentrates","exio" +"28397","Luxembourg","LU","Precious metal ores and concentrates","exio" +"28398","Luxembourg","LU","Lead, zinc and tin ores and concentrates","exio" +"28399","Luxembourg","LU","Other non-ferrous metal ores and concentrates","exio" +"28400","Luxembourg","LU","Stone","exio" +"28401","Luxembourg","LU","Sand and clay","exio" +"28402","Luxembourg","LU","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"28403","Luxembourg","LU","Products of meat cattle","exio" +"28404","Luxembourg","LU","Products of meat pigs","exio" +"28405","Luxembourg","LU","Products of meat poultry","exio" +"28406","Luxembourg","LU","Meat products nec","exio" +"28407","Luxembourg","LU","products of Vegetable oils and fats","exio" +"28408","Luxembourg","LU","Dairy products","exio" +"28409","Luxembourg","LU","Processed rice","exio" +"28410","Luxembourg","LU","Sugar","exio" +"28411","Luxembourg","LU","Food products nec","exio" +"28412","Luxembourg","LU","Beverages","exio" +"28413","Luxembourg","LU","Fish products","exio" +"28414","Luxembourg","LU","Tobacco products","exio" +"28415","Luxembourg","LU","Textiles","exio" +"28416","Luxembourg","LU","Wearing apparel; furs","exio" +"28417","Luxembourg","LU","Leather and leather products","exio" +"28418","Luxembourg","LU","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"28419","Luxembourg","LU","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"28420","Luxembourg","LU","Pulp","exio" +"28421","Luxembourg","LU","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"28422","Luxembourg","LU","Paper and paper products","exio" +"28423","Luxembourg","LU","Printed matter and recorded media","exio" +"28424","Luxembourg","LU","Coke Oven Coke","exio" +"28425","Luxembourg","LU","Gas Coke","exio" +"28426","Luxembourg","LU","Coal Tar","exio" +"28427","Luxembourg","LU","Motor Gasoline","exio" +"28428","Luxembourg","LU","Aviation Gasoline","exio" +"28429","Luxembourg","LU","Gasoline Type Jet Fuel","exio" +"28430","Luxembourg","LU","Kerosene Type Jet Fuel","exio" +"28431","Luxembourg","LU","Kerosene","exio" +"28432","Luxembourg","LU","Gas/Diesel Oil","exio" +"28433","Luxembourg","LU","Heavy Fuel Oil","exio" +"28434","Luxembourg","LU","Refinery Gas","exio" +"28435","Luxembourg","LU","Liquefied Petroleum Gases (LPG)","exio" +"28436","Luxembourg","LU","Refinery Feedstocks","exio" +"28437","Luxembourg","LU","Ethane","exio" +"28438","Luxembourg","LU","Naphtha","exio" +"28439","Luxembourg","LU","White Spirit & SBP","exio" +"28440","Luxembourg","LU","Lubricants","exio" +"28441","Luxembourg","LU","Bitumen","exio" +"28442","Luxembourg","LU","Paraffin Waxes","exio" +"28443","Luxembourg","LU","Petroleum Coke","exio" +"28444","Luxembourg","LU","Non-specified Petroleum Products","exio" +"28445","Luxembourg","LU","Nuclear fuel","exio" +"28446","Luxembourg","LU","Plastics, basic","exio" +"28447","Luxembourg","LU","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"28448","Luxembourg","LU","N-fertiliser","exio" +"28449","Luxembourg","LU","P- and other fertiliser","exio" +"28450","Luxembourg","LU","Chemicals nec","exio" +"28451","Luxembourg","LU","Charcoal","exio" +"28452","Luxembourg","LU","Additives/Blending Components","exio" +"28453","Luxembourg","LU","Biogasoline","exio" +"28454","Luxembourg","LU","Biodiesels","exio" +"28455","Luxembourg","LU","Other Liquid Biofuels","exio" +"28456","Luxembourg","LU","Rubber and plastic products","exio" +"28457","Luxembourg","LU","Glass and glass products","exio" +"28458","Luxembourg","LU","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"28459","Luxembourg","LU","Ceramic goods","exio" +"28460","Luxembourg","LU","Bricks, tiles and construction products, in baked clay","exio" +"28461","Luxembourg","LU","Cement, lime and plaster","exio" +"28462","Luxembourg","LU","Ash for treatment, Re-processing of ash into clinker","exio" +"28463","Luxembourg","LU","Other non-metallic mineral products","exio" +"28464","Luxembourg","LU","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"28465","Luxembourg","LU","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"28466","Luxembourg","LU","Precious metals","exio" +"28467","Luxembourg","LU","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"28468","Luxembourg","LU","Aluminium and aluminium products","exio" +"28469","Luxembourg","LU","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"28470","Luxembourg","LU","Lead, zinc and tin and products thereof","exio" +"28471","Luxembourg","LU","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"28472","Luxembourg","LU","Copper products","exio" +"28473","Luxembourg","LU","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"28474","Luxembourg","LU","Other non-ferrous metal products","exio" +"28475","Luxembourg","LU","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"28476","Luxembourg","LU","Foundry work services","exio" +"28477","Luxembourg","LU","Fabricated metal products, except machinery and equipment","exio" +"28478","Luxembourg","LU","Machinery and equipment n.e.c.","exio" +"28479","Luxembourg","LU","Office machinery and computers","exio" +"28480","Luxembourg","LU","Electrical machinery and apparatus n.e.c.","exio" +"28481","Luxembourg","LU","Radio, television and communication equipment and apparatus","exio" +"28482","Luxembourg","LU","Medical, precision and optical instruments, watches and clocks","exio" +"28483","Luxembourg","LU","Motor vehicles, trailers and semi-trailers","exio" +"28484","Luxembourg","LU","Other transport equipment","exio" +"28485","Luxembourg","LU","Furniture; other manufactured goods n.e.c.","exio" +"28486","Luxembourg","LU","Secondary raw materials","exio" +"28487","Luxembourg","LU","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"28488","Luxembourg","LU","Electricity by coal","exio" +"28489","Luxembourg","LU","Electricity by gas","exio" +"28490","Luxembourg","LU","Electricity by nuclear","exio" +"28491","Luxembourg","LU","Electricity by hydro","exio" +"28492","Luxembourg","LU","Electricity by wind","exio" +"28493","Luxembourg","LU","Electricity by petroleum and other oil derivatives","exio" +"28494","Luxembourg","LU","Electricity by biomass and waste","exio" +"28495","Luxembourg","LU","Electricity by solar photovoltaic","exio" +"28496","Luxembourg","LU","Electricity by solar thermal","exio" +"28497","Luxembourg","LU","Electricity by tide, wave, ocean","exio" +"28498","Luxembourg","LU","Electricity by Geothermal","exio" +"28499","Luxembourg","LU","Electricity nec","exio" +"28500","Luxembourg","LU","Transmission services of electricity","exio" +"28501","Luxembourg","LU","Distribution and trade services of electricity","exio" +"28502","Luxembourg","LU","Coke oven gas","exio" +"28503","Luxembourg","LU","Blast Furnace Gas","exio" +"28504","Luxembourg","LU","Oxygen Steel Furnace Gas","exio" +"28505","Luxembourg","LU","Gas Works Gas","exio" +"28506","Luxembourg","LU","Biogas","exio" +"28507","Luxembourg","LU","Distribution services of gaseous fuels through mains","exio" +"28508","Luxembourg","LU","Steam and hot water supply services","exio" +"28509","Luxembourg","LU","Collected and purified water, distribution services of water","exio" +"28510","Luxembourg","LU","Construction work","exio" +"28511","Luxembourg","LU","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"28512","Luxembourg","LU","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"28513","Luxembourg","LU","Retail trade services of motor fuel","exio" +"28514","Luxembourg","LU","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"28515","Luxembourg","LU","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"28516","Luxembourg","LU","Hotel and restaurant services","exio" +"28517","Luxembourg","LU","Railway transportation services","exio" +"28518","Luxembourg","LU","Other land transportation services","exio" +"28519","Luxembourg","LU","Transportation services via pipelines","exio" +"28520","Luxembourg","LU","Sea and coastal water transportation services","exio" +"28521","Luxembourg","LU","Inland water transportation services","exio" +"28522","Luxembourg","LU","Air transport services","exio" +"28523","Luxembourg","LU","Supporting and auxiliary transport services; travel agency services","exio" +"28524","Luxembourg","LU","Post and telecommunication services","exio" +"28525","Luxembourg","LU","Financial intermediation services, except insurance and pension funding services","exio" +"28526","Luxembourg","LU","Insurance and pension funding services, except compulsory social security services","exio" +"28527","Luxembourg","LU","Services auxiliary to financial intermediation","exio" +"28528","Luxembourg","LU","Real estate services","exio" +"28529","Luxembourg","LU","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"28530","Luxembourg","LU","Computer and related services","exio" +"28531","Luxembourg","LU","Research and development services","exio" +"28532","Luxembourg","LU","Other business services","exio" +"28533","Luxembourg","LU","Public administration and defence services; compulsory social security services","exio" +"28534","Luxembourg","LU","Education services","exio" +"28535","Luxembourg","LU","Health and social work services","exio" +"28536","Luxembourg","LU","Food waste for treatment: incineration","exio" +"28537","Luxembourg","LU","Paper waste for treatment: incineration","exio" +"28538","Luxembourg","LU","Plastic waste for treatment: incineration","exio" +"28539","Luxembourg","LU","Intert/metal waste for treatment: incineration","exio" +"28540","Luxembourg","LU","Textiles waste for treatment: incineration","exio" +"28541","Luxembourg","LU","Wood waste for treatment: incineration","exio" +"28542","Luxembourg","LU","Oil/hazardous waste for treatment: incineration","exio" +"28543","Luxembourg","LU","Food waste for treatment: biogasification and land application","exio" +"28544","Luxembourg","LU","Paper waste for treatment: biogasification and land application","exio" +"28545","Luxembourg","LU","Sewage sludge for treatment: biogasification and land application","exio" +"28546","Luxembourg","LU","Food waste for treatment: composting and land application","exio" +"28547","Luxembourg","LU","Paper and wood waste for treatment: composting and land application","exio" +"28548","Luxembourg","LU","Food waste for treatment: waste water treatment","exio" +"28549","Luxembourg","LU","Other waste for treatment: waste water treatment","exio" +"28550","Luxembourg","LU","Food waste for treatment: landfill","exio" +"28551","Luxembourg","LU","Paper for treatment: landfill","exio" +"28552","Luxembourg","LU","Plastic waste for treatment: landfill","exio" +"28553","Luxembourg","LU","Inert/metal/hazardous waste for treatment: landfill","exio" +"28554","Luxembourg","LU","Textiles waste for treatment: landfill","exio" +"28555","Luxembourg","LU","Wood waste for treatment: landfill","exio" +"28556","Luxembourg","LU","Membership organisation services n.e.c.","exio" +"28557","Luxembourg","LU","Recreational, cultural and sporting services","exio" +"28558","Luxembourg","LU","Other services","exio" +"28559","Luxembourg","LU","Private households with employed persons","exio" +"28560","Luxembourg","LU","Extra-territorial organizations and bodies","exio" +"28561","Latvia","LV","Paddy rice","exio" +"28562","Latvia","LV","Wheat","exio" +"28563","Latvia","LV","Cereal grains nec","exio" +"28564","Latvia","LV","Vegetables, fruit, nuts","exio" +"28565","Latvia","LV","Oil seeds","exio" +"28566","Latvia","LV","Sugar cane, sugar beet","exio" +"28567","Latvia","LV","Plant-based fibers","exio" +"28568","Latvia","LV","Crops nec","exio" +"28569","Latvia","LV","Cattle","exio" +"28570","Latvia","LV","Pigs","exio" +"28571","Latvia","LV","Poultry","exio" +"28572","Latvia","LV","Meat animals nec","exio" +"28573","Latvia","LV","Animal products nec","exio" +"28574","Latvia","LV","Raw milk","exio" +"28575","Latvia","LV","Wool, silk-worm cocoons","exio" +"28576","Latvia","LV","Manure (conventional treatment)","exio" +"28577","Latvia","LV","Manure (biogas treatment)","exio" +"28578","Latvia","LV","Products of forestry, logging and related services","exio" +"28579","Latvia","LV","Fish and other fishing products; services incidental of fishing","exio" +"28580","Latvia","LV","Anthracite","exio" +"28581","Latvia","LV","Coking Coal","exio" +"28582","Latvia","LV","Other Bituminous Coal","exio" +"28583","Latvia","LV","Sub-Bituminous Coal","exio" +"28584","Latvia","LV","Patent Fuel","exio" +"28585","Latvia","LV","Lignite/Brown Coal","exio" +"28586","Latvia","LV","BKB/Peat Briquettes","exio" +"28587","Latvia","LV","Peat","exio" +"28588","Latvia","LV","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"28589","Latvia","LV","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"28590","Latvia","LV","Natural Gas Liquids","exio" +"28591","Latvia","LV","Other Hydrocarbons","exio" +"28592","Latvia","LV","Uranium and thorium ores","exio" +"28593","Latvia","LV","Iron ores","exio" +"28594","Latvia","LV","Copper ores and concentrates","exio" +"28595","Latvia","LV","Nickel ores and concentrates","exio" +"28596","Latvia","LV","Aluminium ores and concentrates","exio" +"28597","Latvia","LV","Precious metal ores and concentrates","exio" +"28598","Latvia","LV","Lead, zinc and tin ores and concentrates","exio" +"28599","Latvia","LV","Other non-ferrous metal ores and concentrates","exio" +"28600","Latvia","LV","Stone","exio" +"28601","Latvia","LV","Sand and clay","exio" +"28602","Latvia","LV","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"28603","Latvia","LV","Products of meat cattle","exio" +"28604","Latvia","LV","Products of meat pigs","exio" +"28605","Latvia","LV","Products of meat poultry","exio" +"28606","Latvia","LV","Meat products nec","exio" +"28607","Latvia","LV","products of Vegetable oils and fats","exio" +"28608","Latvia","LV","Dairy products","exio" +"28609","Latvia","LV","Processed rice","exio" +"28610","Latvia","LV","Sugar","exio" +"28611","Latvia","LV","Food products nec","exio" +"28612","Latvia","LV","Beverages","exio" +"28613","Latvia","LV","Fish products","exio" +"28614","Latvia","LV","Tobacco products","exio" +"28615","Latvia","LV","Textiles","exio" +"28616","Latvia","LV","Wearing apparel; furs","exio" +"28617","Latvia","LV","Leather and leather products","exio" +"28618","Latvia","LV","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"28619","Latvia","LV","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"28620","Latvia","LV","Pulp","exio" +"28621","Latvia","LV","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"28622","Latvia","LV","Paper and paper products","exio" +"28623","Latvia","LV","Printed matter and recorded media","exio" +"28624","Latvia","LV","Coke Oven Coke","exio" +"28625","Latvia","LV","Gas Coke","exio" +"28626","Latvia","LV","Coal Tar","exio" +"28627","Latvia","LV","Motor Gasoline","exio" +"28628","Latvia","LV","Aviation Gasoline","exio" +"28629","Latvia","LV","Gasoline Type Jet Fuel","exio" +"28630","Latvia","LV","Kerosene Type Jet Fuel","exio" +"28631","Latvia","LV","Kerosene","exio" +"28632","Latvia","LV","Gas/Diesel Oil","exio" +"28633","Latvia","LV","Heavy Fuel Oil","exio" +"28634","Latvia","LV","Refinery Gas","exio" +"28635","Latvia","LV","Liquefied Petroleum Gases (LPG)","exio" +"28636","Latvia","LV","Refinery Feedstocks","exio" +"28637","Latvia","LV","Ethane","exio" +"28638","Latvia","LV","Naphtha","exio" +"28639","Latvia","LV","White Spirit & SBP","exio" +"28640","Latvia","LV","Lubricants","exio" +"28641","Latvia","LV","Bitumen","exio" +"28642","Latvia","LV","Paraffin Waxes","exio" +"28643","Latvia","LV","Petroleum Coke","exio" +"28644","Latvia","LV","Non-specified Petroleum Products","exio" +"28645","Latvia","LV","Nuclear fuel","exio" +"28646","Latvia","LV","Plastics, basic","exio" +"28647","Latvia","LV","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"28648","Latvia","LV","N-fertiliser","exio" +"28649","Latvia","LV","P- and other fertiliser","exio" +"28650","Latvia","LV","Chemicals nec","exio" +"28651","Latvia","LV","Charcoal","exio" +"28652","Latvia","LV","Additives/Blending Components","exio" +"28653","Latvia","LV","Biogasoline","exio" +"28654","Latvia","LV","Biodiesels","exio" +"28655","Latvia","LV","Other Liquid Biofuels","exio" +"28656","Latvia","LV","Rubber and plastic products","exio" +"28657","Latvia","LV","Glass and glass products","exio" +"28658","Latvia","LV","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"28659","Latvia","LV","Ceramic goods","exio" +"28660","Latvia","LV","Bricks, tiles and construction products, in baked clay","exio" +"28661","Latvia","LV","Cement, lime and plaster","exio" +"28662","Latvia","LV","Ash for treatment, Re-processing of ash into clinker","exio" +"28663","Latvia","LV","Other non-metallic mineral products","exio" +"28664","Latvia","LV","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"28665","Latvia","LV","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"28666","Latvia","LV","Precious metals","exio" +"28667","Latvia","LV","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"28668","Latvia","LV","Aluminium and aluminium products","exio" +"28669","Latvia","LV","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"28670","Latvia","LV","Lead, zinc and tin and products thereof","exio" +"28671","Latvia","LV","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"28672","Latvia","LV","Copper products","exio" +"28673","Latvia","LV","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"28674","Latvia","LV","Other non-ferrous metal products","exio" +"28675","Latvia","LV","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"28676","Latvia","LV","Foundry work services","exio" +"28677","Latvia","LV","Fabricated metal products, except machinery and equipment","exio" +"28678","Latvia","LV","Machinery and equipment n.e.c.","exio" +"28679","Latvia","LV","Office machinery and computers","exio" +"28680","Latvia","LV","Electrical machinery and apparatus n.e.c.","exio" +"28681","Latvia","LV","Radio, television and communication equipment and apparatus","exio" +"28682","Latvia","LV","Medical, precision and optical instruments, watches and clocks","exio" +"28683","Latvia","LV","Motor vehicles, trailers and semi-trailers","exio" +"28684","Latvia","LV","Other transport equipment","exio" +"28685","Latvia","LV","Furniture; other manufactured goods n.e.c.","exio" +"28686","Latvia","LV","Secondary raw materials","exio" +"28687","Latvia","LV","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"28688","Latvia","LV","Electricity by coal","exio" +"28689","Latvia","LV","Electricity by gas","exio" +"28690","Latvia","LV","Electricity by nuclear","exio" +"28691","Latvia","LV","Electricity by hydro","exio" +"28692","Latvia","LV","Electricity by wind","exio" +"28693","Latvia","LV","Electricity by petroleum and other oil derivatives","exio" +"28694","Latvia","LV","Electricity by biomass and waste","exio" +"28695","Latvia","LV","Electricity by solar photovoltaic","exio" +"28696","Latvia","LV","Electricity by solar thermal","exio" +"28697","Latvia","LV","Electricity by tide, wave, ocean","exio" +"28698","Latvia","LV","Electricity by Geothermal","exio" +"28699","Latvia","LV","Electricity nec","exio" +"28700","Latvia","LV","Transmission services of electricity","exio" +"28701","Latvia","LV","Distribution and trade services of electricity","exio" +"28702","Latvia","LV","Coke oven gas","exio" +"28703","Latvia","LV","Blast Furnace Gas","exio" +"28704","Latvia","LV","Oxygen Steel Furnace Gas","exio" +"28705","Latvia","LV","Gas Works Gas","exio" +"28706","Latvia","LV","Biogas","exio" +"28707","Latvia","LV","Distribution services of gaseous fuels through mains","exio" +"28708","Latvia","LV","Steam and hot water supply services","exio" +"28709","Latvia","LV","Collected and purified water, distribution services of water","exio" +"28710","Latvia","LV","Construction work","exio" +"28711","Latvia","LV","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"28712","Latvia","LV","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"28713","Latvia","LV","Retail trade services of motor fuel","exio" +"28714","Latvia","LV","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"28715","Latvia","LV","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"28716","Latvia","LV","Hotel and restaurant services","exio" +"28717","Latvia","LV","Railway transportation services","exio" +"28718","Latvia","LV","Other land transportation services","exio" +"28719","Latvia","LV","Transportation services via pipelines","exio" +"28720","Latvia","LV","Sea and coastal water transportation services","exio" +"28721","Latvia","LV","Inland water transportation services","exio" +"28722","Latvia","LV","Air transport services","exio" +"28723","Latvia","LV","Supporting and auxiliary transport services; travel agency services","exio" +"28724","Latvia","LV","Post and telecommunication services","exio" +"28725","Latvia","LV","Financial intermediation services, except insurance and pension funding services","exio" +"28726","Latvia","LV","Insurance and pension funding services, except compulsory social security services","exio" +"28727","Latvia","LV","Services auxiliary to financial intermediation","exio" +"28728","Latvia","LV","Real estate services","exio" +"28729","Latvia","LV","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"28730","Latvia","LV","Computer and related services","exio" +"28731","Latvia","LV","Research and development services","exio" +"28732","Latvia","LV","Other business services","exio" +"28733","Latvia","LV","Public administration and defence services; compulsory social security services","exio" +"28734","Latvia","LV","Education services","exio" +"28735","Latvia","LV","Health and social work services","exio" +"28736","Latvia","LV","Food waste for treatment: incineration","exio" +"28737","Latvia","LV","Paper waste for treatment: incineration","exio" +"28738","Latvia","LV","Plastic waste for treatment: incineration","exio" +"28739","Latvia","LV","Intert/metal waste for treatment: incineration","exio" +"28740","Latvia","LV","Textiles waste for treatment: incineration","exio" +"28741","Latvia","LV","Wood waste for treatment: incineration","exio" +"28742","Latvia","LV","Oil/hazardous waste for treatment: incineration","exio" +"28743","Latvia","LV","Food waste for treatment: biogasification and land application","exio" +"28744","Latvia","LV","Paper waste for treatment: biogasification and land application","exio" +"28745","Latvia","LV","Sewage sludge for treatment: biogasification and land application","exio" +"28746","Latvia","LV","Food waste for treatment: composting and land application","exio" +"28747","Latvia","LV","Paper and wood waste for treatment: composting and land application","exio" +"28748","Latvia","LV","Food waste for treatment: waste water treatment","exio" +"28749","Latvia","LV","Other waste for treatment: waste water treatment","exio" +"28750","Latvia","LV","Food waste for treatment: landfill","exio" +"28751","Latvia","LV","Paper for treatment: landfill","exio" +"28752","Latvia","LV","Plastic waste for treatment: landfill","exio" +"28753","Latvia","LV","Inert/metal/hazardous waste for treatment: landfill","exio" +"28754","Latvia","LV","Textiles waste for treatment: landfill","exio" +"28755","Latvia","LV","Wood waste for treatment: landfill","exio" +"28756","Latvia","LV","Membership organisation services n.e.c.","exio" +"28757","Latvia","LV","Recreational, cultural and sporting services","exio" +"28758","Latvia","LV","Other services","exio" +"28759","Latvia","LV","Private households with employed persons","exio" +"28760","Latvia","LV","Extra-territorial organizations and bodies","exio" +"28761","Malta","MT","Paddy rice","exio" +"28762","Malta","MT","Wheat","exio" +"28763","Malta","MT","Cereal grains nec","exio" +"28764","Malta","MT","Vegetables, fruit, nuts","exio" +"28765","Malta","MT","Oil seeds","exio" +"28766","Malta","MT","Sugar cane, sugar beet","exio" +"28767","Malta","MT","Plant-based fibers","exio" +"28768","Malta","MT","Crops nec","exio" +"28769","Malta","MT","Cattle","exio" +"28770","Malta","MT","Pigs","exio" +"28771","Malta","MT","Poultry","exio" +"28772","Malta","MT","Meat animals nec","exio" +"28773","Malta","MT","Animal products nec","exio" +"28774","Malta","MT","Raw milk","exio" +"28775","Malta","MT","Wool, silk-worm cocoons","exio" +"28776","Malta","MT","Manure (conventional treatment)","exio" +"28777","Malta","MT","Manure (biogas treatment)","exio" +"28778","Malta","MT","Products of forestry, logging and related services","exio" +"28779","Malta","MT","Fish and other fishing products; services incidental of fishing","exio" +"28780","Malta","MT","Anthracite","exio" +"28781","Malta","MT","Coking Coal","exio" +"28782","Malta","MT","Other Bituminous Coal","exio" +"28783","Malta","MT","Sub-Bituminous Coal","exio" +"28784","Malta","MT","Patent Fuel","exio" +"28785","Malta","MT","Lignite/Brown Coal","exio" +"28786","Malta","MT","BKB/Peat Briquettes","exio" +"28787","Malta","MT","Peat","exio" +"28788","Malta","MT","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"28789","Malta","MT","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"28790","Malta","MT","Natural Gas Liquids","exio" +"28791","Malta","MT","Other Hydrocarbons","exio" +"28792","Malta","MT","Uranium and thorium ores","exio" +"28793","Malta","MT","Iron ores","exio" +"28794","Malta","MT","Copper ores and concentrates","exio" +"28795","Malta","MT","Nickel ores and concentrates","exio" +"28796","Malta","MT","Aluminium ores and concentrates","exio" +"28797","Malta","MT","Precious metal ores and concentrates","exio" +"28798","Malta","MT","Lead, zinc and tin ores and concentrates","exio" +"28799","Malta","MT","Other non-ferrous metal ores and concentrates","exio" +"28800","Malta","MT","Stone","exio" +"28801","Malta","MT","Sand and clay","exio" +"28802","Malta","MT","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"28803","Malta","MT","Products of meat cattle","exio" +"28804","Malta","MT","Products of meat pigs","exio" +"28805","Malta","MT","Products of meat poultry","exio" +"28806","Malta","MT","Meat products nec","exio" +"28807","Malta","MT","products of Vegetable oils and fats","exio" +"28808","Malta","MT","Dairy products","exio" +"28809","Malta","MT","Processed rice","exio" +"28810","Malta","MT","Sugar","exio" +"28811","Malta","MT","Food products nec","exio" +"28812","Malta","MT","Beverages","exio" +"28813","Malta","MT","Fish products","exio" +"28814","Malta","MT","Tobacco products","exio" +"28815","Malta","MT","Textiles","exio" +"28816","Malta","MT","Wearing apparel; furs","exio" +"28817","Malta","MT","Leather and leather products","exio" +"28818","Malta","MT","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"28819","Malta","MT","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"28820","Malta","MT","Pulp","exio" +"28821","Malta","MT","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"28822","Malta","MT","Paper and paper products","exio" +"28823","Malta","MT","Printed matter and recorded media","exio" +"28824","Malta","MT","Coke Oven Coke","exio" +"28825","Malta","MT","Gas Coke","exio" +"28826","Malta","MT","Coal Tar","exio" +"28827","Malta","MT","Motor Gasoline","exio" +"28828","Malta","MT","Aviation Gasoline","exio" +"28829","Malta","MT","Gasoline Type Jet Fuel","exio" +"28830","Malta","MT","Kerosene Type Jet Fuel","exio" +"28831","Malta","MT","Kerosene","exio" +"28832","Malta","MT","Gas/Diesel Oil","exio" +"28833","Malta","MT","Heavy Fuel Oil","exio" +"28834","Malta","MT","Refinery Gas","exio" +"28835","Malta","MT","Liquefied Petroleum Gases (LPG)","exio" +"28836","Malta","MT","Refinery Feedstocks","exio" +"28837","Malta","MT","Ethane","exio" +"28838","Malta","MT","Naphtha","exio" +"28839","Malta","MT","White Spirit & SBP","exio" +"28840","Malta","MT","Lubricants","exio" +"28841","Malta","MT","Bitumen","exio" +"28842","Malta","MT","Paraffin Waxes","exio" +"28843","Malta","MT","Petroleum Coke","exio" +"28844","Malta","MT","Non-specified Petroleum Products","exio" +"28845","Malta","MT","Nuclear fuel","exio" +"28846","Malta","MT","Plastics, basic","exio" +"28847","Malta","MT","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"28848","Malta","MT","N-fertiliser","exio" +"28849","Malta","MT","P- and other fertiliser","exio" +"28850","Malta","MT","Chemicals nec","exio" +"28851","Malta","MT","Charcoal","exio" +"28852","Malta","MT","Additives/Blending Components","exio" +"28853","Malta","MT","Biogasoline","exio" +"28854","Malta","MT","Biodiesels","exio" +"28855","Malta","MT","Other Liquid Biofuels","exio" +"28856","Malta","MT","Rubber and plastic products","exio" +"28857","Malta","MT","Glass and glass products","exio" +"28858","Malta","MT","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"28859","Malta","MT","Ceramic goods","exio" +"28860","Malta","MT","Bricks, tiles and construction products, in baked clay","exio" +"28861","Malta","MT","Cement, lime and plaster","exio" +"28862","Malta","MT","Ash for treatment, Re-processing of ash into clinker","exio" +"28863","Malta","MT","Other non-metallic mineral products","exio" +"28864","Malta","MT","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"28865","Malta","MT","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"28866","Malta","MT","Precious metals","exio" +"28867","Malta","MT","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"28868","Malta","MT","Aluminium and aluminium products","exio" +"28869","Malta","MT","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"28870","Malta","MT","Lead, zinc and tin and products thereof","exio" +"28871","Malta","MT","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"28872","Malta","MT","Copper products","exio" +"28873","Malta","MT","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"28874","Malta","MT","Other non-ferrous metal products","exio" +"28875","Malta","MT","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"28876","Malta","MT","Foundry work services","exio" +"28877","Malta","MT","Fabricated metal products, except machinery and equipment","exio" +"28878","Malta","MT","Machinery and equipment n.e.c.","exio" +"28879","Malta","MT","Office machinery and computers","exio" +"28880","Malta","MT","Electrical machinery and apparatus n.e.c.","exio" +"28881","Malta","MT","Radio, television and communication equipment and apparatus","exio" +"28882","Malta","MT","Medical, precision and optical instruments, watches and clocks","exio" +"28883","Malta","MT","Motor vehicles, trailers and semi-trailers","exio" +"28884","Malta","MT","Other transport equipment","exio" +"28885","Malta","MT","Furniture; other manufactured goods n.e.c.","exio" +"28886","Malta","MT","Secondary raw materials","exio" +"28887","Malta","MT","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"28888","Malta","MT","Electricity by coal","exio" +"28889","Malta","MT","Electricity by gas","exio" +"28890","Malta","MT","Electricity by nuclear","exio" +"28891","Malta","MT","Electricity by hydro","exio" +"28892","Malta","MT","Electricity by wind","exio" +"28893","Malta","MT","Electricity by petroleum and other oil derivatives","exio" +"28894","Malta","MT","Electricity by biomass and waste","exio" +"28895","Malta","MT","Electricity by solar photovoltaic","exio" +"28896","Malta","MT","Electricity by solar thermal","exio" +"28897","Malta","MT","Electricity by tide, wave, ocean","exio" +"28898","Malta","MT","Electricity by Geothermal","exio" +"28899","Malta","MT","Electricity nec","exio" +"28900","Malta","MT","Transmission services of electricity","exio" +"28901","Malta","MT","Distribution and trade services of electricity","exio" +"28902","Malta","MT","Coke oven gas","exio" +"28903","Malta","MT","Blast Furnace Gas","exio" +"28904","Malta","MT","Oxygen Steel Furnace Gas","exio" +"28905","Malta","MT","Gas Works Gas","exio" +"28906","Malta","MT","Biogas","exio" +"28907","Malta","MT","Distribution services of gaseous fuels through mains","exio" +"28908","Malta","MT","Steam and hot water supply services","exio" +"28909","Malta","MT","Collected and purified water, distribution services of water","exio" +"28910","Malta","MT","Construction work","exio" +"28911","Malta","MT","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"28912","Malta","MT","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"28913","Malta","MT","Retail trade services of motor fuel","exio" +"28914","Malta","MT","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"28915","Malta","MT","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"28916","Malta","MT","Hotel and restaurant services","exio" +"28917","Malta","MT","Railway transportation services","exio" +"28918","Malta","MT","Other land transportation services","exio" +"28919","Malta","MT","Transportation services via pipelines","exio" +"28920","Malta","MT","Sea and coastal water transportation services","exio" +"28921","Malta","MT","Inland water transportation services","exio" +"28922","Malta","MT","Air transport services","exio" +"28923","Malta","MT","Supporting and auxiliary transport services; travel agency services","exio" +"28924","Malta","MT","Post and telecommunication services","exio" +"28925","Malta","MT","Financial intermediation services, except insurance and pension funding services","exio" +"28926","Malta","MT","Insurance and pension funding services, except compulsory social security services","exio" +"28927","Malta","MT","Services auxiliary to financial intermediation","exio" +"28928","Malta","MT","Real estate services","exio" +"28929","Malta","MT","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"28930","Malta","MT","Computer and related services","exio" +"28931","Malta","MT","Research and development services","exio" +"28932","Malta","MT","Other business services","exio" +"28933","Malta","MT","Public administration and defence services; compulsory social security services","exio" +"28934","Malta","MT","Education services","exio" +"28935","Malta","MT","Health and social work services","exio" +"28936","Malta","MT","Food waste for treatment: incineration","exio" +"28937","Malta","MT","Paper waste for treatment: incineration","exio" +"28938","Malta","MT","Plastic waste for treatment: incineration","exio" +"28939","Malta","MT","Intert/metal waste for treatment: incineration","exio" +"28940","Malta","MT","Textiles waste for treatment: incineration","exio" +"28941","Malta","MT","Wood waste for treatment: incineration","exio" +"28942","Malta","MT","Oil/hazardous waste for treatment: incineration","exio" +"28943","Malta","MT","Food waste for treatment: biogasification and land application","exio" +"28944","Malta","MT","Paper waste for treatment: biogasification and land application","exio" +"28945","Malta","MT","Sewage sludge for treatment: biogasification and land application","exio" +"28946","Malta","MT","Food waste for treatment: composting and land application","exio" +"28947","Malta","MT","Paper and wood waste for treatment: composting and land application","exio" +"28948","Malta","MT","Food waste for treatment: waste water treatment","exio" +"28949","Malta","MT","Other waste for treatment: waste water treatment","exio" +"28950","Malta","MT","Food waste for treatment: landfill","exio" +"28951","Malta","MT","Paper for treatment: landfill","exio" +"28952","Malta","MT","Plastic waste for treatment: landfill","exio" +"28953","Malta","MT","Inert/metal/hazardous waste for treatment: landfill","exio" +"28954","Malta","MT","Textiles waste for treatment: landfill","exio" +"28955","Malta","MT","Wood waste for treatment: landfill","exio" +"28956","Malta","MT","Membership organisation services n.e.c.","exio" +"28957","Malta","MT","Recreational, cultural and sporting services","exio" +"28958","Malta","MT","Other services","exio" +"28959","Malta","MT","Private households with employed persons","exio" +"28960","Malta","MT","Extra-territorial organizations and bodies","exio" +"28961","Netherlands","NL","Paddy rice","exio" +"28962","Netherlands","NL","Wheat","exio" +"28963","Netherlands","NL","Cereal grains nec","exio" +"28964","Netherlands","NL","Vegetables, fruit, nuts","exio" +"28965","Netherlands","NL","Oil seeds","exio" +"28966","Netherlands","NL","Sugar cane, sugar beet","exio" +"28967","Netherlands","NL","Plant-based fibers","exio" +"28968","Netherlands","NL","Crops nec","exio" +"28969","Netherlands","NL","Cattle","exio" +"28970","Netherlands","NL","Pigs","exio" +"28971","Netherlands","NL","Poultry","exio" +"28972","Netherlands","NL","Meat animals nec","exio" +"28973","Netherlands","NL","Animal products nec","exio" +"28974","Netherlands","NL","Raw milk","exio" +"28975","Netherlands","NL","Wool, silk-worm cocoons","exio" +"28976","Netherlands","NL","Manure (conventional treatment)","exio" +"28977","Netherlands","NL","Manure (biogas treatment)","exio" +"28978","Netherlands","NL","Products of forestry, logging and related services","exio" +"28979","Netherlands","NL","Fish and other fishing products; services incidental of fishing","exio" +"28980","Netherlands","NL","Anthracite","exio" +"28981","Netherlands","NL","Coking Coal","exio" +"28982","Netherlands","NL","Other Bituminous Coal","exio" +"28983","Netherlands","NL","Sub-Bituminous Coal","exio" +"28984","Netherlands","NL","Patent Fuel","exio" +"28985","Netherlands","NL","Lignite/Brown Coal","exio" +"28986","Netherlands","NL","BKB/Peat Briquettes","exio" +"28987","Netherlands","NL","Peat","exio" +"28988","Netherlands","NL","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"28989","Netherlands","NL","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"28990","Netherlands","NL","Natural Gas Liquids","exio" +"28991","Netherlands","NL","Other Hydrocarbons","exio" +"28992","Netherlands","NL","Uranium and thorium ores","exio" +"28993","Netherlands","NL","Iron ores","exio" +"28994","Netherlands","NL","Copper ores and concentrates","exio" +"28995","Netherlands","NL","Nickel ores and concentrates","exio" +"28996","Netherlands","NL","Aluminium ores and concentrates","exio" +"28997","Netherlands","NL","Precious metal ores and concentrates","exio" +"28998","Netherlands","NL","Lead, zinc and tin ores and concentrates","exio" +"28999","Netherlands","NL","Other non-ferrous metal ores and concentrates","exio" +"29000","Netherlands","NL","Stone","exio" +"29001","Netherlands","NL","Sand and clay","exio" +"29002","Netherlands","NL","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"29003","Netherlands","NL","Products of meat cattle","exio" +"29004","Netherlands","NL","Products of meat pigs","exio" +"29005","Netherlands","NL","Products of meat poultry","exio" +"29006","Netherlands","NL","Meat products nec","exio" +"29007","Netherlands","NL","products of Vegetable oils and fats","exio" +"29008","Netherlands","NL","Dairy products","exio" +"29009","Netherlands","NL","Processed rice","exio" +"29010","Netherlands","NL","Sugar","exio" +"29011","Netherlands","NL","Food products nec","exio" +"29012","Netherlands","NL","Beverages","exio" +"29013","Netherlands","NL","Fish products","exio" +"29014","Netherlands","NL","Tobacco products","exio" +"29015","Netherlands","NL","Textiles","exio" +"29016","Netherlands","NL","Wearing apparel; furs","exio" +"29017","Netherlands","NL","Leather and leather products","exio" +"29018","Netherlands","NL","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"29019","Netherlands","NL","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"29020","Netherlands","NL","Pulp","exio" +"29021","Netherlands","NL","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"29022","Netherlands","NL","Paper and paper products","exio" +"29023","Netherlands","NL","Printed matter and recorded media","exio" +"29024","Netherlands","NL","Coke Oven Coke","exio" +"29025","Netherlands","NL","Gas Coke","exio" +"29026","Netherlands","NL","Coal Tar","exio" +"29027","Netherlands","NL","Motor Gasoline","exio" +"29028","Netherlands","NL","Aviation Gasoline","exio" +"29029","Netherlands","NL","Gasoline Type Jet Fuel","exio" +"29030","Netherlands","NL","Kerosene Type Jet Fuel","exio" +"29031","Netherlands","NL","Kerosene","exio" +"29032","Netherlands","NL","Gas/Diesel Oil","exio" +"29033","Netherlands","NL","Heavy Fuel Oil","exio" +"29034","Netherlands","NL","Refinery Gas","exio" +"29035","Netherlands","NL","Liquefied Petroleum Gases (LPG)","exio" +"29036","Netherlands","NL","Refinery Feedstocks","exio" +"29037","Netherlands","NL","Ethane","exio" +"29038","Netherlands","NL","Naphtha","exio" +"29039","Netherlands","NL","White Spirit & SBP","exio" +"29040","Netherlands","NL","Lubricants","exio" +"29041","Netherlands","NL","Bitumen","exio" +"29042","Netherlands","NL","Paraffin Waxes","exio" +"29043","Netherlands","NL","Petroleum Coke","exio" +"29044","Netherlands","NL","Non-specified Petroleum Products","exio" +"29045","Netherlands","NL","Nuclear fuel","exio" +"29046","Netherlands","NL","Plastics, basic","exio" +"29047","Netherlands","NL","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"29048","Netherlands","NL","N-fertiliser","exio" +"29049","Netherlands","NL","P- and other fertiliser","exio" +"29050","Netherlands","NL","Chemicals nec","exio" +"29051","Netherlands","NL","Charcoal","exio" +"29052","Netherlands","NL","Additives/Blending Components","exio" +"29053","Netherlands","NL","Biogasoline","exio" +"29054","Netherlands","NL","Biodiesels","exio" +"29055","Netherlands","NL","Other Liquid Biofuels","exio" +"29056","Netherlands","NL","Rubber and plastic products","exio" +"29057","Netherlands","NL","Glass and glass products","exio" +"29058","Netherlands","NL","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"29059","Netherlands","NL","Ceramic goods","exio" +"29060","Netherlands","NL","Bricks, tiles and construction products, in baked clay","exio" +"29061","Netherlands","NL","Cement, lime and plaster","exio" +"29062","Netherlands","NL","Ash for treatment, Re-processing of ash into clinker","exio" +"29063","Netherlands","NL","Other non-metallic mineral products","exio" +"29064","Netherlands","NL","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"29065","Netherlands","NL","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"29066","Netherlands","NL","Precious metals","exio" +"29067","Netherlands","NL","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"29068","Netherlands","NL","Aluminium and aluminium products","exio" +"29069","Netherlands","NL","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"29070","Netherlands","NL","Lead, zinc and tin and products thereof","exio" +"29071","Netherlands","NL","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"29072","Netherlands","NL","Copper products","exio" +"29073","Netherlands","NL","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"29074","Netherlands","NL","Other non-ferrous metal products","exio" +"29075","Netherlands","NL","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"29076","Netherlands","NL","Foundry work services","exio" +"29077","Netherlands","NL","Fabricated metal products, except machinery and equipment","exio" +"29078","Netherlands","NL","Machinery and equipment n.e.c.","exio" +"29079","Netherlands","NL","Office machinery and computers","exio" +"29080","Netherlands","NL","Electrical machinery and apparatus n.e.c.","exio" +"29081","Netherlands","NL","Radio, television and communication equipment and apparatus","exio" +"29082","Netherlands","NL","Medical, precision and optical instruments, watches and clocks","exio" +"29083","Netherlands","NL","Motor vehicles, trailers and semi-trailers","exio" +"29084","Netherlands","NL","Other transport equipment","exio" +"29085","Netherlands","NL","Furniture; other manufactured goods n.e.c.","exio" +"29086","Netherlands","NL","Secondary raw materials","exio" +"29087","Netherlands","NL","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"29088","Netherlands","NL","Electricity by coal","exio" +"29089","Netherlands","NL","Electricity by gas","exio" +"29090","Netherlands","NL","Electricity by nuclear","exio" +"29091","Netherlands","NL","Electricity by hydro","exio" +"29092","Netherlands","NL","Electricity by wind","exio" +"29093","Netherlands","NL","Electricity by petroleum and other oil derivatives","exio" +"29094","Netherlands","NL","Electricity by biomass and waste","exio" +"29095","Netherlands","NL","Electricity by solar photovoltaic","exio" +"29096","Netherlands","NL","Electricity by solar thermal","exio" +"29097","Netherlands","NL","Electricity by tide, wave, ocean","exio" +"29098","Netherlands","NL","Electricity by Geothermal","exio" +"29099","Netherlands","NL","Electricity nec","exio" +"29100","Netherlands","NL","Transmission services of electricity","exio" +"29101","Netherlands","NL","Distribution and trade services of electricity","exio" +"29102","Netherlands","NL","Coke oven gas","exio" +"29103","Netherlands","NL","Blast Furnace Gas","exio" +"29104","Netherlands","NL","Oxygen Steel Furnace Gas","exio" +"29105","Netherlands","NL","Gas Works Gas","exio" +"29106","Netherlands","NL","Biogas","exio" +"29107","Netherlands","NL","Distribution services of gaseous fuels through mains","exio" +"29108","Netherlands","NL","Steam and hot water supply services","exio" +"29109","Netherlands","NL","Collected and purified water, distribution services of water","exio" +"29110","Netherlands","NL","Construction work","exio" +"29111","Netherlands","NL","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"29112","Netherlands","NL","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"29113","Netherlands","NL","Retail trade services of motor fuel","exio" +"29114","Netherlands","NL","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"29115","Netherlands","NL","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"29116","Netherlands","NL","Hotel and restaurant services","exio" +"29117","Netherlands","NL","Railway transportation services","exio" +"29118","Netherlands","NL","Other land transportation services","exio" +"29119","Netherlands","NL","Transportation services via pipelines","exio" +"29120","Netherlands","NL","Sea and coastal water transportation services","exio" +"29121","Netherlands","NL","Inland water transportation services","exio" +"29122","Netherlands","NL","Air transport services","exio" +"29123","Netherlands","NL","Supporting and auxiliary transport services; travel agency services","exio" +"29124","Netherlands","NL","Post and telecommunication services","exio" +"29125","Netherlands","NL","Financial intermediation services, except insurance and pension funding services","exio" +"29126","Netherlands","NL","Insurance and pension funding services, except compulsory social security services","exio" +"29127","Netherlands","NL","Services auxiliary to financial intermediation","exio" +"29128","Netherlands","NL","Real estate services","exio" +"29129","Netherlands","NL","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"29130","Netherlands","NL","Computer and related services","exio" +"29131","Netherlands","NL","Research and development services","exio" +"29132","Netherlands","NL","Other business services","exio" +"29133","Netherlands","NL","Public administration and defence services; compulsory social security services","exio" +"29134","Netherlands","NL","Education services","exio" +"29135","Netherlands","NL","Health and social work services","exio" +"29136","Netherlands","NL","Food waste for treatment: incineration","exio" +"29137","Netherlands","NL","Paper waste for treatment: incineration","exio" +"29138","Netherlands","NL","Plastic waste for treatment: incineration","exio" +"29139","Netherlands","NL","Intert/metal waste for treatment: incineration","exio" +"29140","Netherlands","NL","Textiles waste for treatment: incineration","exio" +"29141","Netherlands","NL","Wood waste for treatment: incineration","exio" +"29142","Netherlands","NL","Oil/hazardous waste for treatment: incineration","exio" +"29143","Netherlands","NL","Food waste for treatment: biogasification and land application","exio" +"29144","Netherlands","NL","Paper waste for treatment: biogasification and land application","exio" +"29145","Netherlands","NL","Sewage sludge for treatment: biogasification and land application","exio" +"29146","Netherlands","NL","Food waste for treatment: composting and land application","exio" +"29147","Netherlands","NL","Paper and wood waste for treatment: composting and land application","exio" +"29148","Netherlands","NL","Food waste for treatment: waste water treatment","exio" +"29149","Netherlands","NL","Other waste for treatment: waste water treatment","exio" +"29150","Netherlands","NL","Food waste for treatment: landfill","exio" +"29151","Netherlands","NL","Paper for treatment: landfill","exio" +"29152","Netherlands","NL","Plastic waste for treatment: landfill","exio" +"29153","Netherlands","NL","Inert/metal/hazardous waste for treatment: landfill","exio" +"29154","Netherlands","NL","Textiles waste for treatment: landfill","exio" +"29155","Netherlands","NL","Wood waste for treatment: landfill","exio" +"29156","Netherlands","NL","Membership organisation services n.e.c.","exio" +"29157","Netherlands","NL","Recreational, cultural and sporting services","exio" +"29158","Netherlands","NL","Other services","exio" +"29159","Netherlands","NL","Private households with employed persons","exio" +"29160","Netherlands","NL","Extra-territorial organizations and bodies","exio" +"29161","Poland","PL","Paddy rice","exio" +"29162","Poland","PL","Wheat","exio" +"29163","Poland","PL","Cereal grains nec","exio" +"29164","Poland","PL","Vegetables, fruit, nuts","exio" +"29165","Poland","PL","Oil seeds","exio" +"29166","Poland","PL","Sugar cane, sugar beet","exio" +"29167","Poland","PL","Plant-based fibers","exio" +"29168","Poland","PL","Crops nec","exio" +"29169","Poland","PL","Cattle","exio" +"29170","Poland","PL","Pigs","exio" +"29171","Poland","PL","Poultry","exio" +"29172","Poland","PL","Meat animals nec","exio" +"29173","Poland","PL","Animal products nec","exio" +"29174","Poland","PL","Raw milk","exio" +"29175","Poland","PL","Wool, silk-worm cocoons","exio" +"29176","Poland","PL","Manure (conventional treatment)","exio" +"29177","Poland","PL","Manure (biogas treatment)","exio" +"29178","Poland","PL","Products of forestry, logging and related services","exio" +"29179","Poland","PL","Fish and other fishing products; services incidental of fishing","exio" +"29180","Poland","PL","Anthracite","exio" +"29181","Poland","PL","Coking Coal","exio" +"29182","Poland","PL","Other Bituminous Coal","exio" +"29183","Poland","PL","Sub-Bituminous Coal","exio" +"29184","Poland","PL","Patent Fuel","exio" +"29185","Poland","PL","Lignite/Brown Coal","exio" +"29186","Poland","PL","BKB/Peat Briquettes","exio" +"29187","Poland","PL","Peat","exio" +"29188","Poland","PL","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"29189","Poland","PL","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"29190","Poland","PL","Natural Gas Liquids","exio" +"29191","Poland","PL","Other Hydrocarbons","exio" +"29192","Poland","PL","Uranium and thorium ores","exio" +"29193","Poland","PL","Iron ores","exio" +"29194","Poland","PL","Copper ores and concentrates","exio" +"29195","Poland","PL","Nickel ores and concentrates","exio" +"29196","Poland","PL","Aluminium ores and concentrates","exio" +"29197","Poland","PL","Precious metal ores and concentrates","exio" +"29198","Poland","PL","Lead, zinc and tin ores and concentrates","exio" +"29199","Poland","PL","Other non-ferrous metal ores and concentrates","exio" +"29200","Poland","PL","Stone","exio" +"29201","Poland","PL","Sand and clay","exio" +"29202","Poland","PL","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"29203","Poland","PL","Products of meat cattle","exio" +"29204","Poland","PL","Products of meat pigs","exio" +"29205","Poland","PL","Products of meat poultry","exio" +"29206","Poland","PL","Meat products nec","exio" +"29207","Poland","PL","products of Vegetable oils and fats","exio" +"29208","Poland","PL","Dairy products","exio" +"29209","Poland","PL","Processed rice","exio" +"29210","Poland","PL","Sugar","exio" +"29211","Poland","PL","Food products nec","exio" +"29212","Poland","PL","Beverages","exio" +"29213","Poland","PL","Fish products","exio" +"29214","Poland","PL","Tobacco products","exio" +"29215","Poland","PL","Textiles","exio" +"29216","Poland","PL","Wearing apparel; furs","exio" +"29217","Poland","PL","Leather and leather products","exio" +"29218","Poland","PL","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"29219","Poland","PL","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"29220","Poland","PL","Pulp","exio" +"29221","Poland","PL","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"29222","Poland","PL","Paper and paper products","exio" +"29223","Poland","PL","Printed matter and recorded media","exio" +"29224","Poland","PL","Coke Oven Coke","exio" +"29225","Poland","PL","Gas Coke","exio" +"29226","Poland","PL","Coal Tar","exio" +"29227","Poland","PL","Motor Gasoline","exio" +"29228","Poland","PL","Aviation Gasoline","exio" +"29229","Poland","PL","Gasoline Type Jet Fuel","exio" +"29230","Poland","PL","Kerosene Type Jet Fuel","exio" +"29231","Poland","PL","Kerosene","exio" +"29232","Poland","PL","Gas/Diesel Oil","exio" +"29233","Poland","PL","Heavy Fuel Oil","exio" +"29234","Poland","PL","Refinery Gas","exio" +"29235","Poland","PL","Liquefied Petroleum Gases (LPG)","exio" +"29236","Poland","PL","Refinery Feedstocks","exio" +"29237","Poland","PL","Ethane","exio" +"29238","Poland","PL","Naphtha","exio" +"29239","Poland","PL","White Spirit & SBP","exio" +"29240","Poland","PL","Lubricants","exio" +"29241","Poland","PL","Bitumen","exio" +"29242","Poland","PL","Paraffin Waxes","exio" +"29243","Poland","PL","Petroleum Coke","exio" +"29244","Poland","PL","Non-specified Petroleum Products","exio" +"29245","Poland","PL","Nuclear fuel","exio" +"29246","Poland","PL","Plastics, basic","exio" +"29247","Poland","PL","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"29248","Poland","PL","N-fertiliser","exio" +"29249","Poland","PL","P- and other fertiliser","exio" +"29250","Poland","PL","Chemicals nec","exio" +"29251","Poland","PL","Charcoal","exio" +"29252","Poland","PL","Additives/Blending Components","exio" +"29253","Poland","PL","Biogasoline","exio" +"29254","Poland","PL","Biodiesels","exio" +"29255","Poland","PL","Other Liquid Biofuels","exio" +"29256","Poland","PL","Rubber and plastic products","exio" +"29257","Poland","PL","Glass and glass products","exio" +"29258","Poland","PL","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"29259","Poland","PL","Ceramic goods","exio" +"29260","Poland","PL","Bricks, tiles and construction products, in baked clay","exio" +"29261","Poland","PL","Cement, lime and plaster","exio" +"29262","Poland","PL","Ash for treatment, Re-processing of ash into clinker","exio" +"29263","Poland","PL","Other non-metallic mineral products","exio" +"29264","Poland","PL","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"29265","Poland","PL","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"29266","Poland","PL","Precious metals","exio" +"29267","Poland","PL","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"29268","Poland","PL","Aluminium and aluminium products","exio" +"29269","Poland","PL","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"29270","Poland","PL","Lead, zinc and tin and products thereof","exio" +"29271","Poland","PL","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"29272","Poland","PL","Copper products","exio" +"29273","Poland","PL","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"29274","Poland","PL","Other non-ferrous metal products","exio" +"29275","Poland","PL","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"29276","Poland","PL","Foundry work services","exio" +"29277","Poland","PL","Fabricated metal products, except machinery and equipment","exio" +"29278","Poland","PL","Machinery and equipment n.e.c.","exio" +"29279","Poland","PL","Office machinery and computers","exio" +"29280","Poland","PL","Electrical machinery and apparatus n.e.c.","exio" +"29281","Poland","PL","Radio, television and communication equipment and apparatus","exio" +"29282","Poland","PL","Medical, precision and optical instruments, watches and clocks","exio" +"29283","Poland","PL","Motor vehicles, trailers and semi-trailers","exio" +"29284","Poland","PL","Other transport equipment","exio" +"29285","Poland","PL","Furniture; other manufactured goods n.e.c.","exio" +"29286","Poland","PL","Secondary raw materials","exio" +"29287","Poland","PL","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"29288","Poland","PL","Electricity by coal","exio" +"29289","Poland","PL","Electricity by gas","exio" +"29290","Poland","PL","Electricity by nuclear","exio" +"29291","Poland","PL","Electricity by hydro","exio" +"29292","Poland","PL","Electricity by wind","exio" +"29293","Poland","PL","Electricity by petroleum and other oil derivatives","exio" +"29294","Poland","PL","Electricity by biomass and waste","exio" +"29295","Poland","PL","Electricity by solar photovoltaic","exio" +"29296","Poland","PL","Electricity by solar thermal","exio" +"29297","Poland","PL","Electricity by tide, wave, ocean","exio" +"29298","Poland","PL","Electricity by Geothermal","exio" +"29299","Poland","PL","Electricity nec","exio" +"29300","Poland","PL","Transmission services of electricity","exio" +"29301","Poland","PL","Distribution and trade services of electricity","exio" +"29302","Poland","PL","Coke oven gas","exio" +"29303","Poland","PL","Blast Furnace Gas","exio" +"29304","Poland","PL","Oxygen Steel Furnace Gas","exio" +"29305","Poland","PL","Gas Works Gas","exio" +"29306","Poland","PL","Biogas","exio" +"29307","Poland","PL","Distribution services of gaseous fuels through mains","exio" +"29308","Poland","PL","Steam and hot water supply services","exio" +"29309","Poland","PL","Collected and purified water, distribution services of water","exio" +"29310","Poland","PL","Construction work","exio" +"29311","Poland","PL","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"29312","Poland","PL","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"29313","Poland","PL","Retail trade services of motor fuel","exio" +"29314","Poland","PL","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"29315","Poland","PL","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"29316","Poland","PL","Hotel and restaurant services","exio" +"29317","Poland","PL","Railway transportation services","exio" +"29318","Poland","PL","Other land transportation services","exio" +"29319","Poland","PL","Transportation services via pipelines","exio" +"29320","Poland","PL","Sea and coastal water transportation services","exio" +"29321","Poland","PL","Inland water transportation services","exio" +"29322","Poland","PL","Air transport services","exio" +"29323","Poland","PL","Supporting and auxiliary transport services; travel agency services","exio" +"29324","Poland","PL","Post and telecommunication services","exio" +"29325","Poland","PL","Financial intermediation services, except insurance and pension funding services","exio" +"29326","Poland","PL","Insurance and pension funding services, except compulsory social security services","exio" +"29327","Poland","PL","Services auxiliary to financial intermediation","exio" +"29328","Poland","PL","Real estate services","exio" +"29329","Poland","PL","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"29330","Poland","PL","Computer and related services","exio" +"29331","Poland","PL","Research and development services","exio" +"29332","Poland","PL","Other business services","exio" +"29333","Poland","PL","Public administration and defence services; compulsory social security services","exio" +"29334","Poland","PL","Education services","exio" +"29335","Poland","PL","Health and social work services","exio" +"29336","Poland","PL","Food waste for treatment: incineration","exio" +"29337","Poland","PL","Paper waste for treatment: incineration","exio" +"29338","Poland","PL","Plastic waste for treatment: incineration","exio" +"29339","Poland","PL","Intert/metal waste for treatment: incineration","exio" +"29340","Poland","PL","Textiles waste for treatment: incineration","exio" +"29341","Poland","PL","Wood waste for treatment: incineration","exio" +"29342","Poland","PL","Oil/hazardous waste for treatment: incineration","exio" +"29343","Poland","PL","Food waste for treatment: biogasification and land application","exio" +"29344","Poland","PL","Paper waste for treatment: biogasification and land application","exio" +"29345","Poland","PL","Sewage sludge for treatment: biogasification and land application","exio" +"29346","Poland","PL","Food waste for treatment: composting and land application","exio" +"29347","Poland","PL","Paper and wood waste for treatment: composting and land application","exio" +"29348","Poland","PL","Food waste for treatment: waste water treatment","exio" +"29349","Poland","PL","Other waste for treatment: waste water treatment","exio" +"29350","Poland","PL","Food waste for treatment: landfill","exio" +"29351","Poland","PL","Paper for treatment: landfill","exio" +"29352","Poland","PL","Plastic waste for treatment: landfill","exio" +"29353","Poland","PL","Inert/metal/hazardous waste for treatment: landfill","exio" +"29354","Poland","PL","Textiles waste for treatment: landfill","exio" +"29355","Poland","PL","Wood waste for treatment: landfill","exio" +"29356","Poland","PL","Membership organisation services n.e.c.","exio" +"29357","Poland","PL","Recreational, cultural and sporting services","exio" +"29358","Poland","PL","Other services","exio" +"29359","Poland","PL","Private households with employed persons","exio" +"29360","Poland","PL","Extra-territorial organizations and bodies","exio" +"29361","Portugal","PT","Paddy rice","exio" +"29362","Portugal","PT","Wheat","exio" +"29363","Portugal","PT","Cereal grains nec","exio" +"29364","Portugal","PT","Vegetables, fruit, nuts","exio" +"29365","Portugal","PT","Oil seeds","exio" +"29366","Portugal","PT","Sugar cane, sugar beet","exio" +"29367","Portugal","PT","Plant-based fibers","exio" +"29368","Portugal","PT","Crops nec","exio" +"29369","Portugal","PT","Cattle","exio" +"29370","Portugal","PT","Pigs","exio" +"29371","Portugal","PT","Poultry","exio" +"29372","Portugal","PT","Meat animals nec","exio" +"29373","Portugal","PT","Animal products nec","exio" +"29374","Portugal","PT","Raw milk","exio" +"29375","Portugal","PT","Wool, silk-worm cocoons","exio" +"29376","Portugal","PT","Manure (conventional treatment)","exio" +"29377","Portugal","PT","Manure (biogas treatment)","exio" +"29378","Portugal","PT","Products of forestry, logging and related services","exio" +"29379","Portugal","PT","Fish and other fishing products; services incidental of fishing","exio" +"29380","Portugal","PT","Anthracite","exio" +"29381","Portugal","PT","Coking Coal","exio" +"29382","Portugal","PT","Other Bituminous Coal","exio" +"29383","Portugal","PT","Sub-Bituminous Coal","exio" +"29384","Portugal","PT","Patent Fuel","exio" +"29385","Portugal","PT","Lignite/Brown Coal","exio" +"29386","Portugal","PT","BKB/Peat Briquettes","exio" +"29387","Portugal","PT","Peat","exio" +"29388","Portugal","PT","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"29389","Portugal","PT","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"29390","Portugal","PT","Natural Gas Liquids","exio" +"29391","Portugal","PT","Other Hydrocarbons","exio" +"29392","Portugal","PT","Uranium and thorium ores","exio" +"29393","Portugal","PT","Iron ores","exio" +"29394","Portugal","PT","Copper ores and concentrates","exio" +"29395","Portugal","PT","Nickel ores and concentrates","exio" +"29396","Portugal","PT","Aluminium ores and concentrates","exio" +"29397","Portugal","PT","Precious metal ores and concentrates","exio" +"29398","Portugal","PT","Lead, zinc and tin ores and concentrates","exio" +"29399","Portugal","PT","Other non-ferrous metal ores and concentrates","exio" +"29400","Portugal","PT","Stone","exio" +"29401","Portugal","PT","Sand and clay","exio" +"29402","Portugal","PT","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"29403","Portugal","PT","Products of meat cattle","exio" +"29404","Portugal","PT","Products of meat pigs","exio" +"29405","Portugal","PT","Products of meat poultry","exio" +"29406","Portugal","PT","Meat products nec","exio" +"29407","Portugal","PT","products of Vegetable oils and fats","exio" +"29408","Portugal","PT","Dairy products","exio" +"29409","Portugal","PT","Processed rice","exio" +"29410","Portugal","PT","Sugar","exio" +"29411","Portugal","PT","Food products nec","exio" +"29412","Portugal","PT","Beverages","exio" +"29413","Portugal","PT","Fish products","exio" +"29414","Portugal","PT","Tobacco products","exio" +"29415","Portugal","PT","Textiles","exio" +"29416","Portugal","PT","Wearing apparel; furs","exio" +"29417","Portugal","PT","Leather and leather products","exio" +"29418","Portugal","PT","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"29419","Portugal","PT","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"29420","Portugal","PT","Pulp","exio" +"29421","Portugal","PT","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"29422","Portugal","PT","Paper and paper products","exio" +"29423","Portugal","PT","Printed matter and recorded media","exio" +"29424","Portugal","PT","Coke Oven Coke","exio" +"29425","Portugal","PT","Gas Coke","exio" +"29426","Portugal","PT","Coal Tar","exio" +"29427","Portugal","PT","Motor Gasoline","exio" +"29428","Portugal","PT","Aviation Gasoline","exio" +"29429","Portugal","PT","Gasoline Type Jet Fuel","exio" +"29430","Portugal","PT","Kerosene Type Jet Fuel","exio" +"29431","Portugal","PT","Kerosene","exio" +"29432","Portugal","PT","Gas/Diesel Oil","exio" +"29433","Portugal","PT","Heavy Fuel Oil","exio" +"29434","Portugal","PT","Refinery Gas","exio" +"29435","Portugal","PT","Liquefied Petroleum Gases (LPG)","exio" +"29436","Portugal","PT","Refinery Feedstocks","exio" +"29437","Portugal","PT","Ethane","exio" +"29438","Portugal","PT","Naphtha","exio" +"29439","Portugal","PT","White Spirit & SBP","exio" +"29440","Portugal","PT","Lubricants","exio" +"29441","Portugal","PT","Bitumen","exio" +"29442","Portugal","PT","Paraffin Waxes","exio" +"29443","Portugal","PT","Petroleum Coke","exio" +"29444","Portugal","PT","Non-specified Petroleum Products","exio" +"29445","Portugal","PT","Nuclear fuel","exio" +"29446","Portugal","PT","Plastics, basic","exio" +"29447","Portugal","PT","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"29448","Portugal","PT","N-fertiliser","exio" +"29449","Portugal","PT","P- and other fertiliser","exio" +"29450","Portugal","PT","Chemicals nec","exio" +"29451","Portugal","PT","Charcoal","exio" +"29452","Portugal","PT","Additives/Blending Components","exio" +"29453","Portugal","PT","Biogasoline","exio" +"29454","Portugal","PT","Biodiesels","exio" +"29455","Portugal","PT","Other Liquid Biofuels","exio" +"29456","Portugal","PT","Rubber and plastic products","exio" +"29457","Portugal","PT","Glass and glass products","exio" +"29458","Portugal","PT","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"29459","Portugal","PT","Ceramic goods","exio" +"29460","Portugal","PT","Bricks, tiles and construction products, in baked clay","exio" +"29461","Portugal","PT","Cement, lime and plaster","exio" +"29462","Portugal","PT","Ash for treatment, Re-processing of ash into clinker","exio" +"29463","Portugal","PT","Other non-metallic mineral products","exio" +"29464","Portugal","PT","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"29465","Portugal","PT","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"29466","Portugal","PT","Precious metals","exio" +"29467","Portugal","PT","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"29468","Portugal","PT","Aluminium and aluminium products","exio" +"29469","Portugal","PT","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"29470","Portugal","PT","Lead, zinc and tin and products thereof","exio" +"29471","Portugal","PT","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"29472","Portugal","PT","Copper products","exio" +"29473","Portugal","PT","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"29474","Portugal","PT","Other non-ferrous metal products","exio" +"29475","Portugal","PT","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"29476","Portugal","PT","Foundry work services","exio" +"29477","Portugal","PT","Fabricated metal products, except machinery and equipment","exio" +"29478","Portugal","PT","Machinery and equipment n.e.c.","exio" +"29479","Portugal","PT","Office machinery and computers","exio" +"29480","Portugal","PT","Electrical machinery and apparatus n.e.c.","exio" +"29481","Portugal","PT","Radio, television and communication equipment and apparatus","exio" +"29482","Portugal","PT","Medical, precision and optical instruments, watches and clocks","exio" +"29483","Portugal","PT","Motor vehicles, trailers and semi-trailers","exio" +"29484","Portugal","PT","Other transport equipment","exio" +"29485","Portugal","PT","Furniture; other manufactured goods n.e.c.","exio" +"29486","Portugal","PT","Secondary raw materials","exio" +"29487","Portugal","PT","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"29488","Portugal","PT","Electricity by coal","exio" +"29489","Portugal","PT","Electricity by gas","exio" +"29490","Portugal","PT","Electricity by nuclear","exio" +"29491","Portugal","PT","Electricity by hydro","exio" +"29492","Portugal","PT","Electricity by wind","exio" +"29493","Portugal","PT","Electricity by petroleum and other oil derivatives","exio" +"29494","Portugal","PT","Electricity by biomass and waste","exio" +"29495","Portugal","PT","Electricity by solar photovoltaic","exio" +"29496","Portugal","PT","Electricity by solar thermal","exio" +"29497","Portugal","PT","Electricity by tide, wave, ocean","exio" +"29498","Portugal","PT","Electricity by Geothermal","exio" +"29499","Portugal","PT","Electricity nec","exio" +"29500","Portugal","PT","Transmission services of electricity","exio" +"29501","Portugal","PT","Distribution and trade services of electricity","exio" +"29502","Portugal","PT","Coke oven gas","exio" +"29503","Portugal","PT","Blast Furnace Gas","exio" +"29504","Portugal","PT","Oxygen Steel Furnace Gas","exio" +"29505","Portugal","PT","Gas Works Gas","exio" +"29506","Portugal","PT","Biogas","exio" +"29507","Portugal","PT","Distribution services of gaseous fuels through mains","exio" +"29508","Portugal","PT","Steam and hot water supply services","exio" +"29509","Portugal","PT","Collected and purified water, distribution services of water","exio" +"29510","Portugal","PT","Construction work","exio" +"29511","Portugal","PT","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"29512","Portugal","PT","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"29513","Portugal","PT","Retail trade services of motor fuel","exio" +"29514","Portugal","PT","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"29515","Portugal","PT","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"29516","Portugal","PT","Hotel and restaurant services","exio" +"29517","Portugal","PT","Railway transportation services","exio" +"29518","Portugal","PT","Other land transportation services","exio" +"29519","Portugal","PT","Transportation services via pipelines","exio" +"29520","Portugal","PT","Sea and coastal water transportation services","exio" +"29521","Portugal","PT","Inland water transportation services","exio" +"29522","Portugal","PT","Air transport services","exio" +"29523","Portugal","PT","Supporting and auxiliary transport services; travel agency services","exio" +"29524","Portugal","PT","Post and telecommunication services","exio" +"29525","Portugal","PT","Financial intermediation services, except insurance and pension funding services","exio" +"29526","Portugal","PT","Insurance and pension funding services, except compulsory social security services","exio" +"29527","Portugal","PT","Services auxiliary to financial intermediation","exio" +"29528","Portugal","PT","Real estate services","exio" +"29529","Portugal","PT","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"29530","Portugal","PT","Computer and related services","exio" +"29531","Portugal","PT","Research and development services","exio" +"29532","Portugal","PT","Other business services","exio" +"29533","Portugal","PT","Public administration and defence services; compulsory social security services","exio" +"29534","Portugal","PT","Education services","exio" +"29535","Portugal","PT","Health and social work services","exio" +"29536","Portugal","PT","Food waste for treatment: incineration","exio" +"29537","Portugal","PT","Paper waste for treatment: incineration","exio" +"29538","Portugal","PT","Plastic waste for treatment: incineration","exio" +"29539","Portugal","PT","Intert/metal waste for treatment: incineration","exio" +"29540","Portugal","PT","Textiles waste for treatment: incineration","exio" +"29541","Portugal","PT","Wood waste for treatment: incineration","exio" +"29542","Portugal","PT","Oil/hazardous waste for treatment: incineration","exio" +"29543","Portugal","PT","Food waste for treatment: biogasification and land application","exio" +"29544","Portugal","PT","Paper waste for treatment: biogasification and land application","exio" +"29545","Portugal","PT","Sewage sludge for treatment: biogasification and land application","exio" +"29546","Portugal","PT","Food waste for treatment: composting and land application","exio" +"29547","Portugal","PT","Paper and wood waste for treatment: composting and land application","exio" +"29548","Portugal","PT","Food waste for treatment: waste water treatment","exio" +"29549","Portugal","PT","Other waste for treatment: waste water treatment","exio" +"29550","Portugal","PT","Food waste for treatment: landfill","exio" +"29551","Portugal","PT","Paper for treatment: landfill","exio" +"29552","Portugal","PT","Plastic waste for treatment: landfill","exio" +"29553","Portugal","PT","Inert/metal/hazardous waste for treatment: landfill","exio" +"29554","Portugal","PT","Textiles waste for treatment: landfill","exio" +"29555","Portugal","PT","Wood waste for treatment: landfill","exio" +"29556","Portugal","PT","Membership organisation services n.e.c.","exio" +"29557","Portugal","PT","Recreational, cultural and sporting services","exio" +"29558","Portugal","PT","Other services","exio" +"29559","Portugal","PT","Private households with employed persons","exio" +"29560","Portugal","PT","Extra-territorial organizations and bodies","exio" +"29561","Romania","RO","Paddy rice","exio" +"29562","Romania","RO","Wheat","exio" +"29563","Romania","RO","Cereal grains nec","exio" +"29564","Romania","RO","Vegetables, fruit, nuts","exio" +"29565","Romania","RO","Oil seeds","exio" +"29566","Romania","RO","Sugar cane, sugar beet","exio" +"29567","Romania","RO","Plant-based fibers","exio" +"29568","Romania","RO","Crops nec","exio" +"29569","Romania","RO","Cattle","exio" +"29570","Romania","RO","Pigs","exio" +"29571","Romania","RO","Poultry","exio" +"29572","Romania","RO","Meat animals nec","exio" +"29573","Romania","RO","Animal products nec","exio" +"29574","Romania","RO","Raw milk","exio" +"29575","Romania","RO","Wool, silk-worm cocoons","exio" +"29576","Romania","RO","Manure (conventional treatment)","exio" +"29577","Romania","RO","Manure (biogas treatment)","exio" +"29578","Romania","RO","Products of forestry, logging and related services","exio" +"29579","Romania","RO","Fish and other fishing products; services incidental of fishing","exio" +"29580","Romania","RO","Anthracite","exio" +"29581","Romania","RO","Coking Coal","exio" +"29582","Romania","RO","Other Bituminous Coal","exio" +"29583","Romania","RO","Sub-Bituminous Coal","exio" +"29584","Romania","RO","Patent Fuel","exio" +"29585","Romania","RO","Lignite/Brown Coal","exio" +"29586","Romania","RO","BKB/Peat Briquettes","exio" +"29587","Romania","RO","Peat","exio" +"29588","Romania","RO","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"29589","Romania","RO","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"29590","Romania","RO","Natural Gas Liquids","exio" +"29591","Romania","RO","Other Hydrocarbons","exio" +"29592","Romania","RO","Uranium and thorium ores","exio" +"29593","Romania","RO","Iron ores","exio" +"29594","Romania","RO","Copper ores and concentrates","exio" +"29595","Romania","RO","Nickel ores and concentrates","exio" +"29596","Romania","RO","Aluminium ores and concentrates","exio" +"29597","Romania","RO","Precious metal ores and concentrates","exio" +"29598","Romania","RO","Lead, zinc and tin ores and concentrates","exio" +"29599","Romania","RO","Other non-ferrous metal ores and concentrates","exio" +"29600","Romania","RO","Stone","exio" +"29601","Romania","RO","Sand and clay","exio" +"29602","Romania","RO","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"29603","Romania","RO","Products of meat cattle","exio" +"29604","Romania","RO","Products of meat pigs","exio" +"29605","Romania","RO","Products of meat poultry","exio" +"29606","Romania","RO","Meat products nec","exio" +"29607","Romania","RO","products of Vegetable oils and fats","exio" +"29608","Romania","RO","Dairy products","exio" +"29609","Romania","RO","Processed rice","exio" +"29610","Romania","RO","Sugar","exio" +"29611","Romania","RO","Food products nec","exio" +"29612","Romania","RO","Beverages","exio" +"29613","Romania","RO","Fish products","exio" +"29614","Romania","RO","Tobacco products","exio" +"29615","Romania","RO","Textiles","exio" +"29616","Romania","RO","Wearing apparel; furs","exio" +"29617","Romania","RO","Leather and leather products","exio" +"29618","Romania","RO","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"29619","Romania","RO","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"29620","Romania","RO","Pulp","exio" +"29621","Romania","RO","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"29622","Romania","RO","Paper and paper products","exio" +"29623","Romania","RO","Printed matter and recorded media","exio" +"29624","Romania","RO","Coke Oven Coke","exio" +"29625","Romania","RO","Gas Coke","exio" +"29626","Romania","RO","Coal Tar","exio" +"29627","Romania","RO","Motor Gasoline","exio" +"29628","Romania","RO","Aviation Gasoline","exio" +"29629","Romania","RO","Gasoline Type Jet Fuel","exio" +"29630","Romania","RO","Kerosene Type Jet Fuel","exio" +"29631","Romania","RO","Kerosene","exio" +"29632","Romania","RO","Gas/Diesel Oil","exio" +"29633","Romania","RO","Heavy Fuel Oil","exio" +"29634","Romania","RO","Refinery Gas","exio" +"29635","Romania","RO","Liquefied Petroleum Gases (LPG)","exio" +"29636","Romania","RO","Refinery Feedstocks","exio" +"29637","Romania","RO","Ethane","exio" +"29638","Romania","RO","Naphtha","exio" +"29639","Romania","RO","White Spirit & SBP","exio" +"29640","Romania","RO","Lubricants","exio" +"29641","Romania","RO","Bitumen","exio" +"29642","Romania","RO","Paraffin Waxes","exio" +"29643","Romania","RO","Petroleum Coke","exio" +"29644","Romania","RO","Non-specified Petroleum Products","exio" +"29645","Romania","RO","Nuclear fuel","exio" +"29646","Romania","RO","Plastics, basic","exio" +"29647","Romania","RO","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"29648","Romania","RO","N-fertiliser","exio" +"29649","Romania","RO","P- and other fertiliser","exio" +"29650","Romania","RO","Chemicals nec","exio" +"29651","Romania","RO","Charcoal","exio" +"29652","Romania","RO","Additives/Blending Components","exio" +"29653","Romania","RO","Biogasoline","exio" +"29654","Romania","RO","Biodiesels","exio" +"29655","Romania","RO","Other Liquid Biofuels","exio" +"29656","Romania","RO","Rubber and plastic products","exio" +"29657","Romania","RO","Glass and glass products","exio" +"29658","Romania","RO","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"29659","Romania","RO","Ceramic goods","exio" +"29660","Romania","RO","Bricks, tiles and construction products, in baked clay","exio" +"29661","Romania","RO","Cement, lime and plaster","exio" +"29662","Romania","RO","Ash for treatment, Re-processing of ash into clinker","exio" +"29663","Romania","RO","Other non-metallic mineral products","exio" +"29664","Romania","RO","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"29665","Romania","RO","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"29666","Romania","RO","Precious metals","exio" +"29667","Romania","RO","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"29668","Romania","RO","Aluminium and aluminium products","exio" +"29669","Romania","RO","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"29670","Romania","RO","Lead, zinc and tin and products thereof","exio" +"29671","Romania","RO","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"29672","Romania","RO","Copper products","exio" +"29673","Romania","RO","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"29674","Romania","RO","Other non-ferrous metal products","exio" +"29675","Romania","RO","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"29676","Romania","RO","Foundry work services","exio" +"29677","Romania","RO","Fabricated metal products, except machinery and equipment","exio" +"29678","Romania","RO","Machinery and equipment n.e.c.","exio" +"29679","Romania","RO","Office machinery and computers","exio" +"29680","Romania","RO","Electrical machinery and apparatus n.e.c.","exio" +"29681","Romania","RO","Radio, television and communication equipment and apparatus","exio" +"29682","Romania","RO","Medical, precision and optical instruments, watches and clocks","exio" +"29683","Romania","RO","Motor vehicles, trailers and semi-trailers","exio" +"29684","Romania","RO","Other transport equipment","exio" +"29685","Romania","RO","Furniture; other manufactured goods n.e.c.","exio" +"29686","Romania","RO","Secondary raw materials","exio" +"29687","Romania","RO","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"29688","Romania","RO","Electricity by coal","exio" +"29689","Romania","RO","Electricity by gas","exio" +"29690","Romania","RO","Electricity by nuclear","exio" +"29691","Romania","RO","Electricity by hydro","exio" +"29692","Romania","RO","Electricity by wind","exio" +"29693","Romania","RO","Electricity by petroleum and other oil derivatives","exio" +"29694","Romania","RO","Electricity by biomass and waste","exio" +"29695","Romania","RO","Electricity by solar photovoltaic","exio" +"29696","Romania","RO","Electricity by solar thermal","exio" +"29697","Romania","RO","Electricity by tide, wave, ocean","exio" +"29698","Romania","RO","Electricity by Geothermal","exio" +"29699","Romania","RO","Electricity nec","exio" +"29700","Romania","RO","Transmission services of electricity","exio" +"29701","Romania","RO","Distribution and trade services of electricity","exio" +"29702","Romania","RO","Coke oven gas","exio" +"29703","Romania","RO","Blast Furnace Gas","exio" +"29704","Romania","RO","Oxygen Steel Furnace Gas","exio" +"29705","Romania","RO","Gas Works Gas","exio" +"29706","Romania","RO","Biogas","exio" +"29707","Romania","RO","Distribution services of gaseous fuels through mains","exio" +"29708","Romania","RO","Steam and hot water supply services","exio" +"29709","Romania","RO","Collected and purified water, distribution services of water","exio" +"29710","Romania","RO","Construction work","exio" +"29711","Romania","RO","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"29712","Romania","RO","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"29713","Romania","RO","Retail trade services of motor fuel","exio" +"29714","Romania","RO","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"29715","Romania","RO","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"29716","Romania","RO","Hotel and restaurant services","exio" +"29717","Romania","RO","Railway transportation services","exio" +"29718","Romania","RO","Other land transportation services","exio" +"29719","Romania","RO","Transportation services via pipelines","exio" +"29720","Romania","RO","Sea and coastal water transportation services","exio" +"29721","Romania","RO","Inland water transportation services","exio" +"29722","Romania","RO","Air transport services","exio" +"29723","Romania","RO","Supporting and auxiliary transport services; travel agency services","exio" +"29724","Romania","RO","Post and telecommunication services","exio" +"29725","Romania","RO","Financial intermediation services, except insurance and pension funding services","exio" +"29726","Romania","RO","Insurance and pension funding services, except compulsory social security services","exio" +"29727","Romania","RO","Services auxiliary to financial intermediation","exio" +"29728","Romania","RO","Real estate services","exio" +"29729","Romania","RO","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"29730","Romania","RO","Computer and related services","exio" +"29731","Romania","RO","Research and development services","exio" +"29732","Romania","RO","Other business services","exio" +"29733","Romania","RO","Public administration and defence services; compulsory social security services","exio" +"29734","Romania","RO","Education services","exio" +"29735","Romania","RO","Health and social work services","exio" +"29736","Romania","RO","Food waste for treatment: incineration","exio" +"29737","Romania","RO","Paper waste for treatment: incineration","exio" +"29738","Romania","RO","Plastic waste for treatment: incineration","exio" +"29739","Romania","RO","Intert/metal waste for treatment: incineration","exio" +"29740","Romania","RO","Textiles waste for treatment: incineration","exio" +"29741","Romania","RO","Wood waste for treatment: incineration","exio" +"29742","Romania","RO","Oil/hazardous waste for treatment: incineration","exio" +"29743","Romania","RO","Food waste for treatment: biogasification and land application","exio" +"29744","Romania","RO","Paper waste for treatment: biogasification and land application","exio" +"29745","Romania","RO","Sewage sludge for treatment: biogasification and land application","exio" +"29746","Romania","RO","Food waste for treatment: composting and land application","exio" +"29747","Romania","RO","Paper and wood waste for treatment: composting and land application","exio" +"29748","Romania","RO","Food waste for treatment: waste water treatment","exio" +"29749","Romania","RO","Other waste for treatment: waste water treatment","exio" +"29750","Romania","RO","Food waste for treatment: landfill","exio" +"29751","Romania","RO","Paper for treatment: landfill","exio" +"29752","Romania","RO","Plastic waste for treatment: landfill","exio" +"29753","Romania","RO","Inert/metal/hazardous waste for treatment: landfill","exio" +"29754","Romania","RO","Textiles waste for treatment: landfill","exio" +"29755","Romania","RO","Wood waste for treatment: landfill","exio" +"29756","Romania","RO","Membership organisation services n.e.c.","exio" +"29757","Romania","RO","Recreational, cultural and sporting services","exio" +"29758","Romania","RO","Other services","exio" +"29759","Romania","RO","Private households with employed persons","exio" +"29760","Romania","RO","Extra-territorial organizations and bodies","exio" +"29761","Sweden","SE","Paddy rice","exio" +"29762","Sweden","SE","Wheat","exio" +"29763","Sweden","SE","Cereal grains nec","exio" +"29764","Sweden","SE","Vegetables, fruit, nuts","exio" +"29765","Sweden","SE","Oil seeds","exio" +"29766","Sweden","SE","Sugar cane, sugar beet","exio" +"29767","Sweden","SE","Plant-based fibers","exio" +"29768","Sweden","SE","Crops nec","exio" +"29769","Sweden","SE","Cattle","exio" +"29770","Sweden","SE","Pigs","exio" +"29771","Sweden","SE","Poultry","exio" +"29772","Sweden","SE","Meat animals nec","exio" +"29773","Sweden","SE","Animal products nec","exio" +"29774","Sweden","SE","Raw milk","exio" +"29775","Sweden","SE","Wool, silk-worm cocoons","exio" +"29776","Sweden","SE","Manure (conventional treatment)","exio" +"29777","Sweden","SE","Manure (biogas treatment)","exio" +"29778","Sweden","SE","Products of forestry, logging and related services","exio" +"29779","Sweden","SE","Fish and other fishing products; services incidental of fishing","exio" +"29780","Sweden","SE","Anthracite","exio" +"29781","Sweden","SE","Coking Coal","exio" +"29782","Sweden","SE","Other Bituminous Coal","exio" +"29783","Sweden","SE","Sub-Bituminous Coal","exio" +"29784","Sweden","SE","Patent Fuel","exio" +"29785","Sweden","SE","Lignite/Brown Coal","exio" +"29786","Sweden","SE","BKB/Peat Briquettes","exio" +"29787","Sweden","SE","Peat","exio" +"29788","Sweden","SE","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"29789","Sweden","SE","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"29790","Sweden","SE","Natural Gas Liquids","exio" +"29791","Sweden","SE","Other Hydrocarbons","exio" +"29792","Sweden","SE","Uranium and thorium ores","exio" +"29793","Sweden","SE","Iron ores","exio" +"29794","Sweden","SE","Copper ores and concentrates","exio" +"29795","Sweden","SE","Nickel ores and concentrates","exio" +"29796","Sweden","SE","Aluminium ores and concentrates","exio" +"29797","Sweden","SE","Precious metal ores and concentrates","exio" +"29798","Sweden","SE","Lead, zinc and tin ores and concentrates","exio" +"29799","Sweden","SE","Other non-ferrous metal ores and concentrates","exio" +"29800","Sweden","SE","Stone","exio" +"29801","Sweden","SE","Sand and clay","exio" +"29802","Sweden","SE","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"29803","Sweden","SE","Products of meat cattle","exio" +"29804","Sweden","SE","Products of meat pigs","exio" +"29805","Sweden","SE","Products of meat poultry","exio" +"29806","Sweden","SE","Meat products nec","exio" +"29807","Sweden","SE","products of Vegetable oils and fats","exio" +"29808","Sweden","SE","Dairy products","exio" +"29809","Sweden","SE","Processed rice","exio" +"29810","Sweden","SE","Sugar","exio" +"29811","Sweden","SE","Food products nec","exio" +"29812","Sweden","SE","Beverages","exio" +"29813","Sweden","SE","Fish products","exio" +"29814","Sweden","SE","Tobacco products","exio" +"29815","Sweden","SE","Textiles","exio" +"29816","Sweden","SE","Wearing apparel; furs","exio" +"29817","Sweden","SE","Leather and leather products","exio" +"29818","Sweden","SE","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"29819","Sweden","SE","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"29820","Sweden","SE","Pulp","exio" +"29821","Sweden","SE","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"29822","Sweden","SE","Paper and paper products","exio" +"29823","Sweden","SE","Printed matter and recorded media","exio" +"29824","Sweden","SE","Coke Oven Coke","exio" +"29825","Sweden","SE","Gas Coke","exio" +"29826","Sweden","SE","Coal Tar","exio" +"29827","Sweden","SE","Motor Gasoline","exio" +"29828","Sweden","SE","Aviation Gasoline","exio" +"29829","Sweden","SE","Gasoline Type Jet Fuel","exio" +"29830","Sweden","SE","Kerosene Type Jet Fuel","exio" +"29831","Sweden","SE","Kerosene","exio" +"29832","Sweden","SE","Gas/Diesel Oil","exio" +"29833","Sweden","SE","Heavy Fuel Oil","exio" +"29834","Sweden","SE","Refinery Gas","exio" +"29835","Sweden","SE","Liquefied Petroleum Gases (LPG)","exio" +"29836","Sweden","SE","Refinery Feedstocks","exio" +"29837","Sweden","SE","Ethane","exio" +"29838","Sweden","SE","Naphtha","exio" +"29839","Sweden","SE","White Spirit & SBP","exio" +"29840","Sweden","SE","Lubricants","exio" +"29841","Sweden","SE","Bitumen","exio" +"29842","Sweden","SE","Paraffin Waxes","exio" +"29843","Sweden","SE","Petroleum Coke","exio" +"29844","Sweden","SE","Non-specified Petroleum Products","exio" +"29845","Sweden","SE","Nuclear fuel","exio" +"29846","Sweden","SE","Plastics, basic","exio" +"29847","Sweden","SE","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"29848","Sweden","SE","N-fertiliser","exio" +"29849","Sweden","SE","P- and other fertiliser","exio" +"29850","Sweden","SE","Chemicals nec","exio" +"29851","Sweden","SE","Charcoal","exio" +"29852","Sweden","SE","Additives/Blending Components","exio" +"29853","Sweden","SE","Biogasoline","exio" +"29854","Sweden","SE","Biodiesels","exio" +"29855","Sweden","SE","Other Liquid Biofuels","exio" +"29856","Sweden","SE","Rubber and plastic products","exio" +"29857","Sweden","SE","Glass and glass products","exio" +"29858","Sweden","SE","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"29859","Sweden","SE","Ceramic goods","exio" +"29860","Sweden","SE","Bricks, tiles and construction products, in baked clay","exio" +"29861","Sweden","SE","Cement, lime and plaster","exio" +"29862","Sweden","SE","Ash for treatment, Re-processing of ash into clinker","exio" +"29863","Sweden","SE","Other non-metallic mineral products","exio" +"29864","Sweden","SE","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"29865","Sweden","SE","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"29866","Sweden","SE","Precious metals","exio" +"29867","Sweden","SE","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"29868","Sweden","SE","Aluminium and aluminium products","exio" +"29869","Sweden","SE","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"29870","Sweden","SE","Lead, zinc and tin and products thereof","exio" +"29871","Sweden","SE","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"29872","Sweden","SE","Copper products","exio" +"29873","Sweden","SE","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"29874","Sweden","SE","Other non-ferrous metal products","exio" +"29875","Sweden","SE","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"29876","Sweden","SE","Foundry work services","exio" +"29877","Sweden","SE","Fabricated metal products, except machinery and equipment","exio" +"29878","Sweden","SE","Machinery and equipment n.e.c.","exio" +"29879","Sweden","SE","Office machinery and computers","exio" +"29880","Sweden","SE","Electrical machinery and apparatus n.e.c.","exio" +"29881","Sweden","SE","Radio, television and communication equipment and apparatus","exio" +"29882","Sweden","SE","Medical, precision and optical instruments, watches and clocks","exio" +"29883","Sweden","SE","Motor vehicles, trailers and semi-trailers","exio" +"29884","Sweden","SE","Other transport equipment","exio" +"29885","Sweden","SE","Furniture; other manufactured goods n.e.c.","exio" +"29886","Sweden","SE","Secondary raw materials","exio" +"29887","Sweden","SE","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"29888","Sweden","SE","Electricity by coal","exio" +"29889","Sweden","SE","Electricity by gas","exio" +"29890","Sweden","SE","Electricity by nuclear","exio" +"29891","Sweden","SE","Electricity by hydro","exio" +"29892","Sweden","SE","Electricity by wind","exio" +"29893","Sweden","SE","Electricity by petroleum and other oil derivatives","exio" +"29894","Sweden","SE","Electricity by biomass and waste","exio" +"29895","Sweden","SE","Electricity by solar photovoltaic","exio" +"29896","Sweden","SE","Electricity by solar thermal","exio" +"29897","Sweden","SE","Electricity by tide, wave, ocean","exio" +"29898","Sweden","SE","Electricity by Geothermal","exio" +"29899","Sweden","SE","Electricity nec","exio" +"29900","Sweden","SE","Transmission services of electricity","exio" +"29901","Sweden","SE","Distribution and trade services of electricity","exio" +"29902","Sweden","SE","Coke oven gas","exio" +"29903","Sweden","SE","Blast Furnace Gas","exio" +"29904","Sweden","SE","Oxygen Steel Furnace Gas","exio" +"29905","Sweden","SE","Gas Works Gas","exio" +"29906","Sweden","SE","Biogas","exio" +"29907","Sweden","SE","Distribution services of gaseous fuels through mains","exio" +"29908","Sweden","SE","Steam and hot water supply services","exio" +"29909","Sweden","SE","Collected and purified water, distribution services of water","exio" +"29910","Sweden","SE","Construction work","exio" +"29911","Sweden","SE","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"29912","Sweden","SE","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"29913","Sweden","SE","Retail trade services of motor fuel","exio" +"29914","Sweden","SE","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"29915","Sweden","SE","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"29916","Sweden","SE","Hotel and restaurant services","exio" +"29917","Sweden","SE","Railway transportation services","exio" +"29918","Sweden","SE","Other land transportation services","exio" +"29919","Sweden","SE","Transportation services via pipelines","exio" +"29920","Sweden","SE","Sea and coastal water transportation services","exio" +"29921","Sweden","SE","Inland water transportation services","exio" +"29922","Sweden","SE","Air transport services","exio" +"29923","Sweden","SE","Supporting and auxiliary transport services; travel agency services","exio" +"29924","Sweden","SE","Post and telecommunication services","exio" +"29925","Sweden","SE","Financial intermediation services, except insurance and pension funding services","exio" +"29926","Sweden","SE","Insurance and pension funding services, except compulsory social security services","exio" +"29927","Sweden","SE","Services auxiliary to financial intermediation","exio" +"29928","Sweden","SE","Real estate services","exio" +"29929","Sweden","SE","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"29930","Sweden","SE","Computer and related services","exio" +"29931","Sweden","SE","Research and development services","exio" +"29932","Sweden","SE","Other business services","exio" +"29933","Sweden","SE","Public administration and defence services; compulsory social security services","exio" +"29934","Sweden","SE","Education services","exio" +"29935","Sweden","SE","Health and social work services","exio" +"29936","Sweden","SE","Food waste for treatment: incineration","exio" +"29937","Sweden","SE","Paper waste for treatment: incineration","exio" +"29938","Sweden","SE","Plastic waste for treatment: incineration","exio" +"29939","Sweden","SE","Intert/metal waste for treatment: incineration","exio" +"29940","Sweden","SE","Textiles waste for treatment: incineration","exio" +"29941","Sweden","SE","Wood waste for treatment: incineration","exio" +"29942","Sweden","SE","Oil/hazardous waste for treatment: incineration","exio" +"29943","Sweden","SE","Food waste for treatment: biogasification and land application","exio" +"29944","Sweden","SE","Paper waste for treatment: biogasification and land application","exio" +"29945","Sweden","SE","Sewage sludge for treatment: biogasification and land application","exio" +"29946","Sweden","SE","Food waste for treatment: composting and land application","exio" +"29947","Sweden","SE","Paper and wood waste for treatment: composting and land application","exio" +"29948","Sweden","SE","Food waste for treatment: waste water treatment","exio" +"29949","Sweden","SE","Other waste for treatment: waste water treatment","exio" +"29950","Sweden","SE","Food waste for treatment: landfill","exio" +"29951","Sweden","SE","Paper for treatment: landfill","exio" +"29952","Sweden","SE","Plastic waste for treatment: landfill","exio" +"29953","Sweden","SE","Inert/metal/hazardous waste for treatment: landfill","exio" +"29954","Sweden","SE","Textiles waste for treatment: landfill","exio" +"29955","Sweden","SE","Wood waste for treatment: landfill","exio" +"29956","Sweden","SE","Membership organisation services n.e.c.","exio" +"29957","Sweden","SE","Recreational, cultural and sporting services","exio" +"29958","Sweden","SE","Other services","exio" +"29959","Sweden","SE","Private households with employed persons","exio" +"29960","Sweden","SE","Extra-territorial organizations and bodies","exio" +"29961","Slovenia","SI","Paddy rice","exio" +"29962","Slovenia","SI","Wheat","exio" +"29963","Slovenia","SI","Cereal grains nec","exio" +"29964","Slovenia","SI","Vegetables, fruit, nuts","exio" +"29965","Slovenia","SI","Oil seeds","exio" +"29966","Slovenia","SI","Sugar cane, sugar beet","exio" +"29967","Slovenia","SI","Plant-based fibers","exio" +"29968","Slovenia","SI","Crops nec","exio" +"29969","Slovenia","SI","Cattle","exio" +"29970","Slovenia","SI","Pigs","exio" +"29971","Slovenia","SI","Poultry","exio" +"29972","Slovenia","SI","Meat animals nec","exio" +"29973","Slovenia","SI","Animal products nec","exio" +"29974","Slovenia","SI","Raw milk","exio" +"29975","Slovenia","SI","Wool, silk-worm cocoons","exio" +"29976","Slovenia","SI","Manure (conventional treatment)","exio" +"29977","Slovenia","SI","Manure (biogas treatment)","exio" +"29978","Slovenia","SI","Products of forestry, logging and related services","exio" +"29979","Slovenia","SI","Fish and other fishing products; services incidental of fishing","exio" +"29980","Slovenia","SI","Anthracite","exio" +"29981","Slovenia","SI","Coking Coal","exio" +"29982","Slovenia","SI","Other Bituminous Coal","exio" +"29983","Slovenia","SI","Sub-Bituminous Coal","exio" +"29984","Slovenia","SI","Patent Fuel","exio" +"29985","Slovenia","SI","Lignite/Brown Coal","exio" +"29986","Slovenia","SI","BKB/Peat Briquettes","exio" +"29987","Slovenia","SI","Peat","exio" +"29988","Slovenia","SI","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"29989","Slovenia","SI","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"29990","Slovenia","SI","Natural Gas Liquids","exio" +"29991","Slovenia","SI","Other Hydrocarbons","exio" +"29992","Slovenia","SI","Uranium and thorium ores","exio" +"29993","Slovenia","SI","Iron ores","exio" +"29994","Slovenia","SI","Copper ores and concentrates","exio" +"29995","Slovenia","SI","Nickel ores and concentrates","exio" +"29996","Slovenia","SI","Aluminium ores and concentrates","exio" +"29997","Slovenia","SI","Precious metal ores and concentrates","exio" +"29998","Slovenia","SI","Lead, zinc and tin ores and concentrates","exio" +"29999","Slovenia","SI","Other non-ferrous metal ores and concentrates","exio" +"30000","Slovenia","SI","Stone","exio" +"30001","Slovenia","SI","Sand and clay","exio" +"30002","Slovenia","SI","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"30003","Slovenia","SI","Products of meat cattle","exio" +"30004","Slovenia","SI","Products of meat pigs","exio" +"30005","Slovenia","SI","Products of meat poultry","exio" +"30006","Slovenia","SI","Meat products nec","exio" +"30007","Slovenia","SI","products of Vegetable oils and fats","exio" +"30008","Slovenia","SI","Dairy products","exio" +"30009","Slovenia","SI","Processed rice","exio" +"30010","Slovenia","SI","Sugar","exio" +"30011","Slovenia","SI","Food products nec","exio" +"30012","Slovenia","SI","Beverages","exio" +"30013","Slovenia","SI","Fish products","exio" +"30014","Slovenia","SI","Tobacco products","exio" +"30015","Slovenia","SI","Textiles","exio" +"30016","Slovenia","SI","Wearing apparel; furs","exio" +"30017","Slovenia","SI","Leather and leather products","exio" +"30018","Slovenia","SI","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"30019","Slovenia","SI","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"30020","Slovenia","SI","Pulp","exio" +"30021","Slovenia","SI","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"30022","Slovenia","SI","Paper and paper products","exio" +"30023","Slovenia","SI","Printed matter and recorded media","exio" +"30024","Slovenia","SI","Coke Oven Coke","exio" +"30025","Slovenia","SI","Gas Coke","exio" +"30026","Slovenia","SI","Coal Tar","exio" +"30027","Slovenia","SI","Motor Gasoline","exio" +"30028","Slovenia","SI","Aviation Gasoline","exio" +"30029","Slovenia","SI","Gasoline Type Jet Fuel","exio" +"30030","Slovenia","SI","Kerosene Type Jet Fuel","exio" +"30031","Slovenia","SI","Kerosene","exio" +"30032","Slovenia","SI","Gas/Diesel Oil","exio" +"30033","Slovenia","SI","Heavy Fuel Oil","exio" +"30034","Slovenia","SI","Refinery Gas","exio" +"30035","Slovenia","SI","Liquefied Petroleum Gases (LPG)","exio" +"30036","Slovenia","SI","Refinery Feedstocks","exio" +"30037","Slovenia","SI","Ethane","exio" +"30038","Slovenia","SI","Naphtha","exio" +"30039","Slovenia","SI","White Spirit & SBP","exio" +"30040","Slovenia","SI","Lubricants","exio" +"30041","Slovenia","SI","Bitumen","exio" +"30042","Slovenia","SI","Paraffin Waxes","exio" +"30043","Slovenia","SI","Petroleum Coke","exio" +"30044","Slovenia","SI","Non-specified Petroleum Products","exio" +"30045","Slovenia","SI","Nuclear fuel","exio" +"30046","Slovenia","SI","Plastics, basic","exio" +"30047","Slovenia","SI","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"30048","Slovenia","SI","N-fertiliser","exio" +"30049","Slovenia","SI","P- and other fertiliser","exio" +"30050","Slovenia","SI","Chemicals nec","exio" +"30051","Slovenia","SI","Charcoal","exio" +"30052","Slovenia","SI","Additives/Blending Components","exio" +"30053","Slovenia","SI","Biogasoline","exio" +"30054","Slovenia","SI","Biodiesels","exio" +"30055","Slovenia","SI","Other Liquid Biofuels","exio" +"30056","Slovenia","SI","Rubber and plastic products","exio" +"30057","Slovenia","SI","Glass and glass products","exio" +"30058","Slovenia","SI","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"30059","Slovenia","SI","Ceramic goods","exio" +"30060","Slovenia","SI","Bricks, tiles and construction products, in baked clay","exio" +"30061","Slovenia","SI","Cement, lime and plaster","exio" +"30062","Slovenia","SI","Ash for treatment, Re-processing of ash into clinker","exio" +"30063","Slovenia","SI","Other non-metallic mineral products","exio" +"30064","Slovenia","SI","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"30065","Slovenia","SI","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"30066","Slovenia","SI","Precious metals","exio" +"30067","Slovenia","SI","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"30068","Slovenia","SI","Aluminium and aluminium products","exio" +"30069","Slovenia","SI","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"30070","Slovenia","SI","Lead, zinc and tin and products thereof","exio" +"30071","Slovenia","SI","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"30072","Slovenia","SI","Copper products","exio" +"30073","Slovenia","SI","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"30074","Slovenia","SI","Other non-ferrous metal products","exio" +"30075","Slovenia","SI","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"30076","Slovenia","SI","Foundry work services","exio" +"30077","Slovenia","SI","Fabricated metal products, except machinery and equipment","exio" +"30078","Slovenia","SI","Machinery and equipment n.e.c.","exio" +"30079","Slovenia","SI","Office machinery and computers","exio" +"30080","Slovenia","SI","Electrical machinery and apparatus n.e.c.","exio" +"30081","Slovenia","SI","Radio, television and communication equipment and apparatus","exio" +"30082","Slovenia","SI","Medical, precision and optical instruments, watches and clocks","exio" +"30083","Slovenia","SI","Motor vehicles, trailers and semi-trailers","exio" +"30084","Slovenia","SI","Other transport equipment","exio" +"30085","Slovenia","SI","Furniture; other manufactured goods n.e.c.","exio" +"30086","Slovenia","SI","Secondary raw materials","exio" +"30087","Slovenia","SI","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"30088","Slovenia","SI","Electricity by coal","exio" +"30089","Slovenia","SI","Electricity by gas","exio" +"30090","Slovenia","SI","Electricity by nuclear","exio" +"30091","Slovenia","SI","Electricity by hydro","exio" +"30092","Slovenia","SI","Electricity by wind","exio" +"30093","Slovenia","SI","Electricity by petroleum and other oil derivatives","exio" +"30094","Slovenia","SI","Electricity by biomass and waste","exio" +"30095","Slovenia","SI","Electricity by solar photovoltaic","exio" +"30096","Slovenia","SI","Electricity by solar thermal","exio" +"30097","Slovenia","SI","Electricity by tide, wave, ocean","exio" +"30098","Slovenia","SI","Electricity by Geothermal","exio" +"30099","Slovenia","SI","Electricity nec","exio" +"30100","Slovenia","SI","Transmission services of electricity","exio" +"30101","Slovenia","SI","Distribution and trade services of electricity","exio" +"30102","Slovenia","SI","Coke oven gas","exio" +"30103","Slovenia","SI","Blast Furnace Gas","exio" +"30104","Slovenia","SI","Oxygen Steel Furnace Gas","exio" +"30105","Slovenia","SI","Gas Works Gas","exio" +"30106","Slovenia","SI","Biogas","exio" +"30107","Slovenia","SI","Distribution services of gaseous fuels through mains","exio" +"30108","Slovenia","SI","Steam and hot water supply services","exio" +"30109","Slovenia","SI","Collected and purified water, distribution services of water","exio" +"30110","Slovenia","SI","Construction work","exio" +"30111","Slovenia","SI","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"30112","Slovenia","SI","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"30113","Slovenia","SI","Retail trade services of motor fuel","exio" +"30114","Slovenia","SI","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"30115","Slovenia","SI","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"30116","Slovenia","SI","Hotel and restaurant services","exio" +"30117","Slovenia","SI","Railway transportation services","exio" +"30118","Slovenia","SI","Other land transportation services","exio" +"30119","Slovenia","SI","Transportation services via pipelines","exio" +"30120","Slovenia","SI","Sea and coastal water transportation services","exio" +"30121","Slovenia","SI","Inland water transportation services","exio" +"30122","Slovenia","SI","Air transport services","exio" +"30123","Slovenia","SI","Supporting and auxiliary transport services; travel agency services","exio" +"30124","Slovenia","SI","Post and telecommunication services","exio" +"30125","Slovenia","SI","Financial intermediation services, except insurance and pension funding services","exio" +"30126","Slovenia","SI","Insurance and pension funding services, except compulsory social security services","exio" +"30127","Slovenia","SI","Services auxiliary to financial intermediation","exio" +"30128","Slovenia","SI","Real estate services","exio" +"30129","Slovenia","SI","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"30130","Slovenia","SI","Computer and related services","exio" +"30131","Slovenia","SI","Research and development services","exio" +"30132","Slovenia","SI","Other business services","exio" +"30133","Slovenia","SI","Public administration and defence services; compulsory social security services","exio" +"30134","Slovenia","SI","Education services","exio" +"30135","Slovenia","SI","Health and social work services","exio" +"30136","Slovenia","SI","Food waste for treatment: incineration","exio" +"30137","Slovenia","SI","Paper waste for treatment: incineration","exio" +"30138","Slovenia","SI","Plastic waste for treatment: incineration","exio" +"30139","Slovenia","SI","Intert/metal waste for treatment: incineration","exio" +"30140","Slovenia","SI","Textiles waste for treatment: incineration","exio" +"30141","Slovenia","SI","Wood waste for treatment: incineration","exio" +"30142","Slovenia","SI","Oil/hazardous waste for treatment: incineration","exio" +"30143","Slovenia","SI","Food waste for treatment: biogasification and land application","exio" +"30144","Slovenia","SI","Paper waste for treatment: biogasification and land application","exio" +"30145","Slovenia","SI","Sewage sludge for treatment: biogasification and land application","exio" +"30146","Slovenia","SI","Food waste for treatment: composting and land application","exio" +"30147","Slovenia","SI","Paper and wood waste for treatment: composting and land application","exio" +"30148","Slovenia","SI","Food waste for treatment: waste water treatment","exio" +"30149","Slovenia","SI","Other waste for treatment: waste water treatment","exio" +"30150","Slovenia","SI","Food waste for treatment: landfill","exio" +"30151","Slovenia","SI","Paper for treatment: landfill","exio" +"30152","Slovenia","SI","Plastic waste for treatment: landfill","exio" +"30153","Slovenia","SI","Inert/metal/hazardous waste for treatment: landfill","exio" +"30154","Slovenia","SI","Textiles waste for treatment: landfill","exio" +"30155","Slovenia","SI","Wood waste for treatment: landfill","exio" +"30156","Slovenia","SI","Membership organisation services n.e.c.","exio" +"30157","Slovenia","SI","Recreational, cultural and sporting services","exio" +"30158","Slovenia","SI","Other services","exio" +"30159","Slovenia","SI","Private households with employed persons","exio" +"30160","Slovenia","SI","Extra-territorial organizations and bodies","exio" +"30161","Slovakia","SK","Paddy rice","exio" +"30162","Slovakia","SK","Wheat","exio" +"30163","Slovakia","SK","Cereal grains nec","exio" +"30164","Slovakia","SK","Vegetables, fruit, nuts","exio" +"30165","Slovakia","SK","Oil seeds","exio" +"30166","Slovakia","SK","Sugar cane, sugar beet","exio" +"30167","Slovakia","SK","Plant-based fibers","exio" +"30168","Slovakia","SK","Crops nec","exio" +"30169","Slovakia","SK","Cattle","exio" +"30170","Slovakia","SK","Pigs","exio" +"30171","Slovakia","SK","Poultry","exio" +"30172","Slovakia","SK","Meat animals nec","exio" +"30173","Slovakia","SK","Animal products nec","exio" +"30174","Slovakia","SK","Raw milk","exio" +"30175","Slovakia","SK","Wool, silk-worm cocoons","exio" +"30176","Slovakia","SK","Manure (conventional treatment)","exio" +"30177","Slovakia","SK","Manure (biogas treatment)","exio" +"30178","Slovakia","SK","Products of forestry, logging and related services","exio" +"30179","Slovakia","SK","Fish and other fishing products; services incidental of fishing","exio" +"30180","Slovakia","SK","Anthracite","exio" +"30181","Slovakia","SK","Coking Coal","exio" +"30182","Slovakia","SK","Other Bituminous Coal","exio" +"30183","Slovakia","SK","Sub-Bituminous Coal","exio" +"30184","Slovakia","SK","Patent Fuel","exio" +"30185","Slovakia","SK","Lignite/Brown Coal","exio" +"30186","Slovakia","SK","BKB/Peat Briquettes","exio" +"30187","Slovakia","SK","Peat","exio" +"30188","Slovakia","SK","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"30189","Slovakia","SK","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"30190","Slovakia","SK","Natural Gas Liquids","exio" +"30191","Slovakia","SK","Other Hydrocarbons","exio" +"30192","Slovakia","SK","Uranium and thorium ores","exio" +"30193","Slovakia","SK","Iron ores","exio" +"30194","Slovakia","SK","Copper ores and concentrates","exio" +"30195","Slovakia","SK","Nickel ores and concentrates","exio" +"30196","Slovakia","SK","Aluminium ores and concentrates","exio" +"30197","Slovakia","SK","Precious metal ores and concentrates","exio" +"30198","Slovakia","SK","Lead, zinc and tin ores and concentrates","exio" +"30199","Slovakia","SK","Other non-ferrous metal ores and concentrates","exio" +"30200","Slovakia","SK","Stone","exio" +"30201","Slovakia","SK","Sand and clay","exio" +"30202","Slovakia","SK","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"30203","Slovakia","SK","Products of meat cattle","exio" +"30204","Slovakia","SK","Products of meat pigs","exio" +"30205","Slovakia","SK","Products of meat poultry","exio" +"30206","Slovakia","SK","Meat products nec","exio" +"30207","Slovakia","SK","products of Vegetable oils and fats","exio" +"30208","Slovakia","SK","Dairy products","exio" +"30209","Slovakia","SK","Processed rice","exio" +"30210","Slovakia","SK","Sugar","exio" +"30211","Slovakia","SK","Food products nec","exio" +"30212","Slovakia","SK","Beverages","exio" +"30213","Slovakia","SK","Fish products","exio" +"30214","Slovakia","SK","Tobacco products","exio" +"30215","Slovakia","SK","Textiles","exio" +"30216","Slovakia","SK","Wearing apparel; furs","exio" +"30217","Slovakia","SK","Leather and leather products","exio" +"30218","Slovakia","SK","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"30219","Slovakia","SK","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"30220","Slovakia","SK","Pulp","exio" +"30221","Slovakia","SK","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"30222","Slovakia","SK","Paper and paper products","exio" +"30223","Slovakia","SK","Printed matter and recorded media","exio" +"30224","Slovakia","SK","Coke Oven Coke","exio" +"30225","Slovakia","SK","Gas Coke","exio" +"30226","Slovakia","SK","Coal Tar","exio" +"30227","Slovakia","SK","Motor Gasoline","exio" +"30228","Slovakia","SK","Aviation Gasoline","exio" +"30229","Slovakia","SK","Gasoline Type Jet Fuel","exio" +"30230","Slovakia","SK","Kerosene Type Jet Fuel","exio" +"30231","Slovakia","SK","Kerosene","exio" +"30232","Slovakia","SK","Gas/Diesel Oil","exio" +"30233","Slovakia","SK","Heavy Fuel Oil","exio" +"30234","Slovakia","SK","Refinery Gas","exio" +"30235","Slovakia","SK","Liquefied Petroleum Gases (LPG)","exio" +"30236","Slovakia","SK","Refinery Feedstocks","exio" +"30237","Slovakia","SK","Ethane","exio" +"30238","Slovakia","SK","Naphtha","exio" +"30239","Slovakia","SK","White Spirit & SBP","exio" +"30240","Slovakia","SK","Lubricants","exio" +"30241","Slovakia","SK","Bitumen","exio" +"30242","Slovakia","SK","Paraffin Waxes","exio" +"30243","Slovakia","SK","Petroleum Coke","exio" +"30244","Slovakia","SK","Non-specified Petroleum Products","exio" +"30245","Slovakia","SK","Nuclear fuel","exio" +"30246","Slovakia","SK","Plastics, basic","exio" +"30247","Slovakia","SK","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"30248","Slovakia","SK","N-fertiliser","exio" +"30249","Slovakia","SK","P- and other fertiliser","exio" +"30250","Slovakia","SK","Chemicals nec","exio" +"30251","Slovakia","SK","Charcoal","exio" +"30252","Slovakia","SK","Additives/Blending Components","exio" +"30253","Slovakia","SK","Biogasoline","exio" +"30254","Slovakia","SK","Biodiesels","exio" +"30255","Slovakia","SK","Other Liquid Biofuels","exio" +"30256","Slovakia","SK","Rubber and plastic products","exio" +"30257","Slovakia","SK","Glass and glass products","exio" +"30258","Slovakia","SK","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"30259","Slovakia","SK","Ceramic goods","exio" +"30260","Slovakia","SK","Bricks, tiles and construction products, in baked clay","exio" +"30261","Slovakia","SK","Cement, lime and plaster","exio" +"30262","Slovakia","SK","Ash for treatment, Re-processing of ash into clinker","exio" +"30263","Slovakia","SK","Other non-metallic mineral products","exio" +"30264","Slovakia","SK","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"30265","Slovakia","SK","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"30266","Slovakia","SK","Precious metals","exio" +"30267","Slovakia","SK","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"30268","Slovakia","SK","Aluminium and aluminium products","exio" +"30269","Slovakia","SK","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"30270","Slovakia","SK","Lead, zinc and tin and products thereof","exio" +"30271","Slovakia","SK","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"30272","Slovakia","SK","Copper products","exio" +"30273","Slovakia","SK","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"30274","Slovakia","SK","Other non-ferrous metal products","exio" +"30275","Slovakia","SK","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"30276","Slovakia","SK","Foundry work services","exio" +"30277","Slovakia","SK","Fabricated metal products, except machinery and equipment","exio" +"30278","Slovakia","SK","Machinery and equipment n.e.c.","exio" +"30279","Slovakia","SK","Office machinery and computers","exio" +"30280","Slovakia","SK","Electrical machinery and apparatus n.e.c.","exio" +"30281","Slovakia","SK","Radio, television and communication equipment and apparatus","exio" +"30282","Slovakia","SK","Medical, precision and optical instruments, watches and clocks","exio" +"30283","Slovakia","SK","Motor vehicles, trailers and semi-trailers","exio" +"30284","Slovakia","SK","Other transport equipment","exio" +"30285","Slovakia","SK","Furniture; other manufactured goods n.e.c.","exio" +"30286","Slovakia","SK","Secondary raw materials","exio" +"30287","Slovakia","SK","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"30288","Slovakia","SK","Electricity by coal","exio" +"30289","Slovakia","SK","Electricity by gas","exio" +"30290","Slovakia","SK","Electricity by nuclear","exio" +"30291","Slovakia","SK","Electricity by hydro","exio" +"30292","Slovakia","SK","Electricity by wind","exio" +"30293","Slovakia","SK","Electricity by petroleum and other oil derivatives","exio" +"30294","Slovakia","SK","Electricity by biomass and waste","exio" +"30295","Slovakia","SK","Electricity by solar photovoltaic","exio" +"30296","Slovakia","SK","Electricity by solar thermal","exio" +"30297","Slovakia","SK","Electricity by tide, wave, ocean","exio" +"30298","Slovakia","SK","Electricity by Geothermal","exio" +"30299","Slovakia","SK","Electricity nec","exio" +"30300","Slovakia","SK","Transmission services of electricity","exio" +"30301","Slovakia","SK","Distribution and trade services of electricity","exio" +"30302","Slovakia","SK","Coke oven gas","exio" +"30303","Slovakia","SK","Blast Furnace Gas","exio" +"30304","Slovakia","SK","Oxygen Steel Furnace Gas","exio" +"30305","Slovakia","SK","Gas Works Gas","exio" +"30306","Slovakia","SK","Biogas","exio" +"30307","Slovakia","SK","Distribution services of gaseous fuels through mains","exio" +"30308","Slovakia","SK","Steam and hot water supply services","exio" +"30309","Slovakia","SK","Collected and purified water, distribution services of water","exio" +"30310","Slovakia","SK","Construction work","exio" +"30311","Slovakia","SK","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"30312","Slovakia","SK","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"30313","Slovakia","SK","Retail trade services of motor fuel","exio" +"30314","Slovakia","SK","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"30315","Slovakia","SK","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"30316","Slovakia","SK","Hotel and restaurant services","exio" +"30317","Slovakia","SK","Railway transportation services","exio" +"30318","Slovakia","SK","Other land transportation services","exio" +"30319","Slovakia","SK","Transportation services via pipelines","exio" +"30320","Slovakia","SK","Sea and coastal water transportation services","exio" +"30321","Slovakia","SK","Inland water transportation services","exio" +"30322","Slovakia","SK","Air transport services","exio" +"30323","Slovakia","SK","Supporting and auxiliary transport services; travel agency services","exio" +"30324","Slovakia","SK","Post and telecommunication services","exio" +"30325","Slovakia","SK","Financial intermediation services, except insurance and pension funding services","exio" +"30326","Slovakia","SK","Insurance and pension funding services, except compulsory social security services","exio" +"30327","Slovakia","SK","Services auxiliary to financial intermediation","exio" +"30328","Slovakia","SK","Real estate services","exio" +"30329","Slovakia","SK","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"30330","Slovakia","SK","Computer and related services","exio" +"30331","Slovakia","SK","Research and development services","exio" +"30332","Slovakia","SK","Other business services","exio" +"30333","Slovakia","SK","Public administration and defence services; compulsory social security services","exio" +"30334","Slovakia","SK","Education services","exio" +"30335","Slovakia","SK","Health and social work services","exio" +"30336","Slovakia","SK","Food waste for treatment: incineration","exio" +"30337","Slovakia","SK","Paper waste for treatment: incineration","exio" +"30338","Slovakia","SK","Plastic waste for treatment: incineration","exio" +"30339","Slovakia","SK","Intert/metal waste for treatment: incineration","exio" +"30340","Slovakia","SK","Textiles waste for treatment: incineration","exio" +"30341","Slovakia","SK","Wood waste for treatment: incineration","exio" +"30342","Slovakia","SK","Oil/hazardous waste for treatment: incineration","exio" +"30343","Slovakia","SK","Food waste for treatment: biogasification and land application","exio" +"30344","Slovakia","SK","Paper waste for treatment: biogasification and land application","exio" +"30345","Slovakia","SK","Sewage sludge for treatment: biogasification and land application","exio" +"30346","Slovakia","SK","Food waste for treatment: composting and land application","exio" +"30347","Slovakia","SK","Paper and wood waste for treatment: composting and land application","exio" +"30348","Slovakia","SK","Food waste for treatment: waste water treatment","exio" +"30349","Slovakia","SK","Other waste for treatment: waste water treatment","exio" +"30350","Slovakia","SK","Food waste for treatment: landfill","exio" +"30351","Slovakia","SK","Paper for treatment: landfill","exio" +"30352","Slovakia","SK","Plastic waste for treatment: landfill","exio" +"30353","Slovakia","SK","Inert/metal/hazardous waste for treatment: landfill","exio" +"30354","Slovakia","SK","Textiles waste for treatment: landfill","exio" +"30355","Slovakia","SK","Wood waste for treatment: landfill","exio" +"30356","Slovakia","SK","Membership organisation services n.e.c.","exio" +"30357","Slovakia","SK","Recreational, cultural and sporting services","exio" +"30358","Slovakia","SK","Other services","exio" +"30359","Slovakia","SK","Private households with employed persons","exio" +"30360","Slovakia","SK","Extra-territorial organizations and bodies","exio" +"30361","United Kingdom","GB","Paddy rice","exio" +"30362","United Kingdom","GB","Wheat","exio" +"30363","United Kingdom","GB","Cereal grains nec","exio" +"30364","United Kingdom","GB","Vegetables, fruit, nuts","exio" +"30365","United Kingdom","GB","Oil seeds","exio" +"30366","United Kingdom","GB","Sugar cane, sugar beet","exio" +"30367","United Kingdom","GB","Plant-based fibers","exio" +"30368","United Kingdom","GB","Crops nec","exio" +"30369","United Kingdom","GB","Cattle","exio" +"30370","United Kingdom","GB","Pigs","exio" +"30371","United Kingdom","GB","Poultry","exio" +"30372","United Kingdom","GB","Meat animals nec","exio" +"30373","United Kingdom","GB","Animal products nec","exio" +"30374","United Kingdom","GB","Raw milk","exio" +"30375","United Kingdom","GB","Wool, silk-worm cocoons","exio" +"30376","United Kingdom","GB","Manure (conventional treatment)","exio" +"30377","United Kingdom","GB","Manure (biogas treatment)","exio" +"30378","United Kingdom","GB","Products of forestry, logging and related services","exio" +"30379","United Kingdom","GB","Fish and other fishing products; services incidental of fishing","exio" +"30380","United Kingdom","GB","Anthracite","exio" +"30381","United Kingdom","GB","Coking Coal","exio" +"30382","United Kingdom","GB","Other Bituminous Coal","exio" +"30383","United Kingdom","GB","Sub-Bituminous Coal","exio" +"30384","United Kingdom","GB","Patent Fuel","exio" +"30385","United Kingdom","GB","Lignite/Brown Coal","exio" +"30386","United Kingdom","GB","BKB/Peat Briquettes","exio" +"30387","United Kingdom","GB","Peat","exio" +"30388","United Kingdom","GB","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"30389","United Kingdom","GB","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"30390","United Kingdom","GB","Natural Gas Liquids","exio" +"30391","United Kingdom","GB","Other Hydrocarbons","exio" +"30392","United Kingdom","GB","Uranium and thorium ores","exio" +"30393","United Kingdom","GB","Iron ores","exio" +"30394","United Kingdom","GB","Copper ores and concentrates","exio" +"30395","United Kingdom","GB","Nickel ores and concentrates","exio" +"30396","United Kingdom","GB","Aluminium ores and concentrates","exio" +"30397","United Kingdom","GB","Precious metal ores and concentrates","exio" +"30398","United Kingdom","GB","Lead, zinc and tin ores and concentrates","exio" +"30399","United Kingdom","GB","Other non-ferrous metal ores and concentrates","exio" +"30400","United Kingdom","GB","Stone","exio" +"30401","United Kingdom","GB","Sand and clay","exio" +"30402","United Kingdom","GB","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"30403","United Kingdom","GB","Products of meat cattle","exio" +"30404","United Kingdom","GB","Products of meat pigs","exio" +"30405","United Kingdom","GB","Products of meat poultry","exio" +"30406","United Kingdom","GB","Meat products nec","exio" +"30407","United Kingdom","GB","products of Vegetable oils and fats","exio" +"30408","United Kingdom","GB","Dairy products","exio" +"30409","United Kingdom","GB","Processed rice","exio" +"30410","United Kingdom","GB","Sugar","exio" +"30411","United Kingdom","GB","Food products nec","exio" +"30412","United Kingdom","GB","Beverages","exio" +"30413","United Kingdom","GB","Fish products","exio" +"30414","United Kingdom","GB","Tobacco products","exio" +"30415","United Kingdom","GB","Textiles","exio" +"30416","United Kingdom","GB","Wearing apparel; furs","exio" +"30417","United Kingdom","GB","Leather and leather products","exio" +"30418","United Kingdom","GB","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"30419","United Kingdom","GB","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"30420","United Kingdom","GB","Pulp","exio" +"30421","United Kingdom","GB","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"30422","United Kingdom","GB","Paper and paper products","exio" +"30423","United Kingdom","GB","Printed matter and recorded media","exio" +"30424","United Kingdom","GB","Coke Oven Coke","exio" +"30425","United Kingdom","GB","Gas Coke","exio" +"30426","United Kingdom","GB","Coal Tar","exio" +"30427","United Kingdom","GB","Motor Gasoline","exio" +"30428","United Kingdom","GB","Aviation Gasoline","exio" +"30429","United Kingdom","GB","Gasoline Type Jet Fuel","exio" +"30430","United Kingdom","GB","Kerosene Type Jet Fuel","exio" +"30431","United Kingdom","GB","Kerosene","exio" +"30432","United Kingdom","GB","Gas/Diesel Oil","exio" +"30433","United Kingdom","GB","Heavy Fuel Oil","exio" +"30434","United Kingdom","GB","Refinery Gas","exio" +"30435","United Kingdom","GB","Liquefied Petroleum Gases (LPG)","exio" +"30436","United Kingdom","GB","Refinery Feedstocks","exio" +"30437","United Kingdom","GB","Ethane","exio" +"30438","United Kingdom","GB","Naphtha","exio" +"30439","United Kingdom","GB","White Spirit & SBP","exio" +"30440","United Kingdom","GB","Lubricants","exio" +"30441","United Kingdom","GB","Bitumen","exio" +"30442","United Kingdom","GB","Paraffin Waxes","exio" +"30443","United Kingdom","GB","Petroleum Coke","exio" +"30444","United Kingdom","GB","Non-specified Petroleum Products","exio" +"30445","United Kingdom","GB","Nuclear fuel","exio" +"30446","United Kingdom","GB","Plastics, basic","exio" +"30447","United Kingdom","GB","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"30448","United Kingdom","GB","N-fertiliser","exio" +"30449","United Kingdom","GB","P- and other fertiliser","exio" +"30450","United Kingdom","GB","Chemicals nec","exio" +"30451","United Kingdom","GB","Charcoal","exio" +"30452","United Kingdom","GB","Additives/Blending Components","exio" +"30453","United Kingdom","GB","Biogasoline","exio" +"30454","United Kingdom","GB","Biodiesels","exio" +"30455","United Kingdom","GB","Other Liquid Biofuels","exio" +"30456","United Kingdom","GB","Rubber and plastic products","exio" +"30457","United Kingdom","GB","Glass and glass products","exio" +"30458","United Kingdom","GB","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"30459","United Kingdom","GB","Ceramic goods","exio" +"30460","United Kingdom","GB","Bricks, tiles and construction products, in baked clay","exio" +"30461","United Kingdom","GB","Cement, lime and plaster","exio" +"30462","United Kingdom","GB","Ash for treatment, Re-processing of ash into clinker","exio" +"30463","United Kingdom","GB","Other non-metallic mineral products","exio" +"30464","United Kingdom","GB","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"30465","United Kingdom","GB","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"30466","United Kingdom","GB","Precious metals","exio" +"30467","United Kingdom","GB","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"30468","United Kingdom","GB","Aluminium and aluminium products","exio" +"30469","United Kingdom","GB","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"30470","United Kingdom","GB","Lead, zinc and tin and products thereof","exio" +"30471","United Kingdom","GB","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"30472","United Kingdom","GB","Copper products","exio" +"30473","United Kingdom","GB","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"30474","United Kingdom","GB","Other non-ferrous metal products","exio" +"30475","United Kingdom","GB","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"30476","United Kingdom","GB","Foundry work services","exio" +"30477","United Kingdom","GB","Fabricated metal products, except machinery and equipment","exio" +"30478","United Kingdom","GB","Machinery and equipment n.e.c.","exio" +"30479","United Kingdom","GB","Office machinery and computers","exio" +"30480","United Kingdom","GB","Electrical machinery and apparatus n.e.c.","exio" +"30481","United Kingdom","GB","Radio, television and communication equipment and apparatus","exio" +"30482","United Kingdom","GB","Medical, precision and optical instruments, watches and clocks","exio" +"30483","United Kingdom","GB","Motor vehicles, trailers and semi-trailers","exio" +"30484","United Kingdom","GB","Other transport equipment","exio" +"30485","United Kingdom","GB","Furniture; other manufactured goods n.e.c.","exio" +"30486","United Kingdom","GB","Secondary raw materials","exio" +"30487","United Kingdom","GB","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"30488","United Kingdom","GB","Electricity by coal","exio" +"30489","United Kingdom","GB","Electricity by gas","exio" +"30490","United Kingdom","GB","Electricity by nuclear","exio" +"30491","United Kingdom","GB","Electricity by hydro","exio" +"30492","United Kingdom","GB","Electricity by wind","exio" +"30493","United Kingdom","GB","Electricity by petroleum and other oil derivatives","exio" +"30494","United Kingdom","GB","Electricity by biomass and waste","exio" +"30495","United Kingdom","GB","Electricity by solar photovoltaic","exio" +"30496","United Kingdom","GB","Electricity by solar thermal","exio" +"30497","United Kingdom","GB","Electricity by tide, wave, ocean","exio" +"30498","United Kingdom","GB","Electricity by Geothermal","exio" +"30499","United Kingdom","GB","Electricity nec","exio" +"30500","United Kingdom","GB","Transmission services of electricity","exio" +"30501","United Kingdom","GB","Distribution and trade services of electricity","exio" +"30502","United Kingdom","GB","Coke oven gas","exio" +"30503","United Kingdom","GB","Blast Furnace Gas","exio" +"30504","United Kingdom","GB","Oxygen Steel Furnace Gas","exio" +"30505","United Kingdom","GB","Gas Works Gas","exio" +"30506","United Kingdom","GB","Biogas","exio" +"30507","United Kingdom","GB","Distribution services of gaseous fuels through mains","exio" +"30508","United Kingdom","GB","Steam and hot water supply services","exio" +"30509","United Kingdom","GB","Collected and purified water, distribution services of water","exio" +"30510","United Kingdom","GB","Construction work","exio" +"30511","United Kingdom","GB","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"30512","United Kingdom","GB","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"30513","United Kingdom","GB","Retail trade services of motor fuel","exio" +"30514","United Kingdom","GB","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"30515","United Kingdom","GB","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"30516","United Kingdom","GB","Hotel and restaurant services","exio" +"30517","United Kingdom","GB","Railway transportation services","exio" +"30518","United Kingdom","GB","Other land transportation services","exio" +"30519","United Kingdom","GB","Transportation services via pipelines","exio" +"30520","United Kingdom","GB","Sea and coastal water transportation services","exio" +"30521","United Kingdom","GB","Inland water transportation services","exio" +"30522","United Kingdom","GB","Air transport services","exio" +"30523","United Kingdom","GB","Supporting and auxiliary transport services; travel agency services","exio" +"30524","United Kingdom","GB","Post and telecommunication services","exio" +"30525","United Kingdom","GB","Financial intermediation services, except insurance and pension funding services","exio" +"30526","United Kingdom","GB","Insurance and pension funding services, except compulsory social security services","exio" +"30527","United Kingdom","GB","Services auxiliary to financial intermediation","exio" +"30528","United Kingdom","GB","Real estate services","exio" +"30529","United Kingdom","GB","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"30530","United Kingdom","GB","Computer and related services","exio" +"30531","United Kingdom","GB","Research and development services","exio" +"30532","United Kingdom","GB","Other business services","exio" +"30533","United Kingdom","GB","Public administration and defence services; compulsory social security services","exio" +"30534","United Kingdom","GB","Education services","exio" +"30535","United Kingdom","GB","Health and social work services","exio" +"30536","United Kingdom","GB","Food waste for treatment: incineration","exio" +"30537","United Kingdom","GB","Paper waste for treatment: incineration","exio" +"30538","United Kingdom","GB","Plastic waste for treatment: incineration","exio" +"30539","United Kingdom","GB","Intert/metal waste for treatment: incineration","exio" +"30540","United Kingdom","GB","Textiles waste for treatment: incineration","exio" +"30541","United Kingdom","GB","Wood waste for treatment: incineration","exio" +"30542","United Kingdom","GB","Oil/hazardous waste for treatment: incineration","exio" +"30543","United Kingdom","GB","Food waste for treatment: biogasification and land application","exio" +"30544","United Kingdom","GB","Paper waste for treatment: biogasification and land application","exio" +"30545","United Kingdom","GB","Sewage sludge for treatment: biogasification and land application","exio" +"30546","United Kingdom","GB","Food waste for treatment: composting and land application","exio" +"30547","United Kingdom","GB","Paper and wood waste for treatment: composting and land application","exio" +"30548","United Kingdom","GB","Food waste for treatment: waste water treatment","exio" +"30549","United Kingdom","GB","Other waste for treatment: waste water treatment","exio" +"30550","United Kingdom","GB","Food waste for treatment: landfill","exio" +"30551","United Kingdom","GB","Paper for treatment: landfill","exio" +"30552","United Kingdom","GB","Plastic waste for treatment: landfill","exio" +"30553","United Kingdom","GB","Inert/metal/hazardous waste for treatment: landfill","exio" +"30554","United Kingdom","GB","Textiles waste for treatment: landfill","exio" +"30555","United Kingdom","GB","Wood waste for treatment: landfill","exio" +"30556","United Kingdom","GB","Membership organisation services n.e.c.","exio" +"30557","United Kingdom","GB","Recreational, cultural and sporting services","exio" +"30558","United Kingdom","GB","Other services","exio" +"30559","United Kingdom","GB","Private households with employed persons","exio" +"30560","United Kingdom","GB","Extra-territorial organizations and bodies","exio" +"30561","United States","US","Paddy rice","exio" +"30562","United States","US","Wheat","exio" +"30563","United States","US","Cereal grains nec","exio" +"30564","United States","US","Vegetables, fruit, nuts","exio" +"30565","United States","US","Oil seeds","exio" +"30566","United States","US","Sugar cane, sugar beet","exio" +"30567","United States","US","Plant-based fibers","exio" +"30568","United States","US","Crops nec","exio" +"30569","United States","US","Cattle","exio" +"30570","United States","US","Pigs","exio" +"30571","United States","US","Poultry","exio" +"30572","United States","US","Meat animals nec","exio" +"30573","United States","US","Animal products nec","exio" +"30574","United States","US","Raw milk","exio" +"30575","United States","US","Wool, silk-worm cocoons","exio" +"30576","United States","US","Manure (conventional treatment)","exio" +"30577","United States","US","Manure (biogas treatment)","exio" +"30578","United States","US","Products of forestry, logging and related services","exio" +"30579","United States","US","Fish and other fishing products; services incidental of fishing","exio" +"30580","United States","US","Anthracite","exio" +"30581","United States","US","Coking Coal","exio" +"30582","United States","US","Other Bituminous Coal","exio" +"30583","United States","US","Sub-Bituminous Coal","exio" +"30584","United States","US","Patent Fuel","exio" +"30585","United States","US","Lignite/Brown Coal","exio" +"30586","United States","US","BKB/Peat Briquettes","exio" +"30587","United States","US","Peat","exio" +"30588","United States","US","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"30589","United States","US","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"30590","United States","US","Natural Gas Liquids","exio" +"30591","United States","US","Other Hydrocarbons","exio" +"30592","United States","US","Uranium and thorium ores","exio" +"30593","United States","US","Iron ores","exio" +"30594","United States","US","Copper ores and concentrates","exio" +"30595","United States","US","Nickel ores and concentrates","exio" +"30596","United States","US","Aluminium ores and concentrates","exio" +"30597","United States","US","Precious metal ores and concentrates","exio" +"30598","United States","US","Lead, zinc and tin ores and concentrates","exio" +"30599","United States","US","Other non-ferrous metal ores and concentrates","exio" +"30600","United States","US","Stone","exio" +"30601","United States","US","Sand and clay","exio" +"30602","United States","US","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"30603","United States","US","Products of meat cattle","exio" +"30604","United States","US","Products of meat pigs","exio" +"30605","United States","US","Products of meat poultry","exio" +"30606","United States","US","Meat products nec","exio" +"30607","United States","US","products of Vegetable oils and fats","exio" +"30608","United States","US","Dairy products","exio" +"30609","United States","US","Processed rice","exio" +"30610","United States","US","Sugar","exio" +"30611","United States","US","Food products nec","exio" +"30612","United States","US","Beverages","exio" +"30613","United States","US","Fish products","exio" +"30614","United States","US","Tobacco products","exio" +"30615","United States","US","Textiles","exio" +"30616","United States","US","Wearing apparel; furs","exio" +"30617","United States","US","Leather and leather products","exio" +"30618","United States","US","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"30619","United States","US","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"30620","United States","US","Pulp","exio" +"30621","United States","US","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"30622","United States","US","Paper and paper products","exio" +"30623","United States","US","Printed matter and recorded media","exio" +"30624","United States","US","Coke Oven Coke","exio" +"30625","United States","US","Gas Coke","exio" +"30626","United States","US","Coal Tar","exio" +"30627","United States","US","Motor Gasoline","exio" +"30628","United States","US","Aviation Gasoline","exio" +"30629","United States","US","Gasoline Type Jet Fuel","exio" +"30630","United States","US","Kerosene Type Jet Fuel","exio" +"30631","United States","US","Kerosene","exio" +"30632","United States","US","Gas/Diesel Oil","exio" +"30633","United States","US","Heavy Fuel Oil","exio" +"30634","United States","US","Refinery Gas","exio" +"30635","United States","US","Liquefied Petroleum Gases (LPG)","exio" +"30636","United States","US","Refinery Feedstocks","exio" +"30637","United States","US","Ethane","exio" +"30638","United States","US","Naphtha","exio" +"30639","United States","US","White Spirit & SBP","exio" +"30640","United States","US","Lubricants","exio" +"30641","United States","US","Bitumen","exio" +"30642","United States","US","Paraffin Waxes","exio" +"30643","United States","US","Petroleum Coke","exio" +"30644","United States","US","Non-specified Petroleum Products","exio" +"30645","United States","US","Nuclear fuel","exio" +"30646","United States","US","Plastics, basic","exio" +"30647","United States","US","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"30648","United States","US","N-fertiliser","exio" +"30649","United States","US","P- and other fertiliser","exio" +"30650","United States","US","Chemicals nec","exio" +"30651","United States","US","Charcoal","exio" +"30652","United States","US","Additives/Blending Components","exio" +"30653","United States","US","Biogasoline","exio" +"30654","United States","US","Biodiesels","exio" +"30655","United States","US","Other Liquid Biofuels","exio" +"30656","United States","US","Rubber and plastic products","exio" +"30657","United States","US","Glass and glass products","exio" +"30658","United States","US","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"30659","United States","US","Ceramic goods","exio" +"30660","United States","US","Bricks, tiles and construction products, in baked clay","exio" +"30661","United States","US","Cement, lime and plaster","exio" +"30662","United States","US","Ash for treatment, Re-processing of ash into clinker","exio" +"30663","United States","US","Other non-metallic mineral products","exio" +"30664","United States","US","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"30665","United States","US","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"30666","United States","US","Precious metals","exio" +"30667","United States","US","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"30668","United States","US","Aluminium and aluminium products","exio" +"30669","United States","US","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"30670","United States","US","Lead, zinc and tin and products thereof","exio" +"30671","United States","US","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"30672","United States","US","Copper products","exio" +"30673","United States","US","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"30674","United States","US","Other non-ferrous metal products","exio" +"30675","United States","US","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"30676","United States","US","Foundry work services","exio" +"30677","United States","US","Fabricated metal products, except machinery and equipment","exio" +"30678","United States","US","Machinery and equipment n.e.c.","exio" +"30679","United States","US","Office machinery and computers","exio" +"30680","United States","US","Electrical machinery and apparatus n.e.c.","exio" +"30681","United States","US","Radio, television and communication equipment and apparatus","exio" +"30682","United States","US","Medical, precision and optical instruments, watches and clocks","exio" +"30683","United States","US","Motor vehicles, trailers and semi-trailers","exio" +"30684","United States","US","Other transport equipment","exio" +"30685","United States","US","Furniture; other manufactured goods n.e.c.","exio" +"30686","United States","US","Secondary raw materials","exio" +"30687","United States","US","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"30688","United States","US","Electricity by coal","exio" +"30689","United States","US","Electricity by gas","exio" +"30690","United States","US","Electricity by nuclear","exio" +"30691","United States","US","Electricity by hydro","exio" +"30692","United States","US","Electricity by wind","exio" +"30693","United States","US","Electricity by petroleum and other oil derivatives","exio" +"30694","United States","US","Electricity by biomass and waste","exio" +"30695","United States","US","Electricity by solar photovoltaic","exio" +"30696","United States","US","Electricity by solar thermal","exio" +"30697","United States","US","Electricity by tide, wave, ocean","exio" +"30698","United States","US","Electricity by Geothermal","exio" +"30699","United States","US","Electricity nec","exio" +"30700","United States","US","Transmission services of electricity","exio" +"30701","United States","US","Distribution and trade services of electricity","exio" +"30702","United States","US","Coke oven gas","exio" +"30703","United States","US","Blast Furnace Gas","exio" +"30704","United States","US","Oxygen Steel Furnace Gas","exio" +"30705","United States","US","Gas Works Gas","exio" +"30706","United States","US","Biogas","exio" +"30707","United States","US","Distribution services of gaseous fuels through mains","exio" +"30708","United States","US","Steam and hot water supply services","exio" +"30709","United States","US","Collected and purified water, distribution services of water","exio" +"30710","United States","US","Construction work","exio" +"30711","United States","US","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"30712","United States","US","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"30713","United States","US","Retail trade services of motor fuel","exio" +"30714","United States","US","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"30715","United States","US","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"30716","United States","US","Hotel and restaurant services","exio" +"30717","United States","US","Railway transportation services","exio" +"30718","United States","US","Other land transportation services","exio" +"30719","United States","US","Transportation services via pipelines","exio" +"30720","United States","US","Sea and coastal water transportation services","exio" +"30721","United States","US","Inland water transportation services","exio" +"30722","United States","US","Air transport services","exio" +"30723","United States","US","Supporting and auxiliary transport services; travel agency services","exio" +"30724","United States","US","Post and telecommunication services","exio" +"30725","United States","US","Financial intermediation services, except insurance and pension funding services","exio" +"30726","United States","US","Insurance and pension funding services, except compulsory social security services","exio" +"30727","United States","US","Services auxiliary to financial intermediation","exio" +"30728","United States","US","Real estate services","exio" +"30729","United States","US","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"30730","United States","US","Computer and related services","exio" +"30731","United States","US","Research and development services","exio" +"30732","United States","US","Other business services","exio" +"30733","United States","US","Public administration and defence services; compulsory social security services","exio" +"30734","United States","US","Education services","exio" +"30735","United States","US","Health and social work services","exio" +"30736","United States","US","Food waste for treatment: incineration","exio" +"30737","United States","US","Paper waste for treatment: incineration","exio" +"30738","United States","US","Plastic waste for treatment: incineration","exio" +"30739","United States","US","Intert/metal waste for treatment: incineration","exio" +"30740","United States","US","Textiles waste for treatment: incineration","exio" +"30741","United States","US","Wood waste for treatment: incineration","exio" +"30742","United States","US","Oil/hazardous waste for treatment: incineration","exio" +"30743","United States","US","Food waste for treatment: biogasification and land application","exio" +"30744","United States","US","Paper waste for treatment: biogasification and land application","exio" +"30745","United States","US","Sewage sludge for treatment: biogasification and land application","exio" +"30746","United States","US","Food waste for treatment: composting and land application","exio" +"30747","United States","US","Paper and wood waste for treatment: composting and land application","exio" +"30748","United States","US","Food waste for treatment: waste water treatment","exio" +"30749","United States","US","Other waste for treatment: waste water treatment","exio" +"30750","United States","US","Food waste for treatment: landfill","exio" +"30751","United States","US","Paper for treatment: landfill","exio" +"30752","United States","US","Plastic waste for treatment: landfill","exio" +"30753","United States","US","Inert/metal/hazardous waste for treatment: landfill","exio" +"30754","United States","US","Textiles waste for treatment: landfill","exio" +"30755","United States","US","Wood waste for treatment: landfill","exio" +"30756","United States","US","Membership organisation services n.e.c.","exio" +"30757","United States","US","Recreational, cultural and sporting services","exio" +"30758","United States","US","Other services","exio" +"30759","United States","US","Private households with employed persons","exio" +"30760","United States","US","Extra-territorial organizations and bodies","exio" +"30761","Japan","JP","Paddy rice","exio" +"30762","Japan","JP","Wheat","exio" +"30763","Japan","JP","Cereal grains nec","exio" +"30764","Japan","JP","Vegetables, fruit, nuts","exio" +"30765","Japan","JP","Oil seeds","exio" +"30766","Japan","JP","Sugar cane, sugar beet","exio" +"30767","Japan","JP","Plant-based fibers","exio" +"30768","Japan","JP","Crops nec","exio" +"30769","Japan","JP","Cattle","exio" +"30770","Japan","JP","Pigs","exio" +"30771","Japan","JP","Poultry","exio" +"30772","Japan","JP","Meat animals nec","exio" +"30773","Japan","JP","Animal products nec","exio" +"30774","Japan","JP","Raw milk","exio" +"30775","Japan","JP","Wool, silk-worm cocoons","exio" +"30776","Japan","JP","Manure (conventional treatment)","exio" +"30777","Japan","JP","Manure (biogas treatment)","exio" +"30778","Japan","JP","Products of forestry, logging and related services","exio" +"30779","Japan","JP","Fish and other fishing products; services incidental of fishing","exio" +"30780","Japan","JP","Anthracite","exio" +"30781","Japan","JP","Coking Coal","exio" +"30782","Japan","JP","Other Bituminous Coal","exio" +"30783","Japan","JP","Sub-Bituminous Coal","exio" +"30784","Japan","JP","Patent Fuel","exio" +"30785","Japan","JP","Lignite/Brown Coal","exio" +"30786","Japan","JP","BKB/Peat Briquettes","exio" +"30787","Japan","JP","Peat","exio" +"30788","Japan","JP","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"30789","Japan","JP","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"30790","Japan","JP","Natural Gas Liquids","exio" +"30791","Japan","JP","Other Hydrocarbons","exio" +"30792","Japan","JP","Uranium and thorium ores","exio" +"30793","Japan","JP","Iron ores","exio" +"30794","Japan","JP","Copper ores and concentrates","exio" +"30795","Japan","JP","Nickel ores and concentrates","exio" +"30796","Japan","JP","Aluminium ores and concentrates","exio" +"30797","Japan","JP","Precious metal ores and concentrates","exio" +"30798","Japan","JP","Lead, zinc and tin ores and concentrates","exio" +"30799","Japan","JP","Other non-ferrous metal ores and concentrates","exio" +"30800","Japan","JP","Stone","exio" +"30801","Japan","JP","Sand and clay","exio" +"30802","Japan","JP","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"30803","Japan","JP","Products of meat cattle","exio" +"30804","Japan","JP","Products of meat pigs","exio" +"30805","Japan","JP","Products of meat poultry","exio" +"30806","Japan","JP","Meat products nec","exio" +"30807","Japan","JP","products of Vegetable oils and fats","exio" +"30808","Japan","JP","Dairy products","exio" +"30809","Japan","JP","Processed rice","exio" +"30810","Japan","JP","Sugar","exio" +"30811","Japan","JP","Food products nec","exio" +"30812","Japan","JP","Beverages","exio" +"30813","Japan","JP","Fish products","exio" +"30814","Japan","JP","Tobacco products","exio" +"30815","Japan","JP","Textiles","exio" +"30816","Japan","JP","Wearing apparel; furs","exio" +"30817","Japan","JP","Leather and leather products","exio" +"30818","Japan","JP","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"30819","Japan","JP","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"30820","Japan","JP","Pulp","exio" +"30821","Japan","JP","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"30822","Japan","JP","Paper and paper products","exio" +"30823","Japan","JP","Printed matter and recorded media","exio" +"30824","Japan","JP","Coke Oven Coke","exio" +"30825","Japan","JP","Gas Coke","exio" +"30826","Japan","JP","Coal Tar","exio" +"30827","Japan","JP","Motor Gasoline","exio" +"30828","Japan","JP","Aviation Gasoline","exio" +"30829","Japan","JP","Gasoline Type Jet Fuel","exio" +"30830","Japan","JP","Kerosene Type Jet Fuel","exio" +"30831","Japan","JP","Kerosene","exio" +"30832","Japan","JP","Gas/Diesel Oil","exio" +"30833","Japan","JP","Heavy Fuel Oil","exio" +"30834","Japan","JP","Refinery Gas","exio" +"30835","Japan","JP","Liquefied Petroleum Gases (LPG)","exio" +"30836","Japan","JP","Refinery Feedstocks","exio" +"30837","Japan","JP","Ethane","exio" +"30838","Japan","JP","Naphtha","exio" +"30839","Japan","JP","White Spirit & SBP","exio" +"30840","Japan","JP","Lubricants","exio" +"30841","Japan","JP","Bitumen","exio" +"30842","Japan","JP","Paraffin Waxes","exio" +"30843","Japan","JP","Petroleum Coke","exio" +"30844","Japan","JP","Non-specified Petroleum Products","exio" +"30845","Japan","JP","Nuclear fuel","exio" +"30846","Japan","JP","Plastics, basic","exio" +"30847","Japan","JP","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"30848","Japan","JP","N-fertiliser","exio" +"30849","Japan","JP","P- and other fertiliser","exio" +"30850","Japan","JP","Chemicals nec","exio" +"30851","Japan","JP","Charcoal","exio" +"30852","Japan","JP","Additives/Blending Components","exio" +"30853","Japan","JP","Biogasoline","exio" +"30854","Japan","JP","Biodiesels","exio" +"30855","Japan","JP","Other Liquid Biofuels","exio" +"30856","Japan","JP","Rubber and plastic products","exio" +"30857","Japan","JP","Glass and glass products","exio" +"30858","Japan","JP","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"30859","Japan","JP","Ceramic goods","exio" +"30860","Japan","JP","Bricks, tiles and construction products, in baked clay","exio" +"30861","Japan","JP","Cement, lime and plaster","exio" +"30862","Japan","JP","Ash for treatment, Re-processing of ash into clinker","exio" +"30863","Japan","JP","Other non-metallic mineral products","exio" +"30864","Japan","JP","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"30865","Japan","JP","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"30866","Japan","JP","Precious metals","exio" +"30867","Japan","JP","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"30868","Japan","JP","Aluminium and aluminium products","exio" +"30869","Japan","JP","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"30870","Japan","JP","Lead, zinc and tin and products thereof","exio" +"30871","Japan","JP","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"30872","Japan","JP","Copper products","exio" +"30873","Japan","JP","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"30874","Japan","JP","Other non-ferrous metal products","exio" +"30875","Japan","JP","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"30876","Japan","JP","Foundry work services","exio" +"30877","Japan","JP","Fabricated metal products, except machinery and equipment","exio" +"30878","Japan","JP","Machinery and equipment n.e.c.","exio" +"30879","Japan","JP","Office machinery and computers","exio" +"30880","Japan","JP","Electrical machinery and apparatus n.e.c.","exio" +"30881","Japan","JP","Radio, television and communication equipment and apparatus","exio" +"30882","Japan","JP","Medical, precision and optical instruments, watches and clocks","exio" +"30883","Japan","JP","Motor vehicles, trailers and semi-trailers","exio" +"30884","Japan","JP","Other transport equipment","exio" +"30885","Japan","JP","Furniture; other manufactured goods n.e.c.","exio" +"30886","Japan","JP","Secondary raw materials","exio" +"30887","Japan","JP","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"30888","Japan","JP","Electricity by coal","exio" +"30889","Japan","JP","Electricity by gas","exio" +"30890","Japan","JP","Electricity by nuclear","exio" +"30891","Japan","JP","Electricity by hydro","exio" +"30892","Japan","JP","Electricity by wind","exio" +"30893","Japan","JP","Electricity by petroleum and other oil derivatives","exio" +"30894","Japan","JP","Electricity by biomass and waste","exio" +"30895","Japan","JP","Electricity by solar photovoltaic","exio" +"30896","Japan","JP","Electricity by solar thermal","exio" +"30897","Japan","JP","Electricity by tide, wave, ocean","exio" +"30898","Japan","JP","Electricity by Geothermal","exio" +"30899","Japan","JP","Electricity nec","exio" +"30900","Japan","JP","Transmission services of electricity","exio" +"30901","Japan","JP","Distribution and trade services of electricity","exio" +"30902","Japan","JP","Coke oven gas","exio" +"30903","Japan","JP","Blast Furnace Gas","exio" +"30904","Japan","JP","Oxygen Steel Furnace Gas","exio" +"30905","Japan","JP","Gas Works Gas","exio" +"30906","Japan","JP","Biogas","exio" +"30907","Japan","JP","Distribution services of gaseous fuels through mains","exio" +"30908","Japan","JP","Steam and hot water supply services","exio" +"30909","Japan","JP","Collected and purified water, distribution services of water","exio" +"30910","Japan","JP","Construction work","exio" +"30911","Japan","JP","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"30912","Japan","JP","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"30913","Japan","JP","Retail trade services of motor fuel","exio" +"30914","Japan","JP","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"30915","Japan","JP","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"30916","Japan","JP","Hotel and restaurant services","exio" +"30917","Japan","JP","Railway transportation services","exio" +"30918","Japan","JP","Other land transportation services","exio" +"30919","Japan","JP","Transportation services via pipelines","exio" +"30920","Japan","JP","Sea and coastal water transportation services","exio" +"30921","Japan","JP","Inland water transportation services","exio" +"30922","Japan","JP","Air transport services","exio" +"30923","Japan","JP","Supporting and auxiliary transport services; travel agency services","exio" +"30924","Japan","JP","Post and telecommunication services","exio" +"30925","Japan","JP","Financial intermediation services, except insurance and pension funding services","exio" +"30926","Japan","JP","Insurance and pension funding services, except compulsory social security services","exio" +"30927","Japan","JP","Services auxiliary to financial intermediation","exio" +"30928","Japan","JP","Real estate services","exio" +"30929","Japan","JP","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"30930","Japan","JP","Computer and related services","exio" +"30931","Japan","JP","Research and development services","exio" +"30932","Japan","JP","Other business services","exio" +"30933","Japan","JP","Public administration and defence services; compulsory social security services","exio" +"30934","Japan","JP","Education services","exio" +"30935","Japan","JP","Health and social work services","exio" +"30936","Japan","JP","Food waste for treatment: incineration","exio" +"30937","Japan","JP","Paper waste for treatment: incineration","exio" +"30938","Japan","JP","Plastic waste for treatment: incineration","exio" +"30939","Japan","JP","Intert/metal waste for treatment: incineration","exio" +"30940","Japan","JP","Textiles waste for treatment: incineration","exio" +"30941","Japan","JP","Wood waste for treatment: incineration","exio" +"30942","Japan","JP","Oil/hazardous waste for treatment: incineration","exio" +"30943","Japan","JP","Food waste for treatment: biogasification and land application","exio" +"30944","Japan","JP","Paper waste for treatment: biogasification and land application","exio" +"30945","Japan","JP","Sewage sludge for treatment: biogasification and land application","exio" +"30946","Japan","JP","Food waste for treatment: composting and land application","exio" +"30947","Japan","JP","Paper and wood waste for treatment: composting and land application","exio" +"30948","Japan","JP","Food waste for treatment: waste water treatment","exio" +"30949","Japan","JP","Other waste for treatment: waste water treatment","exio" +"30950","Japan","JP","Food waste for treatment: landfill","exio" +"30951","Japan","JP","Paper for treatment: landfill","exio" +"30952","Japan","JP","Plastic waste for treatment: landfill","exio" +"30953","Japan","JP","Inert/metal/hazardous waste for treatment: landfill","exio" +"30954","Japan","JP","Textiles waste for treatment: landfill","exio" +"30955","Japan","JP","Wood waste for treatment: landfill","exio" +"30956","Japan","JP","Membership organisation services n.e.c.","exio" +"30957","Japan","JP","Recreational, cultural and sporting services","exio" +"30958","Japan","JP","Other services","exio" +"30959","Japan","JP","Private households with employed persons","exio" +"30960","Japan","JP","Extra-territorial organizations and bodies","exio" +"30961","China","CN","Paddy rice","exio" +"30962","China","CN","Wheat","exio" +"30963","China","CN","Cereal grains nec","exio" +"30964","China","CN","Vegetables, fruit, nuts","exio" +"30965","China","CN","Oil seeds","exio" +"30966","China","CN","Sugar cane, sugar beet","exio" +"30967","China","CN","Plant-based fibers","exio" +"30968","China","CN","Crops nec","exio" +"30969","China","CN","Cattle","exio" +"30970","China","CN","Pigs","exio" +"30971","China","CN","Poultry","exio" +"30972","China","CN","Meat animals nec","exio" +"30973","China","CN","Animal products nec","exio" +"30974","China","CN","Raw milk","exio" +"30975","China","CN","Wool, silk-worm cocoons","exio" +"30976","China","CN","Manure (conventional treatment)","exio" +"30977","China","CN","Manure (biogas treatment)","exio" +"30978","China","CN","Products of forestry, logging and related services","exio" +"30979","China","CN","Fish and other fishing products; services incidental of fishing","exio" +"30980","China","CN","Anthracite","exio" +"30981","China","CN","Coking Coal","exio" +"30982","China","CN","Other Bituminous Coal","exio" +"30983","China","CN","Sub-Bituminous Coal","exio" +"30984","China","CN","Patent Fuel","exio" +"30985","China","CN","Lignite/Brown Coal","exio" +"30986","China","CN","BKB/Peat Briquettes","exio" +"30987","China","CN","Peat","exio" +"30988","China","CN","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"30989","China","CN","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"30990","China","CN","Natural Gas Liquids","exio" +"30991","China","CN","Other Hydrocarbons","exio" +"30992","China","CN","Uranium and thorium ores","exio" +"30993","China","CN","Iron ores","exio" +"30994","China","CN","Copper ores and concentrates","exio" +"30995","China","CN","Nickel ores and concentrates","exio" +"30996","China","CN","Aluminium ores and concentrates","exio" +"30997","China","CN","Precious metal ores and concentrates","exio" +"30998","China","CN","Lead, zinc and tin ores and concentrates","exio" +"30999","China","CN","Other non-ferrous metal ores and concentrates","exio" +"31000","China","CN","Stone","exio" +"31001","China","CN","Sand and clay","exio" +"31002","China","CN","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"31003","China","CN","Products of meat cattle","exio" +"31004","China","CN","Products of meat pigs","exio" +"31005","China","CN","Products of meat poultry","exio" +"31006","China","CN","Meat products nec","exio" +"31007","China","CN","products of Vegetable oils and fats","exio" +"31008","China","CN","Dairy products","exio" +"31009","China","CN","Processed rice","exio" +"31010","China","CN","Sugar","exio" +"31011","China","CN","Food products nec","exio" +"31012","China","CN","Beverages","exio" +"31013","China","CN","Fish products","exio" +"31014","China","CN","Tobacco products","exio" +"31015","China","CN","Textiles","exio" +"31016","China","CN","Wearing apparel; furs","exio" +"31017","China","CN","Leather and leather products","exio" +"31018","China","CN","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"31019","China","CN","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"31020","China","CN","Pulp","exio" +"31021","China","CN","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"31022","China","CN","Paper and paper products","exio" +"31023","China","CN","Printed matter and recorded media","exio" +"31024","China","CN","Coke Oven Coke","exio" +"31025","China","CN","Gas Coke","exio" +"31026","China","CN","Coal Tar","exio" +"31027","China","CN","Motor Gasoline","exio" +"31028","China","CN","Aviation Gasoline","exio" +"31029","China","CN","Gasoline Type Jet Fuel","exio" +"31030","China","CN","Kerosene Type Jet Fuel","exio" +"31031","China","CN","Kerosene","exio" +"31032","China","CN","Gas/Diesel Oil","exio" +"31033","China","CN","Heavy Fuel Oil","exio" +"31034","China","CN","Refinery Gas","exio" +"31035","China","CN","Liquefied Petroleum Gases (LPG)","exio" +"31036","China","CN","Refinery Feedstocks","exio" +"31037","China","CN","Ethane","exio" +"31038","China","CN","Naphtha","exio" +"31039","China","CN","White Spirit & SBP","exio" +"31040","China","CN","Lubricants","exio" +"31041","China","CN","Bitumen","exio" +"31042","China","CN","Paraffin Waxes","exio" +"31043","China","CN","Petroleum Coke","exio" +"31044","China","CN","Non-specified Petroleum Products","exio" +"31045","China","CN","Nuclear fuel","exio" +"31046","China","CN","Plastics, basic","exio" +"31047","China","CN","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"31048","China","CN","N-fertiliser","exio" +"31049","China","CN","P- and other fertiliser","exio" +"31050","China","CN","Chemicals nec","exio" +"31051","China","CN","Charcoal","exio" +"31052","China","CN","Additives/Blending Components","exio" +"31053","China","CN","Biogasoline","exio" +"31054","China","CN","Biodiesels","exio" +"31055","China","CN","Other Liquid Biofuels","exio" +"31056","China","CN","Rubber and plastic products","exio" +"31057","China","CN","Glass and glass products","exio" +"31058","China","CN","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"31059","China","CN","Ceramic goods","exio" +"31060","China","CN","Bricks, tiles and construction products, in baked clay","exio" +"31061","China","CN","Cement, lime and plaster","exio" +"31062","China","CN","Ash for treatment, Re-processing of ash into clinker","exio" +"31063","China","CN","Other non-metallic mineral products","exio" +"31064","China","CN","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"31065","China","CN","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"31066","China","CN","Precious metals","exio" +"31067","China","CN","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"31068","China","CN","Aluminium and aluminium products","exio" +"31069","China","CN","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"31070","China","CN","Lead, zinc and tin and products thereof","exio" +"31071","China","CN","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"31072","China","CN","Copper products","exio" +"31073","China","CN","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"31074","China","CN","Other non-ferrous metal products","exio" +"31075","China","CN","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"31076","China","CN","Foundry work services","exio" +"31077","China","CN","Fabricated metal products, except machinery and equipment","exio" +"31078","China","CN","Machinery and equipment n.e.c.","exio" +"31079","China","CN","Office machinery and computers","exio" +"31080","China","CN","Electrical machinery and apparatus n.e.c.","exio" +"31081","China","CN","Radio, television and communication equipment and apparatus","exio" +"31082","China","CN","Medical, precision and optical instruments, watches and clocks","exio" +"31083","China","CN","Motor vehicles, trailers and semi-trailers","exio" +"31084","China","CN","Other transport equipment","exio" +"31085","China","CN","Furniture; other manufactured goods n.e.c.","exio" +"31086","China","CN","Secondary raw materials","exio" +"31087","China","CN","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"31088","China","CN","Electricity by coal","exio" +"31089","China","CN","Electricity by gas","exio" +"31090","China","CN","Electricity by nuclear","exio" +"31091","China","CN","Electricity by hydro","exio" +"31092","China","CN","Electricity by wind","exio" +"31093","China","CN","Electricity by petroleum and other oil derivatives","exio" +"31094","China","CN","Electricity by biomass and waste","exio" +"31095","China","CN","Electricity by solar photovoltaic","exio" +"31096","China","CN","Electricity by solar thermal","exio" +"31097","China","CN","Electricity by tide, wave, ocean","exio" +"31098","China","CN","Electricity by Geothermal","exio" +"31099","China","CN","Electricity nec","exio" +"31100","China","CN","Transmission services of electricity","exio" +"31101","China","CN","Distribution and trade services of electricity","exio" +"31102","China","CN","Coke oven gas","exio" +"31103","China","CN","Blast Furnace Gas","exio" +"31104","China","CN","Oxygen Steel Furnace Gas","exio" +"31105","China","CN","Gas Works Gas","exio" +"31106","China","CN","Biogas","exio" +"31107","China","CN","Distribution services of gaseous fuels through mains","exio" +"31108","China","CN","Steam and hot water supply services","exio" +"31109","China","CN","Collected and purified water, distribution services of water","exio" +"31110","China","CN","Construction work","exio" +"31111","China","CN","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"31112","China","CN","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"31113","China","CN","Retail trade services of motor fuel","exio" +"31114","China","CN","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"31115","China","CN","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"31116","China","CN","Hotel and restaurant services","exio" +"31117","China","CN","Railway transportation services","exio" +"31118","China","CN","Other land transportation services","exio" +"31119","China","CN","Transportation services via pipelines","exio" +"31120","China","CN","Sea and coastal water transportation services","exio" +"31121","China","CN","Inland water transportation services","exio" +"31122","China","CN","Air transport services","exio" +"31123","China","CN","Supporting and auxiliary transport services; travel agency services","exio" +"31124","China","CN","Post and telecommunication services","exio" +"31125","China","CN","Financial intermediation services, except insurance and pension funding services","exio" +"31126","China","CN","Insurance and pension funding services, except compulsory social security services","exio" +"31127","China","CN","Services auxiliary to financial intermediation","exio" +"31128","China","CN","Real estate services","exio" +"31129","China","CN","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"31130","China","CN","Computer and related services","exio" +"31131","China","CN","Research and development services","exio" +"31132","China","CN","Other business services","exio" +"31133","China","CN","Public administration and defence services; compulsory social security services","exio" +"31134","China","CN","Education services","exio" +"31135","China","CN","Health and social work services","exio" +"31136","China","CN","Food waste for treatment: incineration","exio" +"31137","China","CN","Paper waste for treatment: incineration","exio" +"31138","China","CN","Plastic waste for treatment: incineration","exio" +"31139","China","CN","Intert/metal waste for treatment: incineration","exio" +"31140","China","CN","Textiles waste for treatment: incineration","exio" +"31141","China","CN","Wood waste for treatment: incineration","exio" +"31142","China","CN","Oil/hazardous waste for treatment: incineration","exio" +"31143","China","CN","Food waste for treatment: biogasification and land application","exio" +"31144","China","CN","Paper waste for treatment: biogasification and land application","exio" +"31145","China","CN","Sewage sludge for treatment: biogasification and land application","exio" +"31146","China","CN","Food waste for treatment: composting and land application","exio" +"31147","China","CN","Paper and wood waste for treatment: composting and land application","exio" +"31148","China","CN","Food waste for treatment: waste water treatment","exio" +"31149","China","CN","Other waste for treatment: waste water treatment","exio" +"31150","China","CN","Food waste for treatment: landfill","exio" +"31151","China","CN","Paper for treatment: landfill","exio" +"31152","China","CN","Plastic waste for treatment: landfill","exio" +"31153","China","CN","Inert/metal/hazardous waste for treatment: landfill","exio" +"31154","China","CN","Textiles waste for treatment: landfill","exio" +"31155","China","CN","Wood waste for treatment: landfill","exio" +"31156","China","CN","Membership organisation services n.e.c.","exio" +"31157","China","CN","Recreational, cultural and sporting services","exio" +"31158","China","CN","Other services","exio" +"31159","China","CN","Private households with employed persons","exio" +"31160","China","CN","Extra-territorial organizations and bodies","exio" +"31161","Canada","CA","Paddy rice","exio" +"31162","Canada","CA","Wheat","exio" +"31163","Canada","CA","Cereal grains nec","exio" +"31164","Canada","CA","Vegetables, fruit, nuts","exio" +"31165","Canada","CA","Oil seeds","exio" +"31166","Canada","CA","Sugar cane, sugar beet","exio" +"31167","Canada","CA","Plant-based fibers","exio" +"31168","Canada","CA","Crops nec","exio" +"31169","Canada","CA","Cattle","exio" +"31170","Canada","CA","Pigs","exio" +"31171","Canada","CA","Poultry","exio" +"31172","Canada","CA","Meat animals nec","exio" +"31173","Canada","CA","Animal products nec","exio" +"31174","Canada","CA","Raw milk","exio" +"31175","Canada","CA","Wool, silk-worm cocoons","exio" +"31176","Canada","CA","Manure (conventional treatment)","exio" +"31177","Canada","CA","Manure (biogas treatment)","exio" +"31178","Canada","CA","Products of forestry, logging and related services","exio" +"31179","Canada","CA","Fish and other fishing products; services incidental of fishing","exio" +"31180","Canada","CA","Anthracite","exio" +"31181","Canada","CA","Coking Coal","exio" +"31182","Canada","CA","Other Bituminous Coal","exio" +"31183","Canada","CA","Sub-Bituminous Coal","exio" +"31184","Canada","CA","Patent Fuel","exio" +"31185","Canada","CA","Lignite/Brown Coal","exio" +"31186","Canada","CA","BKB/Peat Briquettes","exio" +"31187","Canada","CA","Peat","exio" +"31188","Canada","CA","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"31189","Canada","CA","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"31190","Canada","CA","Natural Gas Liquids","exio" +"31191","Canada","CA","Other Hydrocarbons","exio" +"31192","Canada","CA","Uranium and thorium ores","exio" +"31193","Canada","CA","Iron ores","exio" +"31194","Canada","CA","Copper ores and concentrates","exio" +"31195","Canada","CA","Nickel ores and concentrates","exio" +"31196","Canada","CA","Aluminium ores and concentrates","exio" +"31197","Canada","CA","Precious metal ores and concentrates","exio" +"31198","Canada","CA","Lead, zinc and tin ores and concentrates","exio" +"31199","Canada","CA","Other non-ferrous metal ores and concentrates","exio" +"31200","Canada","CA","Stone","exio" +"31201","Canada","CA","Sand and clay","exio" +"31202","Canada","CA","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"31203","Canada","CA","Products of meat cattle","exio" +"31204","Canada","CA","Products of meat pigs","exio" +"31205","Canada","CA","Products of meat poultry","exio" +"31206","Canada","CA","Meat products nec","exio" +"31207","Canada","CA","products of Vegetable oils and fats","exio" +"31208","Canada","CA","Dairy products","exio" +"31209","Canada","CA","Processed rice","exio" +"31210","Canada","CA","Sugar","exio" +"31211","Canada","CA","Food products nec","exio" +"31212","Canada","CA","Beverages","exio" +"31213","Canada","CA","Fish products","exio" +"31214","Canada","CA","Tobacco products","exio" +"31215","Canada","CA","Textiles","exio" +"31216","Canada","CA","Wearing apparel; furs","exio" +"31217","Canada","CA","Leather and leather products","exio" +"31218","Canada","CA","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"31219","Canada","CA","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"31220","Canada","CA","Pulp","exio" +"31221","Canada","CA","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"31222","Canada","CA","Paper and paper products","exio" +"31223","Canada","CA","Printed matter and recorded media","exio" +"31224","Canada","CA","Coke Oven Coke","exio" +"31225","Canada","CA","Gas Coke","exio" +"31226","Canada","CA","Coal Tar","exio" +"31227","Canada","CA","Motor Gasoline","exio" +"31228","Canada","CA","Aviation Gasoline","exio" +"31229","Canada","CA","Gasoline Type Jet Fuel","exio" +"31230","Canada","CA","Kerosene Type Jet Fuel","exio" +"31231","Canada","CA","Kerosene","exio" +"31232","Canada","CA","Gas/Diesel Oil","exio" +"31233","Canada","CA","Heavy Fuel Oil","exio" +"31234","Canada","CA","Refinery Gas","exio" +"31235","Canada","CA","Liquefied Petroleum Gases (LPG)","exio" +"31236","Canada","CA","Refinery Feedstocks","exio" +"31237","Canada","CA","Ethane","exio" +"31238","Canada","CA","Naphtha","exio" +"31239","Canada","CA","White Spirit & SBP","exio" +"31240","Canada","CA","Lubricants","exio" +"31241","Canada","CA","Bitumen","exio" +"31242","Canada","CA","Paraffin Waxes","exio" +"31243","Canada","CA","Petroleum Coke","exio" +"31244","Canada","CA","Non-specified Petroleum Products","exio" +"31245","Canada","CA","Nuclear fuel","exio" +"31246","Canada","CA","Plastics, basic","exio" +"31247","Canada","CA","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"31248","Canada","CA","N-fertiliser","exio" +"31249","Canada","CA","P- and other fertiliser","exio" +"31250","Canada","CA","Chemicals nec","exio" +"31251","Canada","CA","Charcoal","exio" +"31252","Canada","CA","Additives/Blending Components","exio" +"31253","Canada","CA","Biogasoline","exio" +"31254","Canada","CA","Biodiesels","exio" +"31255","Canada","CA","Other Liquid Biofuels","exio" +"31256","Canada","CA","Rubber and plastic products","exio" +"31257","Canada","CA","Glass and glass products","exio" +"31258","Canada","CA","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"31259","Canada","CA","Ceramic goods","exio" +"31260","Canada","CA","Bricks, tiles and construction products, in baked clay","exio" +"31261","Canada","CA","Cement, lime and plaster","exio" +"31262","Canada","CA","Ash for treatment, Re-processing of ash into clinker","exio" +"31263","Canada","CA","Other non-metallic mineral products","exio" +"31264","Canada","CA","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"31265","Canada","CA","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"31266","Canada","CA","Precious metals","exio" +"31267","Canada","CA","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"31268","Canada","CA","Aluminium and aluminium products","exio" +"31269","Canada","CA","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"31270","Canada","CA","Lead, zinc and tin and products thereof","exio" +"31271","Canada","CA","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"31272","Canada","CA","Copper products","exio" +"31273","Canada","CA","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"31274","Canada","CA","Other non-ferrous metal products","exio" +"31275","Canada","CA","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"31276","Canada","CA","Foundry work services","exio" +"31277","Canada","CA","Fabricated metal products, except machinery and equipment","exio" +"31278","Canada","CA","Machinery and equipment n.e.c.","exio" +"31279","Canada","CA","Office machinery and computers","exio" +"31280","Canada","CA","Electrical machinery and apparatus n.e.c.","exio" +"31281","Canada","CA","Radio, television and communication equipment and apparatus","exio" +"31282","Canada","CA","Medical, precision and optical instruments, watches and clocks","exio" +"31283","Canada","CA","Motor vehicles, trailers and semi-trailers","exio" +"31284","Canada","CA","Other transport equipment","exio" +"31285","Canada","CA","Furniture; other manufactured goods n.e.c.","exio" +"31286","Canada","CA","Secondary raw materials","exio" +"31287","Canada","CA","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"31288","Canada","CA","Electricity by coal","exio" +"31289","Canada","CA","Electricity by gas","exio" +"31290","Canada","CA","Electricity by nuclear","exio" +"31291","Canada","CA","Electricity by hydro","exio" +"31292","Canada","CA","Electricity by wind","exio" +"31293","Canada","CA","Electricity by petroleum and other oil derivatives","exio" +"31294","Canada","CA","Electricity by biomass and waste","exio" +"31295","Canada","CA","Electricity by solar photovoltaic","exio" +"31296","Canada","CA","Electricity by solar thermal","exio" +"31297","Canada","CA","Electricity by tide, wave, ocean","exio" +"31298","Canada","CA","Electricity by Geothermal","exio" +"31299","Canada","CA","Electricity nec","exio" +"31300","Canada","CA","Transmission services of electricity","exio" +"31301","Canada","CA","Distribution and trade services of electricity","exio" +"31302","Canada","CA","Coke oven gas","exio" +"31303","Canada","CA","Blast Furnace Gas","exio" +"31304","Canada","CA","Oxygen Steel Furnace Gas","exio" +"31305","Canada","CA","Gas Works Gas","exio" +"31306","Canada","CA","Biogas","exio" +"31307","Canada","CA","Distribution services of gaseous fuels through mains","exio" +"31308","Canada","CA","Steam and hot water supply services","exio" +"31309","Canada","CA","Collected and purified water, distribution services of water","exio" +"31310","Canada","CA","Construction work","exio" +"31311","Canada","CA","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"31312","Canada","CA","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"31313","Canada","CA","Retail trade services of motor fuel","exio" +"31314","Canada","CA","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"31315","Canada","CA","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"31316","Canada","CA","Hotel and restaurant services","exio" +"31317","Canada","CA","Railway transportation services","exio" +"31318","Canada","CA","Other land transportation services","exio" +"31319","Canada","CA","Transportation services via pipelines","exio" +"31320","Canada","CA","Sea and coastal water transportation services","exio" +"31321","Canada","CA","Inland water transportation services","exio" +"31322","Canada","CA","Air transport services","exio" +"31323","Canada","CA","Supporting and auxiliary transport services; travel agency services","exio" +"31324","Canada","CA","Post and telecommunication services","exio" +"31325","Canada","CA","Financial intermediation services, except insurance and pension funding services","exio" +"31326","Canada","CA","Insurance and pension funding services, except compulsory social security services","exio" +"31327","Canada","CA","Services auxiliary to financial intermediation","exio" +"31328","Canada","CA","Real estate services","exio" +"31329","Canada","CA","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"31330","Canada","CA","Computer and related services","exio" +"31331","Canada","CA","Research and development services","exio" +"31332","Canada","CA","Other business services","exio" +"31333","Canada","CA","Public administration and defence services; compulsory social security services","exio" +"31334","Canada","CA","Education services","exio" +"31335","Canada","CA","Health and social work services","exio" +"31336","Canada","CA","Food waste for treatment: incineration","exio" +"31337","Canada","CA","Paper waste for treatment: incineration","exio" +"31338","Canada","CA","Plastic waste for treatment: incineration","exio" +"31339","Canada","CA","Intert/metal waste for treatment: incineration","exio" +"31340","Canada","CA","Textiles waste for treatment: incineration","exio" +"31341","Canada","CA","Wood waste for treatment: incineration","exio" +"31342","Canada","CA","Oil/hazardous waste for treatment: incineration","exio" +"31343","Canada","CA","Food waste for treatment: biogasification and land application","exio" +"31344","Canada","CA","Paper waste for treatment: biogasification and land application","exio" +"31345","Canada","CA","Sewage sludge for treatment: biogasification and land application","exio" +"31346","Canada","CA","Food waste for treatment: composting and land application","exio" +"31347","Canada","CA","Paper and wood waste for treatment: composting and land application","exio" +"31348","Canada","CA","Food waste for treatment: waste water treatment","exio" +"31349","Canada","CA","Other waste for treatment: waste water treatment","exio" +"31350","Canada","CA","Food waste for treatment: landfill","exio" +"31351","Canada","CA","Paper for treatment: landfill","exio" +"31352","Canada","CA","Plastic waste for treatment: landfill","exio" +"31353","Canada","CA","Inert/metal/hazardous waste for treatment: landfill","exio" +"31354","Canada","CA","Textiles waste for treatment: landfill","exio" +"31355","Canada","CA","Wood waste for treatment: landfill","exio" +"31356","Canada","CA","Membership organisation services n.e.c.","exio" +"31357","Canada","CA","Recreational, cultural and sporting services","exio" +"31358","Canada","CA","Other services","exio" +"31359","Canada","CA","Private households with employed persons","exio" +"31360","Canada","CA","Extra-territorial organizations and bodies","exio" +"31361","South Korea","KR","Paddy rice","exio" +"31362","South Korea","KR","Wheat","exio" +"31363","South Korea","KR","Cereal grains nec","exio" +"31364","South Korea","KR","Vegetables, fruit, nuts","exio" +"31365","South Korea","KR","Oil seeds","exio" +"31366","South Korea","KR","Sugar cane, sugar beet","exio" +"31367","South Korea","KR","Plant-based fibers","exio" +"31368","South Korea","KR","Crops nec","exio" +"31369","South Korea","KR","Cattle","exio" +"31370","South Korea","KR","Pigs","exio" +"31371","South Korea","KR","Poultry","exio" +"31372","South Korea","KR","Meat animals nec","exio" +"31373","South Korea","KR","Animal products nec","exio" +"31374","South Korea","KR","Raw milk","exio" +"31375","South Korea","KR","Wool, silk-worm cocoons","exio" +"31376","South Korea","KR","Manure (conventional treatment)","exio" +"31377","South Korea","KR","Manure (biogas treatment)","exio" +"31378","South Korea","KR","Products of forestry, logging and related services","exio" +"31379","South Korea","KR","Fish and other fishing products; services incidental of fishing","exio" +"31380","South Korea","KR","Anthracite","exio" +"31381","South Korea","KR","Coking Coal","exio" +"31382","South Korea","KR","Other Bituminous Coal","exio" +"31383","South Korea","KR","Sub-Bituminous Coal","exio" +"31384","South Korea","KR","Patent Fuel","exio" +"31385","South Korea","KR","Lignite/Brown Coal","exio" +"31386","South Korea","KR","BKB/Peat Briquettes","exio" +"31387","South Korea","KR","Peat","exio" +"31388","South Korea","KR","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"31389","South Korea","KR","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"31390","South Korea","KR","Natural Gas Liquids","exio" +"31391","South Korea","KR","Other Hydrocarbons","exio" +"31392","South Korea","KR","Uranium and thorium ores","exio" +"31393","South Korea","KR","Iron ores","exio" +"31394","South Korea","KR","Copper ores and concentrates","exio" +"31395","South Korea","KR","Nickel ores and concentrates","exio" +"31396","South Korea","KR","Aluminium ores and concentrates","exio" +"31397","South Korea","KR","Precious metal ores and concentrates","exio" +"31398","South Korea","KR","Lead, zinc and tin ores and concentrates","exio" +"31399","South Korea","KR","Other non-ferrous metal ores and concentrates","exio" +"31400","South Korea","KR","Stone","exio" +"31401","South Korea","KR","Sand and clay","exio" +"31402","South Korea","KR","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"31403","South Korea","KR","Products of meat cattle","exio" +"31404","South Korea","KR","Products of meat pigs","exio" +"31405","South Korea","KR","Products of meat poultry","exio" +"31406","South Korea","KR","Meat products nec","exio" +"31407","South Korea","KR","products of Vegetable oils and fats","exio" +"31408","South Korea","KR","Dairy products","exio" +"31409","South Korea","KR","Processed rice","exio" +"31410","South Korea","KR","Sugar","exio" +"31411","South Korea","KR","Food products nec","exio" +"31412","South Korea","KR","Beverages","exio" +"31413","South Korea","KR","Fish products","exio" +"31414","South Korea","KR","Tobacco products","exio" +"31415","South Korea","KR","Textiles","exio" +"31416","South Korea","KR","Wearing apparel; furs","exio" +"31417","South Korea","KR","Leather and leather products","exio" +"31418","South Korea","KR","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"31419","South Korea","KR","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"31420","South Korea","KR","Pulp","exio" +"31421","South Korea","KR","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"31422","South Korea","KR","Paper and paper products","exio" +"31423","South Korea","KR","Printed matter and recorded media","exio" +"31424","South Korea","KR","Coke Oven Coke","exio" +"31425","South Korea","KR","Gas Coke","exio" +"31426","South Korea","KR","Coal Tar","exio" +"31427","South Korea","KR","Motor Gasoline","exio" +"31428","South Korea","KR","Aviation Gasoline","exio" +"31429","South Korea","KR","Gasoline Type Jet Fuel","exio" +"31430","South Korea","KR","Kerosene Type Jet Fuel","exio" +"31431","South Korea","KR","Kerosene","exio" +"31432","South Korea","KR","Gas/Diesel Oil","exio" +"31433","South Korea","KR","Heavy Fuel Oil","exio" +"31434","South Korea","KR","Refinery Gas","exio" +"31435","South Korea","KR","Liquefied Petroleum Gases (LPG)","exio" +"31436","South Korea","KR","Refinery Feedstocks","exio" +"31437","South Korea","KR","Ethane","exio" +"31438","South Korea","KR","Naphtha","exio" +"31439","South Korea","KR","White Spirit & SBP","exio" +"31440","South Korea","KR","Lubricants","exio" +"31441","South Korea","KR","Bitumen","exio" +"31442","South Korea","KR","Paraffin Waxes","exio" +"31443","South Korea","KR","Petroleum Coke","exio" +"31444","South Korea","KR","Non-specified Petroleum Products","exio" +"31445","South Korea","KR","Nuclear fuel","exio" +"31446","South Korea","KR","Plastics, basic","exio" +"31447","South Korea","KR","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"31448","South Korea","KR","N-fertiliser","exio" +"31449","South Korea","KR","P- and other fertiliser","exio" +"31450","South Korea","KR","Chemicals nec","exio" +"31451","South Korea","KR","Charcoal","exio" +"31452","South Korea","KR","Additives/Blending Components","exio" +"31453","South Korea","KR","Biogasoline","exio" +"31454","South Korea","KR","Biodiesels","exio" +"31455","South Korea","KR","Other Liquid Biofuels","exio" +"31456","South Korea","KR","Rubber and plastic products","exio" +"31457","South Korea","KR","Glass and glass products","exio" +"31458","South Korea","KR","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"31459","South Korea","KR","Ceramic goods","exio" +"31460","South Korea","KR","Bricks, tiles and construction products, in baked clay","exio" +"31461","South Korea","KR","Cement, lime and plaster","exio" +"31462","South Korea","KR","Ash for treatment, Re-processing of ash into clinker","exio" +"31463","South Korea","KR","Other non-metallic mineral products","exio" +"31464","South Korea","KR","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"31465","South Korea","KR","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"31466","South Korea","KR","Precious metals","exio" +"31467","South Korea","KR","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"31468","South Korea","KR","Aluminium and aluminium products","exio" +"31469","South Korea","KR","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"31470","South Korea","KR","Lead, zinc and tin and products thereof","exio" +"31471","South Korea","KR","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"31472","South Korea","KR","Copper products","exio" +"31473","South Korea","KR","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"31474","South Korea","KR","Other non-ferrous metal products","exio" +"31475","South Korea","KR","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"31476","South Korea","KR","Foundry work services","exio" +"31477","South Korea","KR","Fabricated metal products, except machinery and equipment","exio" +"31478","South Korea","KR","Machinery and equipment n.e.c.","exio" +"31479","South Korea","KR","Office machinery and computers","exio" +"31480","South Korea","KR","Electrical machinery and apparatus n.e.c.","exio" +"31481","South Korea","KR","Radio, television and communication equipment and apparatus","exio" +"31482","South Korea","KR","Medical, precision and optical instruments, watches and clocks","exio" +"31483","South Korea","KR","Motor vehicles, trailers and semi-trailers","exio" +"31484","South Korea","KR","Other transport equipment","exio" +"31485","South Korea","KR","Furniture; other manufactured goods n.e.c.","exio" +"31486","South Korea","KR","Secondary raw materials","exio" +"31487","South Korea","KR","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"31488","South Korea","KR","Electricity by coal","exio" +"31489","South Korea","KR","Electricity by gas","exio" +"31490","South Korea","KR","Electricity by nuclear","exio" +"31491","South Korea","KR","Electricity by hydro","exio" +"31492","South Korea","KR","Electricity by wind","exio" +"31493","South Korea","KR","Electricity by petroleum and other oil derivatives","exio" +"31494","South Korea","KR","Electricity by biomass and waste","exio" +"31495","South Korea","KR","Electricity by solar photovoltaic","exio" +"31496","South Korea","KR","Electricity by solar thermal","exio" +"31497","South Korea","KR","Electricity by tide, wave, ocean","exio" +"31498","South Korea","KR","Electricity by Geothermal","exio" +"31499","South Korea","KR","Electricity nec","exio" +"31500","South Korea","KR","Transmission services of electricity","exio" +"31501","South Korea","KR","Distribution and trade services of electricity","exio" +"31502","South Korea","KR","Coke oven gas","exio" +"31503","South Korea","KR","Blast Furnace Gas","exio" +"31504","South Korea","KR","Oxygen Steel Furnace Gas","exio" +"31505","South Korea","KR","Gas Works Gas","exio" +"31506","South Korea","KR","Biogas","exio" +"31507","South Korea","KR","Distribution services of gaseous fuels through mains","exio" +"31508","South Korea","KR","Steam and hot water supply services","exio" +"31509","South Korea","KR","Collected and purified water, distribution services of water","exio" +"31510","South Korea","KR","Construction work","exio" +"31511","South Korea","KR","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"31512","South Korea","KR","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"31513","South Korea","KR","Retail trade services of motor fuel","exio" +"31514","South Korea","KR","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"31515","South Korea","KR","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"31516","South Korea","KR","Hotel and restaurant services","exio" +"31517","South Korea","KR","Railway transportation services","exio" +"31518","South Korea","KR","Other land transportation services","exio" +"31519","South Korea","KR","Transportation services via pipelines","exio" +"31520","South Korea","KR","Sea and coastal water transportation services","exio" +"31521","South Korea","KR","Inland water transportation services","exio" +"31522","South Korea","KR","Air transport services","exio" +"31523","South Korea","KR","Supporting and auxiliary transport services; travel agency services","exio" +"31524","South Korea","KR","Post and telecommunication services","exio" +"31525","South Korea","KR","Financial intermediation services, except insurance and pension funding services","exio" +"31526","South Korea","KR","Insurance and pension funding services, except compulsory social security services","exio" +"31527","South Korea","KR","Services auxiliary to financial intermediation","exio" +"31528","South Korea","KR","Real estate services","exio" +"31529","South Korea","KR","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"31530","South Korea","KR","Computer and related services","exio" +"31531","South Korea","KR","Research and development services","exio" +"31532","South Korea","KR","Other business services","exio" +"31533","South Korea","KR","Public administration and defence services; compulsory social security services","exio" +"31534","South Korea","KR","Education services","exio" +"31535","South Korea","KR","Health and social work services","exio" +"31536","South Korea","KR","Food waste for treatment: incineration","exio" +"31537","South Korea","KR","Paper waste for treatment: incineration","exio" +"31538","South Korea","KR","Plastic waste for treatment: incineration","exio" +"31539","South Korea","KR","Intert/metal waste for treatment: incineration","exio" +"31540","South Korea","KR","Textiles waste for treatment: incineration","exio" +"31541","South Korea","KR","Wood waste for treatment: incineration","exio" +"31542","South Korea","KR","Oil/hazardous waste for treatment: incineration","exio" +"31543","South Korea","KR","Food waste for treatment: biogasification and land application","exio" +"31544","South Korea","KR","Paper waste for treatment: biogasification and land application","exio" +"31545","South Korea","KR","Sewage sludge for treatment: biogasification and land application","exio" +"31546","South Korea","KR","Food waste for treatment: composting and land application","exio" +"31547","South Korea","KR","Paper and wood waste for treatment: composting and land application","exio" +"31548","South Korea","KR","Food waste for treatment: waste water treatment","exio" +"31549","South Korea","KR","Other waste for treatment: waste water treatment","exio" +"31550","South Korea","KR","Food waste for treatment: landfill","exio" +"31551","South Korea","KR","Paper for treatment: landfill","exio" +"31552","South Korea","KR","Plastic waste for treatment: landfill","exio" +"31553","South Korea","KR","Inert/metal/hazardous waste for treatment: landfill","exio" +"31554","South Korea","KR","Textiles waste for treatment: landfill","exio" +"31555","South Korea","KR","Wood waste for treatment: landfill","exio" +"31556","South Korea","KR","Membership organisation services n.e.c.","exio" +"31557","South Korea","KR","Recreational, cultural and sporting services","exio" +"31558","South Korea","KR","Other services","exio" +"31559","South Korea","KR","Private households with employed persons","exio" +"31560","South Korea","KR","Extra-territorial organizations and bodies","exio" +"31561","Brazil","BR","Paddy rice","exio" +"31562","Brazil","BR","Wheat","exio" +"31563","Brazil","BR","Cereal grains nec","exio" +"31564","Brazil","BR","Vegetables, fruit, nuts","exio" +"31565","Brazil","BR","Oil seeds","exio" +"31566","Brazil","BR","Sugar cane, sugar beet","exio" +"31567","Brazil","BR","Plant-based fibers","exio" +"31568","Brazil","BR","Crops nec","exio" +"31569","Brazil","BR","Cattle","exio" +"31570","Brazil","BR","Pigs","exio" +"31571","Brazil","BR","Poultry","exio" +"31572","Brazil","BR","Meat animals nec","exio" +"31573","Brazil","BR","Animal products nec","exio" +"31574","Brazil","BR","Raw milk","exio" +"31575","Brazil","BR","Wool, silk-worm cocoons","exio" +"31576","Brazil","BR","Manure (conventional treatment)","exio" +"31577","Brazil","BR","Manure (biogas treatment)","exio" +"31578","Brazil","BR","Products of forestry, logging and related services","exio" +"31579","Brazil","BR","Fish and other fishing products; services incidental of fishing","exio" +"31580","Brazil","BR","Anthracite","exio" +"31581","Brazil","BR","Coking Coal","exio" +"31582","Brazil","BR","Other Bituminous Coal","exio" +"31583","Brazil","BR","Sub-Bituminous Coal","exio" +"31584","Brazil","BR","Patent Fuel","exio" +"31585","Brazil","BR","Lignite/Brown Coal","exio" +"31586","Brazil","BR","BKB/Peat Briquettes","exio" +"31587","Brazil","BR","Peat","exio" +"31588","Brazil","BR","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"31589","Brazil","BR","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"31590","Brazil","BR","Natural Gas Liquids","exio" +"31591","Brazil","BR","Other Hydrocarbons","exio" +"31592","Brazil","BR","Uranium and thorium ores","exio" +"31593","Brazil","BR","Iron ores","exio" +"31594","Brazil","BR","Copper ores and concentrates","exio" +"31595","Brazil","BR","Nickel ores and concentrates","exio" +"31596","Brazil","BR","Aluminium ores and concentrates","exio" +"31597","Brazil","BR","Precious metal ores and concentrates","exio" +"31598","Brazil","BR","Lead, zinc and tin ores and concentrates","exio" +"31599","Brazil","BR","Other non-ferrous metal ores and concentrates","exio" +"31600","Brazil","BR","Stone","exio" +"31601","Brazil","BR","Sand and clay","exio" +"31602","Brazil","BR","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"31603","Brazil","BR","Products of meat cattle","exio" +"31604","Brazil","BR","Products of meat pigs","exio" +"31605","Brazil","BR","Products of meat poultry","exio" +"31606","Brazil","BR","Meat products nec","exio" +"31607","Brazil","BR","products of Vegetable oils and fats","exio" +"31608","Brazil","BR","Dairy products","exio" +"31609","Brazil","BR","Processed rice","exio" +"31610","Brazil","BR","Sugar","exio" +"31611","Brazil","BR","Food products nec","exio" +"31612","Brazil","BR","Beverages","exio" +"31613","Brazil","BR","Fish products","exio" +"31614","Brazil","BR","Tobacco products","exio" +"31615","Brazil","BR","Textiles","exio" +"31616","Brazil","BR","Wearing apparel; furs","exio" +"31617","Brazil","BR","Leather and leather products","exio" +"31618","Brazil","BR","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"31619","Brazil","BR","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"31620","Brazil","BR","Pulp","exio" +"31621","Brazil","BR","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"31622","Brazil","BR","Paper and paper products","exio" +"31623","Brazil","BR","Printed matter and recorded media","exio" +"31624","Brazil","BR","Coke Oven Coke","exio" +"31625","Brazil","BR","Gas Coke","exio" +"31626","Brazil","BR","Coal Tar","exio" +"31627","Brazil","BR","Motor Gasoline","exio" +"31628","Brazil","BR","Aviation Gasoline","exio" +"31629","Brazil","BR","Gasoline Type Jet Fuel","exio" +"31630","Brazil","BR","Kerosene Type Jet Fuel","exio" +"31631","Brazil","BR","Kerosene","exio" +"31632","Brazil","BR","Gas/Diesel Oil","exio" +"31633","Brazil","BR","Heavy Fuel Oil","exio" +"31634","Brazil","BR","Refinery Gas","exio" +"31635","Brazil","BR","Liquefied Petroleum Gases (LPG)","exio" +"31636","Brazil","BR","Refinery Feedstocks","exio" +"31637","Brazil","BR","Ethane","exio" +"31638","Brazil","BR","Naphtha","exio" +"31639","Brazil","BR","White Spirit & SBP","exio" +"31640","Brazil","BR","Lubricants","exio" +"31641","Brazil","BR","Bitumen","exio" +"31642","Brazil","BR","Paraffin Waxes","exio" +"31643","Brazil","BR","Petroleum Coke","exio" +"31644","Brazil","BR","Non-specified Petroleum Products","exio" +"31645","Brazil","BR","Nuclear fuel","exio" +"31646","Brazil","BR","Plastics, basic","exio" +"31647","Brazil","BR","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"31648","Brazil","BR","N-fertiliser","exio" +"31649","Brazil","BR","P- and other fertiliser","exio" +"31650","Brazil","BR","Chemicals nec","exio" +"31651","Brazil","BR","Charcoal","exio" +"31652","Brazil","BR","Additives/Blending Components","exio" +"31653","Brazil","BR","Biogasoline","exio" +"31654","Brazil","BR","Biodiesels","exio" +"31655","Brazil","BR","Other Liquid Biofuels","exio" +"31656","Brazil","BR","Rubber and plastic products","exio" +"31657","Brazil","BR","Glass and glass products","exio" +"31658","Brazil","BR","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"31659","Brazil","BR","Ceramic goods","exio" +"31660","Brazil","BR","Bricks, tiles and construction products, in baked clay","exio" +"31661","Brazil","BR","Cement, lime and plaster","exio" +"31662","Brazil","BR","Ash for treatment, Re-processing of ash into clinker","exio" +"31663","Brazil","BR","Other non-metallic mineral products","exio" +"31664","Brazil","BR","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"31665","Brazil","BR","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"31666","Brazil","BR","Precious metals","exio" +"31667","Brazil","BR","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"31668","Brazil","BR","Aluminium and aluminium products","exio" +"31669","Brazil","BR","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"31670","Brazil","BR","Lead, zinc and tin and products thereof","exio" +"31671","Brazil","BR","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"31672","Brazil","BR","Copper products","exio" +"31673","Brazil","BR","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"31674","Brazil","BR","Other non-ferrous metal products","exio" +"31675","Brazil","BR","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"31676","Brazil","BR","Foundry work services","exio" +"31677","Brazil","BR","Fabricated metal products, except machinery and equipment","exio" +"31678","Brazil","BR","Machinery and equipment n.e.c.","exio" +"31679","Brazil","BR","Office machinery and computers","exio" +"31680","Brazil","BR","Electrical machinery and apparatus n.e.c.","exio" +"31681","Brazil","BR","Radio, television and communication equipment and apparatus","exio" +"31682","Brazil","BR","Medical, precision and optical instruments, watches and clocks","exio" +"31683","Brazil","BR","Motor vehicles, trailers and semi-trailers","exio" +"31684","Brazil","BR","Other transport equipment","exio" +"31685","Brazil","BR","Furniture; other manufactured goods n.e.c.","exio" +"31686","Brazil","BR","Secondary raw materials","exio" +"31687","Brazil","BR","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"31688","Brazil","BR","Electricity by coal","exio" +"31689","Brazil","BR","Electricity by gas","exio" +"31690","Brazil","BR","Electricity by nuclear","exio" +"31691","Brazil","BR","Electricity by hydro","exio" +"31692","Brazil","BR","Electricity by wind","exio" +"31693","Brazil","BR","Electricity by petroleum and other oil derivatives","exio" +"31694","Brazil","BR","Electricity by biomass and waste","exio" +"31695","Brazil","BR","Electricity by solar photovoltaic","exio" +"31696","Brazil","BR","Electricity by solar thermal","exio" +"31697","Brazil","BR","Electricity by tide, wave, ocean","exio" +"31698","Brazil","BR","Electricity by Geothermal","exio" +"31699","Brazil","BR","Electricity nec","exio" +"31700","Brazil","BR","Transmission services of electricity","exio" +"31701","Brazil","BR","Distribution and trade services of electricity","exio" +"31702","Brazil","BR","Coke oven gas","exio" +"31703","Brazil","BR","Blast Furnace Gas","exio" +"31704","Brazil","BR","Oxygen Steel Furnace Gas","exio" +"31705","Brazil","BR","Gas Works Gas","exio" +"31706","Brazil","BR","Biogas","exio" +"31707","Brazil","BR","Distribution services of gaseous fuels through mains","exio" +"31708","Brazil","BR","Steam and hot water supply services","exio" +"31709","Brazil","BR","Collected and purified water, distribution services of water","exio" +"31710","Brazil","BR","Construction work","exio" +"31711","Brazil","BR","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"31712","Brazil","BR","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"31713","Brazil","BR","Retail trade services of motor fuel","exio" +"31714","Brazil","BR","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"31715","Brazil","BR","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"31716","Brazil","BR","Hotel and restaurant services","exio" +"31717","Brazil","BR","Railway transportation services","exio" +"31718","Brazil","BR","Other land transportation services","exio" +"31719","Brazil","BR","Transportation services via pipelines","exio" +"31720","Brazil","BR","Sea and coastal water transportation services","exio" +"31721","Brazil","BR","Inland water transportation services","exio" +"31722","Brazil","BR","Air transport services","exio" +"31723","Brazil","BR","Supporting and auxiliary transport services; travel agency services","exio" +"31724","Brazil","BR","Post and telecommunication services","exio" +"31725","Brazil","BR","Financial intermediation services, except insurance and pension funding services","exio" +"31726","Brazil","BR","Insurance and pension funding services, except compulsory social security services","exio" +"31727","Brazil","BR","Services auxiliary to financial intermediation","exio" +"31728","Brazil","BR","Real estate services","exio" +"31729","Brazil","BR","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"31730","Brazil","BR","Computer and related services","exio" +"31731","Brazil","BR","Research and development services","exio" +"31732","Brazil","BR","Other business services","exio" +"31733","Brazil","BR","Public administration and defence services; compulsory social security services","exio" +"31734","Brazil","BR","Education services","exio" +"31735","Brazil","BR","Health and social work services","exio" +"31736","Brazil","BR","Food waste for treatment: incineration","exio" +"31737","Brazil","BR","Paper waste for treatment: incineration","exio" +"31738","Brazil","BR","Plastic waste for treatment: incineration","exio" +"31739","Brazil","BR","Intert/metal waste for treatment: incineration","exio" +"31740","Brazil","BR","Textiles waste for treatment: incineration","exio" +"31741","Brazil","BR","Wood waste for treatment: incineration","exio" +"31742","Brazil","BR","Oil/hazardous waste for treatment: incineration","exio" +"31743","Brazil","BR","Food waste for treatment: biogasification and land application","exio" +"31744","Brazil","BR","Paper waste for treatment: biogasification and land application","exio" +"31745","Brazil","BR","Sewage sludge for treatment: biogasification and land application","exio" +"31746","Brazil","BR","Food waste for treatment: composting and land application","exio" +"31747","Brazil","BR","Paper and wood waste for treatment: composting and land application","exio" +"31748","Brazil","BR","Food waste for treatment: waste water treatment","exio" +"31749","Brazil","BR","Other waste for treatment: waste water treatment","exio" +"31750","Brazil","BR","Food waste for treatment: landfill","exio" +"31751","Brazil","BR","Paper for treatment: landfill","exio" +"31752","Brazil","BR","Plastic waste for treatment: landfill","exio" +"31753","Brazil","BR","Inert/metal/hazardous waste for treatment: landfill","exio" +"31754","Brazil","BR","Textiles waste for treatment: landfill","exio" +"31755","Brazil","BR","Wood waste for treatment: landfill","exio" +"31756","Brazil","BR","Membership organisation services n.e.c.","exio" +"31757","Brazil","BR","Recreational, cultural and sporting services","exio" +"31758","Brazil","BR","Other services","exio" +"31759","Brazil","BR","Private households with employed persons","exio" +"31760","Brazil","BR","Extra-territorial organizations and bodies","exio" +"31761","India","IN","Paddy rice","exio" +"31762","India","IN","Wheat","exio" +"31763","India","IN","Cereal grains nec","exio" +"31764","India","IN","Vegetables, fruit, nuts","exio" +"31765","India","IN","Oil seeds","exio" +"31766","India","IN","Sugar cane, sugar beet","exio" +"31767","India","IN","Plant-based fibers","exio" +"31768","India","IN","Crops nec","exio" +"31769","India","IN","Cattle","exio" +"31770","India","IN","Pigs","exio" +"31771","India","IN","Poultry","exio" +"31772","India","IN","Meat animals nec","exio" +"31773","India","IN","Animal products nec","exio" +"31774","India","IN","Raw milk","exio" +"31775","India","IN","Wool, silk-worm cocoons","exio" +"31776","India","IN","Manure (conventional treatment)","exio" +"31777","India","IN","Manure (biogas treatment)","exio" +"31778","India","IN","Products of forestry, logging and related services","exio" +"31779","India","IN","Fish and other fishing products; services incidental of fishing","exio" +"31780","India","IN","Anthracite","exio" +"31781","India","IN","Coking Coal","exio" +"31782","India","IN","Other Bituminous Coal","exio" +"31783","India","IN","Sub-Bituminous Coal","exio" +"31784","India","IN","Patent Fuel","exio" +"31785","India","IN","Lignite/Brown Coal","exio" +"31786","India","IN","BKB/Peat Briquettes","exio" +"31787","India","IN","Peat","exio" +"31788","India","IN","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"31789","India","IN","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"31790","India","IN","Natural Gas Liquids","exio" +"31791","India","IN","Other Hydrocarbons","exio" +"31792","India","IN","Uranium and thorium ores","exio" +"31793","India","IN","Iron ores","exio" +"31794","India","IN","Copper ores and concentrates","exio" +"31795","India","IN","Nickel ores and concentrates","exio" +"31796","India","IN","Aluminium ores and concentrates","exio" +"31797","India","IN","Precious metal ores and concentrates","exio" +"31798","India","IN","Lead, zinc and tin ores and concentrates","exio" +"31799","India","IN","Other non-ferrous metal ores and concentrates","exio" +"31800","India","IN","Stone","exio" +"31801","India","IN","Sand and clay","exio" +"31802","India","IN","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"31803","India","IN","Products of meat cattle","exio" +"31804","India","IN","Products of meat pigs","exio" +"31805","India","IN","Products of meat poultry","exio" +"31806","India","IN","Meat products nec","exio" +"31807","India","IN","products of Vegetable oils and fats","exio" +"31808","India","IN","Dairy products","exio" +"31809","India","IN","Processed rice","exio" +"31810","India","IN","Sugar","exio" +"31811","India","IN","Food products nec","exio" +"31812","India","IN","Beverages","exio" +"31813","India","IN","Fish products","exio" +"31814","India","IN","Tobacco products","exio" +"31815","India","IN","Textiles","exio" +"31816","India","IN","Wearing apparel; furs","exio" +"31817","India","IN","Leather and leather products","exio" +"31818","India","IN","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"31819","India","IN","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"31820","India","IN","Pulp","exio" +"31821","India","IN","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"31822","India","IN","Paper and paper products","exio" +"31823","India","IN","Printed matter and recorded media","exio" +"31824","India","IN","Coke Oven Coke","exio" +"31825","India","IN","Gas Coke","exio" +"31826","India","IN","Coal Tar","exio" +"31827","India","IN","Motor Gasoline","exio" +"31828","India","IN","Aviation Gasoline","exio" +"31829","India","IN","Gasoline Type Jet Fuel","exio" +"31830","India","IN","Kerosene Type Jet Fuel","exio" +"31831","India","IN","Kerosene","exio" +"31832","India","IN","Gas/Diesel Oil","exio" +"31833","India","IN","Heavy Fuel Oil","exio" +"31834","India","IN","Refinery Gas","exio" +"31835","India","IN","Liquefied Petroleum Gases (LPG)","exio" +"31836","India","IN","Refinery Feedstocks","exio" +"31837","India","IN","Ethane","exio" +"31838","India","IN","Naphtha","exio" +"31839","India","IN","White Spirit & SBP","exio" +"31840","India","IN","Lubricants","exio" +"31841","India","IN","Bitumen","exio" +"31842","India","IN","Paraffin Waxes","exio" +"31843","India","IN","Petroleum Coke","exio" +"31844","India","IN","Non-specified Petroleum Products","exio" +"31845","India","IN","Nuclear fuel","exio" +"31846","India","IN","Plastics, basic","exio" +"31847","India","IN","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"31848","India","IN","N-fertiliser","exio" +"31849","India","IN","P- and other fertiliser","exio" +"31850","India","IN","Chemicals nec","exio" +"31851","India","IN","Charcoal","exio" +"31852","India","IN","Additives/Blending Components","exio" +"31853","India","IN","Biogasoline","exio" +"31854","India","IN","Biodiesels","exio" +"31855","India","IN","Other Liquid Biofuels","exio" +"31856","India","IN","Rubber and plastic products","exio" +"31857","India","IN","Glass and glass products","exio" +"31858","India","IN","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"31859","India","IN","Ceramic goods","exio" +"31860","India","IN","Bricks, tiles and construction products, in baked clay","exio" +"31861","India","IN","Cement, lime and plaster","exio" +"31862","India","IN","Ash for treatment, Re-processing of ash into clinker","exio" +"31863","India","IN","Other non-metallic mineral products","exio" +"31864","India","IN","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"31865","India","IN","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"31866","India","IN","Precious metals","exio" +"31867","India","IN","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"31868","India","IN","Aluminium and aluminium products","exio" +"31869","India","IN","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"31870","India","IN","Lead, zinc and tin and products thereof","exio" +"31871","India","IN","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"31872","India","IN","Copper products","exio" +"31873","India","IN","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"31874","India","IN","Other non-ferrous metal products","exio" +"31875","India","IN","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"31876","India","IN","Foundry work services","exio" +"31877","India","IN","Fabricated metal products, except machinery and equipment","exio" +"31878","India","IN","Machinery and equipment n.e.c.","exio" +"31879","India","IN","Office machinery and computers","exio" +"31880","India","IN","Electrical machinery and apparatus n.e.c.","exio" +"31881","India","IN","Radio, television and communication equipment and apparatus","exio" +"31882","India","IN","Medical, precision and optical instruments, watches and clocks","exio" +"31883","India","IN","Motor vehicles, trailers and semi-trailers","exio" +"31884","India","IN","Other transport equipment","exio" +"31885","India","IN","Furniture; other manufactured goods n.e.c.","exio" +"31886","India","IN","Secondary raw materials","exio" +"31887","India","IN","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"31888","India","IN","Electricity by coal","exio" +"31889","India","IN","Electricity by gas","exio" +"31890","India","IN","Electricity by nuclear","exio" +"31891","India","IN","Electricity by hydro","exio" +"31892","India","IN","Electricity by wind","exio" +"31893","India","IN","Electricity by petroleum and other oil derivatives","exio" +"31894","India","IN","Electricity by biomass and waste","exio" +"31895","India","IN","Electricity by solar photovoltaic","exio" +"31896","India","IN","Electricity by solar thermal","exio" +"31897","India","IN","Electricity by tide, wave, ocean","exio" +"31898","India","IN","Electricity by Geothermal","exio" +"31899","India","IN","Electricity nec","exio" +"31900","India","IN","Transmission services of electricity","exio" +"31901","India","IN","Distribution and trade services of electricity","exio" +"31902","India","IN","Coke oven gas","exio" +"31903","India","IN","Blast Furnace Gas","exio" +"31904","India","IN","Oxygen Steel Furnace Gas","exio" +"31905","India","IN","Gas Works Gas","exio" +"31906","India","IN","Biogas","exio" +"31907","India","IN","Distribution services of gaseous fuels through mains","exio" +"31908","India","IN","Steam and hot water supply services","exio" +"31909","India","IN","Collected and purified water, distribution services of water","exio" +"31910","India","IN","Construction work","exio" +"31911","India","IN","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"31912","India","IN","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"31913","India","IN","Retail trade services of motor fuel","exio" +"31914","India","IN","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"31915","India","IN","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"31916","India","IN","Hotel and restaurant services","exio" +"31917","India","IN","Railway transportation services","exio" +"31918","India","IN","Other land transportation services","exio" +"31919","India","IN","Transportation services via pipelines","exio" +"31920","India","IN","Sea and coastal water transportation services","exio" +"31921","India","IN","Inland water transportation services","exio" +"31922","India","IN","Air transport services","exio" +"31923","India","IN","Supporting and auxiliary transport services; travel agency services","exio" +"31924","India","IN","Post and telecommunication services","exio" +"31925","India","IN","Financial intermediation services, except insurance and pension funding services","exio" +"31926","India","IN","Insurance and pension funding services, except compulsory social security services","exio" +"31927","India","IN","Services auxiliary to financial intermediation","exio" +"31928","India","IN","Real estate services","exio" +"31929","India","IN","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"31930","India","IN","Computer and related services","exio" +"31931","India","IN","Research and development services","exio" +"31932","India","IN","Other business services","exio" +"31933","India","IN","Public administration and defence services; compulsory social security services","exio" +"31934","India","IN","Education services","exio" +"31935","India","IN","Health and social work services","exio" +"31936","India","IN","Food waste for treatment: incineration","exio" +"31937","India","IN","Paper waste for treatment: incineration","exio" +"31938","India","IN","Plastic waste for treatment: incineration","exio" +"31939","India","IN","Intert/metal waste for treatment: incineration","exio" +"31940","India","IN","Textiles waste for treatment: incineration","exio" +"31941","India","IN","Wood waste for treatment: incineration","exio" +"31942","India","IN","Oil/hazardous waste for treatment: incineration","exio" +"31943","India","IN","Food waste for treatment: biogasification and land application","exio" +"31944","India","IN","Paper waste for treatment: biogasification and land application","exio" +"31945","India","IN","Sewage sludge for treatment: biogasification and land application","exio" +"31946","India","IN","Food waste for treatment: composting and land application","exio" +"31947","India","IN","Paper and wood waste for treatment: composting and land application","exio" +"31948","India","IN","Food waste for treatment: waste water treatment","exio" +"31949","India","IN","Other waste for treatment: waste water treatment","exio" +"31950","India","IN","Food waste for treatment: landfill","exio" +"31951","India","IN","Paper for treatment: landfill","exio" +"31952","India","IN","Plastic waste for treatment: landfill","exio" +"31953","India","IN","Inert/metal/hazardous waste for treatment: landfill","exio" +"31954","India","IN","Textiles waste for treatment: landfill","exio" +"31955","India","IN","Wood waste for treatment: landfill","exio" +"31956","India","IN","Membership organisation services n.e.c.","exio" +"31957","India","IN","Recreational, cultural and sporting services","exio" +"31958","India","IN","Other services","exio" +"31959","India","IN","Private households with employed persons","exio" +"31960","India","IN","Extra-territorial organizations and bodies","exio" +"31961","Mexico","MX","Paddy rice","exio" +"31962","Mexico","MX","Wheat","exio" +"31963","Mexico","MX","Cereal grains nec","exio" +"31964","Mexico","MX","Vegetables, fruit, nuts","exio" +"31965","Mexico","MX","Oil seeds","exio" +"31966","Mexico","MX","Sugar cane, sugar beet","exio" +"31967","Mexico","MX","Plant-based fibers","exio" +"31968","Mexico","MX","Crops nec","exio" +"31969","Mexico","MX","Cattle","exio" +"31970","Mexico","MX","Pigs","exio" +"31971","Mexico","MX","Poultry","exio" +"31972","Mexico","MX","Meat animals nec","exio" +"31973","Mexico","MX","Animal products nec","exio" +"31974","Mexico","MX","Raw milk","exio" +"31975","Mexico","MX","Wool, silk-worm cocoons","exio" +"31976","Mexico","MX","Manure (conventional treatment)","exio" +"31977","Mexico","MX","Manure (biogas treatment)","exio" +"31978","Mexico","MX","Products of forestry, logging and related services","exio" +"31979","Mexico","MX","Fish and other fishing products; services incidental of fishing","exio" +"31980","Mexico","MX","Anthracite","exio" +"31981","Mexico","MX","Coking Coal","exio" +"31982","Mexico","MX","Other Bituminous Coal","exio" +"31983","Mexico","MX","Sub-Bituminous Coal","exio" +"31984","Mexico","MX","Patent Fuel","exio" +"31985","Mexico","MX","Lignite/Brown Coal","exio" +"31986","Mexico","MX","BKB/Peat Briquettes","exio" +"31987","Mexico","MX","Peat","exio" +"31988","Mexico","MX","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"31989","Mexico","MX","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"31990","Mexico","MX","Natural Gas Liquids","exio" +"31991","Mexico","MX","Other Hydrocarbons","exio" +"31992","Mexico","MX","Uranium and thorium ores","exio" +"31993","Mexico","MX","Iron ores","exio" +"31994","Mexico","MX","Copper ores and concentrates","exio" +"31995","Mexico","MX","Nickel ores and concentrates","exio" +"31996","Mexico","MX","Aluminium ores and concentrates","exio" +"31997","Mexico","MX","Precious metal ores and concentrates","exio" +"31998","Mexico","MX","Lead, zinc and tin ores and concentrates","exio" +"31999","Mexico","MX","Other non-ferrous metal ores and concentrates","exio" +"32000","Mexico","MX","Stone","exio" +"32001","Mexico","MX","Sand and clay","exio" +"32002","Mexico","MX","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"32003","Mexico","MX","Products of meat cattle","exio" +"32004","Mexico","MX","Products of meat pigs","exio" +"32005","Mexico","MX","Products of meat poultry","exio" +"32006","Mexico","MX","Meat products nec","exio" +"32007","Mexico","MX","products of Vegetable oils and fats","exio" +"32008","Mexico","MX","Dairy products","exio" +"32009","Mexico","MX","Processed rice","exio" +"32010","Mexico","MX","Sugar","exio" +"32011","Mexico","MX","Food products nec","exio" +"32012","Mexico","MX","Beverages","exio" +"32013","Mexico","MX","Fish products","exio" +"32014","Mexico","MX","Tobacco products","exio" +"32015","Mexico","MX","Textiles","exio" +"32016","Mexico","MX","Wearing apparel; furs","exio" +"32017","Mexico","MX","Leather and leather products","exio" +"32018","Mexico","MX","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"32019","Mexico","MX","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"32020","Mexico","MX","Pulp","exio" +"32021","Mexico","MX","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"32022","Mexico","MX","Paper and paper products","exio" +"32023","Mexico","MX","Printed matter and recorded media","exio" +"32024","Mexico","MX","Coke Oven Coke","exio" +"32025","Mexico","MX","Gas Coke","exio" +"32026","Mexico","MX","Coal Tar","exio" +"32027","Mexico","MX","Motor Gasoline","exio" +"32028","Mexico","MX","Aviation Gasoline","exio" +"32029","Mexico","MX","Gasoline Type Jet Fuel","exio" +"32030","Mexico","MX","Kerosene Type Jet Fuel","exio" +"32031","Mexico","MX","Kerosene","exio" +"32032","Mexico","MX","Gas/Diesel Oil","exio" +"32033","Mexico","MX","Heavy Fuel Oil","exio" +"32034","Mexico","MX","Refinery Gas","exio" +"32035","Mexico","MX","Liquefied Petroleum Gases (LPG)","exio" +"32036","Mexico","MX","Refinery Feedstocks","exio" +"32037","Mexico","MX","Ethane","exio" +"32038","Mexico","MX","Naphtha","exio" +"32039","Mexico","MX","White Spirit & SBP","exio" +"32040","Mexico","MX","Lubricants","exio" +"32041","Mexico","MX","Bitumen","exio" +"32042","Mexico","MX","Paraffin Waxes","exio" +"32043","Mexico","MX","Petroleum Coke","exio" +"32044","Mexico","MX","Non-specified Petroleum Products","exio" +"32045","Mexico","MX","Nuclear fuel","exio" +"32046","Mexico","MX","Plastics, basic","exio" +"32047","Mexico","MX","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"32048","Mexico","MX","N-fertiliser","exio" +"32049","Mexico","MX","P- and other fertiliser","exio" +"32050","Mexico","MX","Chemicals nec","exio" +"32051","Mexico","MX","Charcoal","exio" +"32052","Mexico","MX","Additives/Blending Components","exio" +"32053","Mexico","MX","Biogasoline","exio" +"32054","Mexico","MX","Biodiesels","exio" +"32055","Mexico","MX","Other Liquid Biofuels","exio" +"32056","Mexico","MX","Rubber and plastic products","exio" +"32057","Mexico","MX","Glass and glass products","exio" +"32058","Mexico","MX","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"32059","Mexico","MX","Ceramic goods","exio" +"32060","Mexico","MX","Bricks, tiles and construction products, in baked clay","exio" +"32061","Mexico","MX","Cement, lime and plaster","exio" +"32062","Mexico","MX","Ash for treatment, Re-processing of ash into clinker","exio" +"32063","Mexico","MX","Other non-metallic mineral products","exio" +"32064","Mexico","MX","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"32065","Mexico","MX","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"32066","Mexico","MX","Precious metals","exio" +"32067","Mexico","MX","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"32068","Mexico","MX","Aluminium and aluminium products","exio" +"32069","Mexico","MX","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"32070","Mexico","MX","Lead, zinc and tin and products thereof","exio" +"32071","Mexico","MX","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"32072","Mexico","MX","Copper products","exio" +"32073","Mexico","MX","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"32074","Mexico","MX","Other non-ferrous metal products","exio" +"32075","Mexico","MX","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"32076","Mexico","MX","Foundry work services","exio" +"32077","Mexico","MX","Fabricated metal products, except machinery and equipment","exio" +"32078","Mexico","MX","Machinery and equipment n.e.c.","exio" +"32079","Mexico","MX","Office machinery and computers","exio" +"32080","Mexico","MX","Electrical machinery and apparatus n.e.c.","exio" +"32081","Mexico","MX","Radio, television and communication equipment and apparatus","exio" +"32082","Mexico","MX","Medical, precision and optical instruments, watches and clocks","exio" +"32083","Mexico","MX","Motor vehicles, trailers and semi-trailers","exio" +"32084","Mexico","MX","Other transport equipment","exio" +"32085","Mexico","MX","Furniture; other manufactured goods n.e.c.","exio" +"32086","Mexico","MX","Secondary raw materials","exio" +"32087","Mexico","MX","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"32088","Mexico","MX","Electricity by coal","exio" +"32089","Mexico","MX","Electricity by gas","exio" +"32090","Mexico","MX","Electricity by nuclear","exio" +"32091","Mexico","MX","Electricity by hydro","exio" +"32092","Mexico","MX","Electricity by wind","exio" +"32093","Mexico","MX","Electricity by petroleum and other oil derivatives","exio" +"32094","Mexico","MX","Electricity by biomass and waste","exio" +"32095","Mexico","MX","Electricity by solar photovoltaic","exio" +"32096","Mexico","MX","Electricity by solar thermal","exio" +"32097","Mexico","MX","Electricity by tide, wave, ocean","exio" +"32098","Mexico","MX","Electricity by Geothermal","exio" +"32099","Mexico","MX","Electricity nec","exio" +"32100","Mexico","MX","Transmission services of electricity","exio" +"32101","Mexico","MX","Distribution and trade services of electricity","exio" +"32102","Mexico","MX","Coke oven gas","exio" +"32103","Mexico","MX","Blast Furnace Gas","exio" +"32104","Mexico","MX","Oxygen Steel Furnace Gas","exio" +"32105","Mexico","MX","Gas Works Gas","exio" +"32106","Mexico","MX","Biogas","exio" +"32107","Mexico","MX","Distribution services of gaseous fuels through mains","exio" +"32108","Mexico","MX","Steam and hot water supply services","exio" +"32109","Mexico","MX","Collected and purified water, distribution services of water","exio" +"32110","Mexico","MX","Construction work","exio" +"32111","Mexico","MX","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"32112","Mexico","MX","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"32113","Mexico","MX","Retail trade services of motor fuel","exio" +"32114","Mexico","MX","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"32115","Mexico","MX","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"32116","Mexico","MX","Hotel and restaurant services","exio" +"32117","Mexico","MX","Railway transportation services","exio" +"32118","Mexico","MX","Other land transportation services","exio" +"32119","Mexico","MX","Transportation services via pipelines","exio" +"32120","Mexico","MX","Sea and coastal water transportation services","exio" +"32121","Mexico","MX","Inland water transportation services","exio" +"32122","Mexico","MX","Air transport services","exio" +"32123","Mexico","MX","Supporting and auxiliary transport services; travel agency services","exio" +"32124","Mexico","MX","Post and telecommunication services","exio" +"32125","Mexico","MX","Financial intermediation services, except insurance and pension funding services","exio" +"32126","Mexico","MX","Insurance and pension funding services, except compulsory social security services","exio" +"32127","Mexico","MX","Services auxiliary to financial intermediation","exio" +"32128","Mexico","MX","Real estate services","exio" +"32129","Mexico","MX","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"32130","Mexico","MX","Computer and related services","exio" +"32131","Mexico","MX","Research and development services","exio" +"32132","Mexico","MX","Other business services","exio" +"32133","Mexico","MX","Public administration and defence services; compulsory social security services","exio" +"32134","Mexico","MX","Education services","exio" +"32135","Mexico","MX","Health and social work services","exio" +"32136","Mexico","MX","Food waste for treatment: incineration","exio" +"32137","Mexico","MX","Paper waste for treatment: incineration","exio" +"32138","Mexico","MX","Plastic waste for treatment: incineration","exio" +"32139","Mexico","MX","Intert/metal waste for treatment: incineration","exio" +"32140","Mexico","MX","Textiles waste for treatment: incineration","exio" +"32141","Mexico","MX","Wood waste for treatment: incineration","exio" +"32142","Mexico","MX","Oil/hazardous waste for treatment: incineration","exio" +"32143","Mexico","MX","Food waste for treatment: biogasification and land application","exio" +"32144","Mexico","MX","Paper waste for treatment: biogasification and land application","exio" +"32145","Mexico","MX","Sewage sludge for treatment: biogasification and land application","exio" +"32146","Mexico","MX","Food waste for treatment: composting and land application","exio" +"32147","Mexico","MX","Paper and wood waste for treatment: composting and land application","exio" +"32148","Mexico","MX","Food waste for treatment: waste water treatment","exio" +"32149","Mexico","MX","Other waste for treatment: waste water treatment","exio" +"32150","Mexico","MX","Food waste for treatment: landfill","exio" +"32151","Mexico","MX","Paper for treatment: landfill","exio" +"32152","Mexico","MX","Plastic waste for treatment: landfill","exio" +"32153","Mexico","MX","Inert/metal/hazardous waste for treatment: landfill","exio" +"32154","Mexico","MX","Textiles waste for treatment: landfill","exio" +"32155","Mexico","MX","Wood waste for treatment: landfill","exio" +"32156","Mexico","MX","Membership organisation services n.e.c.","exio" +"32157","Mexico","MX","Recreational, cultural and sporting services","exio" +"32158","Mexico","MX","Other services","exio" +"32159","Mexico","MX","Private households with employed persons","exio" +"32160","Mexico","MX","Extra-territorial organizations and bodies","exio" +"32161","Russia","RU","Paddy rice","exio" +"32162","Russia","RU","Wheat","exio" +"32163","Russia","RU","Cereal grains nec","exio" +"32164","Russia","RU","Vegetables, fruit, nuts","exio" +"32165","Russia","RU","Oil seeds","exio" +"32166","Russia","RU","Sugar cane, sugar beet","exio" +"32167","Russia","RU","Plant-based fibers","exio" +"32168","Russia","RU","Crops nec","exio" +"32169","Russia","RU","Cattle","exio" +"32170","Russia","RU","Pigs","exio" +"32171","Russia","RU","Poultry","exio" +"32172","Russia","RU","Meat animals nec","exio" +"32173","Russia","RU","Animal products nec","exio" +"32174","Russia","RU","Raw milk","exio" +"32175","Russia","RU","Wool, silk-worm cocoons","exio" +"32176","Russia","RU","Manure (conventional treatment)","exio" +"32177","Russia","RU","Manure (biogas treatment)","exio" +"32178","Russia","RU","Products of forestry, logging and related services","exio" +"32179","Russia","RU","Fish and other fishing products; services incidental of fishing","exio" +"32180","Russia","RU","Anthracite","exio" +"32181","Russia","RU","Coking Coal","exio" +"32182","Russia","RU","Other Bituminous Coal","exio" +"32183","Russia","RU","Sub-Bituminous Coal","exio" +"32184","Russia","RU","Patent Fuel","exio" +"32185","Russia","RU","Lignite/Brown Coal","exio" +"32186","Russia","RU","BKB/Peat Briquettes","exio" +"32187","Russia","RU","Peat","exio" +"32188","Russia","RU","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"32189","Russia","RU","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"32190","Russia","RU","Natural Gas Liquids","exio" +"32191","Russia","RU","Other Hydrocarbons","exio" +"32192","Russia","RU","Uranium and thorium ores","exio" +"32193","Russia","RU","Iron ores","exio" +"32194","Russia","RU","Copper ores and concentrates","exio" +"32195","Russia","RU","Nickel ores and concentrates","exio" +"32196","Russia","RU","Aluminium ores and concentrates","exio" +"32197","Russia","RU","Precious metal ores and concentrates","exio" +"32198","Russia","RU","Lead, zinc and tin ores and concentrates","exio" +"32199","Russia","RU","Other non-ferrous metal ores and concentrates","exio" +"32200","Russia","RU","Stone","exio" +"32201","Russia","RU","Sand and clay","exio" +"32202","Russia","RU","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"32203","Russia","RU","Products of meat cattle","exio" +"32204","Russia","RU","Products of meat pigs","exio" +"32205","Russia","RU","Products of meat poultry","exio" +"32206","Russia","RU","Meat products nec","exio" +"32207","Russia","RU","products of Vegetable oils and fats","exio" +"32208","Russia","RU","Dairy products","exio" +"32209","Russia","RU","Processed rice","exio" +"32210","Russia","RU","Sugar","exio" +"32211","Russia","RU","Food products nec","exio" +"32212","Russia","RU","Beverages","exio" +"32213","Russia","RU","Fish products","exio" +"32214","Russia","RU","Tobacco products","exio" +"32215","Russia","RU","Textiles","exio" +"32216","Russia","RU","Wearing apparel; furs","exio" +"32217","Russia","RU","Leather and leather products","exio" +"32218","Russia","RU","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"32219","Russia","RU","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"32220","Russia","RU","Pulp","exio" +"32221","Russia","RU","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"32222","Russia","RU","Paper and paper products","exio" +"32223","Russia","RU","Printed matter and recorded media","exio" +"32224","Russia","RU","Coke Oven Coke","exio" +"32225","Russia","RU","Gas Coke","exio" +"32226","Russia","RU","Coal Tar","exio" +"32227","Russia","RU","Motor Gasoline","exio" +"32228","Russia","RU","Aviation Gasoline","exio" +"32229","Russia","RU","Gasoline Type Jet Fuel","exio" +"32230","Russia","RU","Kerosene Type Jet Fuel","exio" +"32231","Russia","RU","Kerosene","exio" +"32232","Russia","RU","Gas/Diesel Oil","exio" +"32233","Russia","RU","Heavy Fuel Oil","exio" +"32234","Russia","RU","Refinery Gas","exio" +"32235","Russia","RU","Liquefied Petroleum Gases (LPG)","exio" +"32236","Russia","RU","Refinery Feedstocks","exio" +"32237","Russia","RU","Ethane","exio" +"32238","Russia","RU","Naphtha","exio" +"32239","Russia","RU","White Spirit & SBP","exio" +"32240","Russia","RU","Lubricants","exio" +"32241","Russia","RU","Bitumen","exio" +"32242","Russia","RU","Paraffin Waxes","exio" +"32243","Russia","RU","Petroleum Coke","exio" +"32244","Russia","RU","Non-specified Petroleum Products","exio" +"32245","Russia","RU","Nuclear fuel","exio" +"32246","Russia","RU","Plastics, basic","exio" +"32247","Russia","RU","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"32248","Russia","RU","N-fertiliser","exio" +"32249","Russia","RU","P- and other fertiliser","exio" +"32250","Russia","RU","Chemicals nec","exio" +"32251","Russia","RU","Charcoal","exio" +"32252","Russia","RU","Additives/Blending Components","exio" +"32253","Russia","RU","Biogasoline","exio" +"32254","Russia","RU","Biodiesels","exio" +"32255","Russia","RU","Other Liquid Biofuels","exio" +"32256","Russia","RU","Rubber and plastic products","exio" +"32257","Russia","RU","Glass and glass products","exio" +"32258","Russia","RU","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"32259","Russia","RU","Ceramic goods","exio" +"32260","Russia","RU","Bricks, tiles and construction products, in baked clay","exio" +"32261","Russia","RU","Cement, lime and plaster","exio" +"32262","Russia","RU","Ash for treatment, Re-processing of ash into clinker","exio" +"32263","Russia","RU","Other non-metallic mineral products","exio" +"32264","Russia","RU","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"32265","Russia","RU","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"32266","Russia","RU","Precious metals","exio" +"32267","Russia","RU","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"32268","Russia","RU","Aluminium and aluminium products","exio" +"32269","Russia","RU","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"32270","Russia","RU","Lead, zinc and tin and products thereof","exio" +"32271","Russia","RU","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"32272","Russia","RU","Copper products","exio" +"32273","Russia","RU","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"32274","Russia","RU","Other non-ferrous metal products","exio" +"32275","Russia","RU","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"32276","Russia","RU","Foundry work services","exio" +"32277","Russia","RU","Fabricated metal products, except machinery and equipment","exio" +"32278","Russia","RU","Machinery and equipment n.e.c.","exio" +"32279","Russia","RU","Office machinery and computers","exio" +"32280","Russia","RU","Electrical machinery and apparatus n.e.c.","exio" +"32281","Russia","RU","Radio, television and communication equipment and apparatus","exio" +"32282","Russia","RU","Medical, precision and optical instruments, watches and clocks","exio" +"32283","Russia","RU","Motor vehicles, trailers and semi-trailers","exio" +"32284","Russia","RU","Other transport equipment","exio" +"32285","Russia","RU","Furniture; other manufactured goods n.e.c.","exio" +"32286","Russia","RU","Secondary raw materials","exio" +"32287","Russia","RU","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"32288","Russia","RU","Electricity by coal","exio" +"32289","Russia","RU","Electricity by gas","exio" +"32290","Russia","RU","Electricity by nuclear","exio" +"32291","Russia","RU","Electricity by hydro","exio" +"32292","Russia","RU","Electricity by wind","exio" +"32293","Russia","RU","Electricity by petroleum and other oil derivatives","exio" +"32294","Russia","RU","Electricity by biomass and waste","exio" +"32295","Russia","RU","Electricity by solar photovoltaic","exio" +"32296","Russia","RU","Electricity by solar thermal","exio" +"32297","Russia","RU","Electricity by tide, wave, ocean","exio" +"32298","Russia","RU","Electricity by Geothermal","exio" +"32299","Russia","RU","Electricity nec","exio" +"32300","Russia","RU","Transmission services of electricity","exio" +"32301","Russia","RU","Distribution and trade services of electricity","exio" +"32302","Russia","RU","Coke oven gas","exio" +"32303","Russia","RU","Blast Furnace Gas","exio" +"32304","Russia","RU","Oxygen Steel Furnace Gas","exio" +"32305","Russia","RU","Gas Works Gas","exio" +"32306","Russia","RU","Biogas","exio" +"32307","Russia","RU","Distribution services of gaseous fuels through mains","exio" +"32308","Russia","RU","Steam and hot water supply services","exio" +"32309","Russia","RU","Collected and purified water, distribution services of water","exio" +"32310","Russia","RU","Construction work","exio" +"32311","Russia","RU","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"32312","Russia","RU","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"32313","Russia","RU","Retail trade services of motor fuel","exio" +"32314","Russia","RU","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"32315","Russia","RU","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"32316","Russia","RU","Hotel and restaurant services","exio" +"32317","Russia","RU","Railway transportation services","exio" +"32318","Russia","RU","Other land transportation services","exio" +"32319","Russia","RU","Transportation services via pipelines","exio" +"32320","Russia","RU","Sea and coastal water transportation services","exio" +"32321","Russia","RU","Inland water transportation services","exio" +"32322","Russia","RU","Air transport services","exio" +"32323","Russia","RU","Supporting and auxiliary transport services; travel agency services","exio" +"32324","Russia","RU","Post and telecommunication services","exio" +"32325","Russia","RU","Financial intermediation services, except insurance and pension funding services","exio" +"32326","Russia","RU","Insurance and pension funding services, except compulsory social security services","exio" +"32327","Russia","RU","Services auxiliary to financial intermediation","exio" +"32328","Russia","RU","Real estate services","exio" +"32329","Russia","RU","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"32330","Russia","RU","Computer and related services","exio" +"32331","Russia","RU","Research and development services","exio" +"32332","Russia","RU","Other business services","exio" +"32333","Russia","RU","Public administration and defence services; compulsory social security services","exio" +"32334","Russia","RU","Education services","exio" +"32335","Russia","RU","Health and social work services","exio" +"32336","Russia","RU","Food waste for treatment: incineration","exio" +"32337","Russia","RU","Paper waste for treatment: incineration","exio" +"32338","Russia","RU","Plastic waste for treatment: incineration","exio" +"32339","Russia","RU","Intert/metal waste for treatment: incineration","exio" +"32340","Russia","RU","Textiles waste for treatment: incineration","exio" +"32341","Russia","RU","Wood waste for treatment: incineration","exio" +"32342","Russia","RU","Oil/hazardous waste for treatment: incineration","exio" +"32343","Russia","RU","Food waste for treatment: biogasification and land application","exio" +"32344","Russia","RU","Paper waste for treatment: biogasification and land application","exio" +"32345","Russia","RU","Sewage sludge for treatment: biogasification and land application","exio" +"32346","Russia","RU","Food waste for treatment: composting and land application","exio" +"32347","Russia","RU","Paper and wood waste for treatment: composting and land application","exio" +"32348","Russia","RU","Food waste for treatment: waste water treatment","exio" +"32349","Russia","RU","Other waste for treatment: waste water treatment","exio" +"32350","Russia","RU","Food waste for treatment: landfill","exio" +"32351","Russia","RU","Paper for treatment: landfill","exio" +"32352","Russia","RU","Plastic waste for treatment: landfill","exio" +"32353","Russia","RU","Inert/metal/hazardous waste for treatment: landfill","exio" +"32354","Russia","RU","Textiles waste for treatment: landfill","exio" +"32355","Russia","RU","Wood waste for treatment: landfill","exio" +"32356","Russia","RU","Membership organisation services n.e.c.","exio" +"32357","Russia","RU","Recreational, cultural and sporting services","exio" +"32358","Russia","RU","Other services","exio" +"32359","Russia","RU","Private households with employed persons","exio" +"32360","Russia","RU","Extra-territorial organizations and bodies","exio" +"32361","Australia","AU","Paddy rice","exio" +"32362","Australia","AU","Wheat","exio" +"32363","Australia","AU","Cereal grains nec","exio" +"32364","Australia","AU","Vegetables, fruit, nuts","exio" +"32365","Australia","AU","Oil seeds","exio" +"32366","Australia","AU","Sugar cane, sugar beet","exio" +"32367","Australia","AU","Plant-based fibers","exio" +"32368","Australia","AU","Crops nec","exio" +"32369","Australia","AU","Cattle","exio" +"32370","Australia","AU","Pigs","exio" +"32371","Australia","AU","Poultry","exio" +"32372","Australia","AU","Meat animals nec","exio" +"32373","Australia","AU","Animal products nec","exio" +"32374","Australia","AU","Raw milk","exio" +"32375","Australia","AU","Wool, silk-worm cocoons","exio" +"32376","Australia","AU","Manure (conventional treatment)","exio" +"32377","Australia","AU","Manure (biogas treatment)","exio" +"32378","Australia","AU","Products of forestry, logging and related services","exio" +"32379","Australia","AU","Fish and other fishing products; services incidental of fishing","exio" +"32380","Australia","AU","Anthracite","exio" +"32381","Australia","AU","Coking Coal","exio" +"32382","Australia","AU","Other Bituminous Coal","exio" +"32383","Australia","AU","Sub-Bituminous Coal","exio" +"32384","Australia","AU","Patent Fuel","exio" +"32385","Australia","AU","Lignite/Brown Coal","exio" +"32386","Australia","AU","BKB/Peat Briquettes","exio" +"32387","Australia","AU","Peat","exio" +"32388","Australia","AU","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"32389","Australia","AU","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"32390","Australia","AU","Natural Gas Liquids","exio" +"32391","Australia","AU","Other Hydrocarbons","exio" +"32392","Australia","AU","Uranium and thorium ores","exio" +"32393","Australia","AU","Iron ores","exio" +"32394","Australia","AU","Copper ores and concentrates","exio" +"32395","Australia","AU","Nickel ores and concentrates","exio" +"32396","Australia","AU","Aluminium ores and concentrates","exio" +"32397","Australia","AU","Precious metal ores and concentrates","exio" +"32398","Australia","AU","Lead, zinc and tin ores and concentrates","exio" +"32399","Australia","AU","Other non-ferrous metal ores and concentrates","exio" +"32400","Australia","AU","Stone","exio" +"32401","Australia","AU","Sand and clay","exio" +"32402","Australia","AU","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"32403","Australia","AU","Products of meat cattle","exio" +"32404","Australia","AU","Products of meat pigs","exio" +"32405","Australia","AU","Products of meat poultry","exio" +"32406","Australia","AU","Meat products nec","exio" +"32407","Australia","AU","products of Vegetable oils and fats","exio" +"32408","Australia","AU","Dairy products","exio" +"32409","Australia","AU","Processed rice","exio" +"32410","Australia","AU","Sugar","exio" +"32411","Australia","AU","Food products nec","exio" +"32412","Australia","AU","Beverages","exio" +"32413","Australia","AU","Fish products","exio" +"32414","Australia","AU","Tobacco products","exio" +"32415","Australia","AU","Textiles","exio" +"32416","Australia","AU","Wearing apparel; furs","exio" +"32417","Australia","AU","Leather and leather products","exio" +"32418","Australia","AU","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"32419","Australia","AU","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"32420","Australia","AU","Pulp","exio" +"32421","Australia","AU","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"32422","Australia","AU","Paper and paper products","exio" +"32423","Australia","AU","Printed matter and recorded media","exio" +"32424","Australia","AU","Coke Oven Coke","exio" +"32425","Australia","AU","Gas Coke","exio" +"32426","Australia","AU","Coal Tar","exio" +"32427","Australia","AU","Motor Gasoline","exio" +"32428","Australia","AU","Aviation Gasoline","exio" +"32429","Australia","AU","Gasoline Type Jet Fuel","exio" +"32430","Australia","AU","Kerosene Type Jet Fuel","exio" +"32431","Australia","AU","Kerosene","exio" +"32432","Australia","AU","Gas/Diesel Oil","exio" +"32433","Australia","AU","Heavy Fuel Oil","exio" +"32434","Australia","AU","Refinery Gas","exio" +"32435","Australia","AU","Liquefied Petroleum Gases (LPG)","exio" +"32436","Australia","AU","Refinery Feedstocks","exio" +"32437","Australia","AU","Ethane","exio" +"32438","Australia","AU","Naphtha","exio" +"32439","Australia","AU","White Spirit & SBP","exio" +"32440","Australia","AU","Lubricants","exio" +"32441","Australia","AU","Bitumen","exio" +"32442","Australia","AU","Paraffin Waxes","exio" +"32443","Australia","AU","Petroleum Coke","exio" +"32444","Australia","AU","Non-specified Petroleum Products","exio" +"32445","Australia","AU","Nuclear fuel","exio" +"32446","Australia","AU","Plastics, basic","exio" +"32447","Australia","AU","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"32448","Australia","AU","N-fertiliser","exio" +"32449","Australia","AU","P- and other fertiliser","exio" +"32450","Australia","AU","Chemicals nec","exio" +"32451","Australia","AU","Charcoal","exio" +"32452","Australia","AU","Additives/Blending Components","exio" +"32453","Australia","AU","Biogasoline","exio" +"32454","Australia","AU","Biodiesels","exio" +"32455","Australia","AU","Other Liquid Biofuels","exio" +"32456","Australia","AU","Rubber and plastic products","exio" +"32457","Australia","AU","Glass and glass products","exio" +"32458","Australia","AU","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"32459","Australia","AU","Ceramic goods","exio" +"32460","Australia","AU","Bricks, tiles and construction products, in baked clay","exio" +"32461","Australia","AU","Cement, lime and plaster","exio" +"32462","Australia","AU","Ash for treatment, Re-processing of ash into clinker","exio" +"32463","Australia","AU","Other non-metallic mineral products","exio" +"32464","Australia","AU","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"32465","Australia","AU","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"32466","Australia","AU","Precious metals","exio" +"32467","Australia","AU","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"32468","Australia","AU","Aluminium and aluminium products","exio" +"32469","Australia","AU","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"32470","Australia","AU","Lead, zinc and tin and products thereof","exio" +"32471","Australia","AU","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"32472","Australia","AU","Copper products","exio" +"32473","Australia","AU","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"32474","Australia","AU","Other non-ferrous metal products","exio" +"32475","Australia","AU","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"32476","Australia","AU","Foundry work services","exio" +"32477","Australia","AU","Fabricated metal products, except machinery and equipment","exio" +"32478","Australia","AU","Machinery and equipment n.e.c.","exio" +"32479","Australia","AU","Office machinery and computers","exio" +"32480","Australia","AU","Electrical machinery and apparatus n.e.c.","exio" +"32481","Australia","AU","Radio, television and communication equipment and apparatus","exio" +"32482","Australia","AU","Medical, precision and optical instruments, watches and clocks","exio" +"32483","Australia","AU","Motor vehicles, trailers and semi-trailers","exio" +"32484","Australia","AU","Other transport equipment","exio" +"32485","Australia","AU","Furniture; other manufactured goods n.e.c.","exio" +"32486","Australia","AU","Secondary raw materials","exio" +"32487","Australia","AU","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"32488","Australia","AU","Electricity by coal","exio" +"32489","Australia","AU","Electricity by gas","exio" +"32490","Australia","AU","Electricity by nuclear","exio" +"32491","Australia","AU","Electricity by hydro","exio" +"32492","Australia","AU","Electricity by wind","exio" +"32493","Australia","AU","Electricity by petroleum and other oil derivatives","exio" +"32494","Australia","AU","Electricity by biomass and waste","exio" +"32495","Australia","AU","Electricity by solar photovoltaic","exio" +"32496","Australia","AU","Electricity by solar thermal","exio" +"32497","Australia","AU","Electricity by tide, wave, ocean","exio" +"32498","Australia","AU","Electricity by Geothermal","exio" +"32499","Australia","AU","Electricity nec","exio" +"32500","Australia","AU","Transmission services of electricity","exio" +"32501","Australia","AU","Distribution and trade services of electricity","exio" +"32502","Australia","AU","Coke oven gas","exio" +"32503","Australia","AU","Blast Furnace Gas","exio" +"32504","Australia","AU","Oxygen Steel Furnace Gas","exio" +"32505","Australia","AU","Gas Works Gas","exio" +"32506","Australia","AU","Biogas","exio" +"32507","Australia","AU","Distribution services of gaseous fuels through mains","exio" +"32508","Australia","AU","Steam and hot water supply services","exio" +"32509","Australia","AU","Collected and purified water, distribution services of water","exio" +"32510","Australia","AU","Construction work","exio" +"32511","Australia","AU","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"32512","Australia","AU","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"32513","Australia","AU","Retail trade services of motor fuel","exio" +"32514","Australia","AU","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"32515","Australia","AU","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"32516","Australia","AU","Hotel and restaurant services","exio" +"32517","Australia","AU","Railway transportation services","exio" +"32518","Australia","AU","Other land transportation services","exio" +"32519","Australia","AU","Transportation services via pipelines","exio" +"32520","Australia","AU","Sea and coastal water transportation services","exio" +"32521","Australia","AU","Inland water transportation services","exio" +"32522","Australia","AU","Air transport services","exio" +"32523","Australia","AU","Supporting and auxiliary transport services; travel agency services","exio" +"32524","Australia","AU","Post and telecommunication services","exio" +"32525","Australia","AU","Financial intermediation services, except insurance and pension funding services","exio" +"32526","Australia","AU","Insurance and pension funding services, except compulsory social security services","exio" +"32527","Australia","AU","Services auxiliary to financial intermediation","exio" +"32528","Australia","AU","Real estate services","exio" +"32529","Australia","AU","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"32530","Australia","AU","Computer and related services","exio" +"32531","Australia","AU","Research and development services","exio" +"32532","Australia","AU","Other business services","exio" +"32533","Australia","AU","Public administration and defence services; compulsory social security services","exio" +"32534","Australia","AU","Education services","exio" +"32535","Australia","AU","Health and social work services","exio" +"32536","Australia","AU","Food waste for treatment: incineration","exio" +"32537","Australia","AU","Paper waste for treatment: incineration","exio" +"32538","Australia","AU","Plastic waste for treatment: incineration","exio" +"32539","Australia","AU","Intert/metal waste for treatment: incineration","exio" +"32540","Australia","AU","Textiles waste for treatment: incineration","exio" +"32541","Australia","AU","Wood waste for treatment: incineration","exio" +"32542","Australia","AU","Oil/hazardous waste for treatment: incineration","exio" +"32543","Australia","AU","Food waste for treatment: biogasification and land application","exio" +"32544","Australia","AU","Paper waste for treatment: biogasification and land application","exio" +"32545","Australia","AU","Sewage sludge for treatment: biogasification and land application","exio" +"32546","Australia","AU","Food waste for treatment: composting and land application","exio" +"32547","Australia","AU","Paper and wood waste for treatment: composting and land application","exio" +"32548","Australia","AU","Food waste for treatment: waste water treatment","exio" +"32549","Australia","AU","Other waste for treatment: waste water treatment","exio" +"32550","Australia","AU","Food waste for treatment: landfill","exio" +"32551","Australia","AU","Paper for treatment: landfill","exio" +"32552","Australia","AU","Plastic waste for treatment: landfill","exio" +"32553","Australia","AU","Inert/metal/hazardous waste for treatment: landfill","exio" +"32554","Australia","AU","Textiles waste for treatment: landfill","exio" +"32555","Australia","AU","Wood waste for treatment: landfill","exio" +"32556","Australia","AU","Membership organisation services n.e.c.","exio" +"32557","Australia","AU","Recreational, cultural and sporting services","exio" +"32558","Australia","AU","Other services","exio" +"32559","Australia","AU","Private households with employed persons","exio" +"32560","Australia","AU","Extra-territorial organizations and bodies","exio" +"32561","Switzerland","CH","Paddy rice","exio" +"32562","Switzerland","CH","Wheat","exio" +"32563","Switzerland","CH","Cereal grains nec","exio" +"32564","Switzerland","CH","Vegetables, fruit, nuts","exio" +"32565","Switzerland","CH","Oil seeds","exio" +"32566","Switzerland","CH","Sugar cane, sugar beet","exio" +"32567","Switzerland","CH","Plant-based fibers","exio" +"32568","Switzerland","CH","Crops nec","exio" +"32569","Switzerland","CH","Cattle","exio" +"32570","Switzerland","CH","Pigs","exio" +"32571","Switzerland","CH","Poultry","exio" +"32572","Switzerland","CH","Meat animals nec","exio" +"32573","Switzerland","CH","Animal products nec","exio" +"32574","Switzerland","CH","Raw milk","exio" +"32575","Switzerland","CH","Wool, silk-worm cocoons","exio" +"32576","Switzerland","CH","Manure (conventional treatment)","exio" +"32577","Switzerland","CH","Manure (biogas treatment)","exio" +"32578","Switzerland","CH","Products of forestry, logging and related services","exio" +"32579","Switzerland","CH","Fish and other fishing products; services incidental of fishing","exio" +"32580","Switzerland","CH","Anthracite","exio" +"32581","Switzerland","CH","Coking Coal","exio" +"32582","Switzerland","CH","Other Bituminous Coal","exio" +"32583","Switzerland","CH","Sub-Bituminous Coal","exio" +"32584","Switzerland","CH","Patent Fuel","exio" +"32585","Switzerland","CH","Lignite/Brown Coal","exio" +"32586","Switzerland","CH","BKB/Peat Briquettes","exio" +"32587","Switzerland","CH","Peat","exio" +"32588","Switzerland","CH","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"32589","Switzerland","CH","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"32590","Switzerland","CH","Natural Gas Liquids","exio" +"32591","Switzerland","CH","Other Hydrocarbons","exio" +"32592","Switzerland","CH","Uranium and thorium ores","exio" +"32593","Switzerland","CH","Iron ores","exio" +"32594","Switzerland","CH","Copper ores and concentrates","exio" +"32595","Switzerland","CH","Nickel ores and concentrates","exio" +"32596","Switzerland","CH","Aluminium ores and concentrates","exio" +"32597","Switzerland","CH","Precious metal ores and concentrates","exio" +"32598","Switzerland","CH","Lead, zinc and tin ores and concentrates","exio" +"32599","Switzerland","CH","Other non-ferrous metal ores and concentrates","exio" +"32600","Switzerland","CH","Stone","exio" +"32601","Switzerland","CH","Sand and clay","exio" +"32602","Switzerland","CH","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"32603","Switzerland","CH","Products of meat cattle","exio" +"32604","Switzerland","CH","Products of meat pigs","exio" +"32605","Switzerland","CH","Products of meat poultry","exio" +"32606","Switzerland","CH","Meat products nec","exio" +"32607","Switzerland","CH","products of Vegetable oils and fats","exio" +"32608","Switzerland","CH","Dairy products","exio" +"32609","Switzerland","CH","Processed rice","exio" +"32610","Switzerland","CH","Sugar","exio" +"32611","Switzerland","CH","Food products nec","exio" +"32612","Switzerland","CH","Beverages","exio" +"32613","Switzerland","CH","Fish products","exio" +"32614","Switzerland","CH","Tobacco products","exio" +"32615","Switzerland","CH","Textiles","exio" +"32616","Switzerland","CH","Wearing apparel; furs","exio" +"32617","Switzerland","CH","Leather and leather products","exio" +"32618","Switzerland","CH","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"32619","Switzerland","CH","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"32620","Switzerland","CH","Pulp","exio" +"32621","Switzerland","CH","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"32622","Switzerland","CH","Paper and paper products","exio" +"32623","Switzerland","CH","Printed matter and recorded media","exio" +"32624","Switzerland","CH","Coke Oven Coke","exio" +"32625","Switzerland","CH","Gas Coke","exio" +"32626","Switzerland","CH","Coal Tar","exio" +"32627","Switzerland","CH","Motor Gasoline","exio" +"32628","Switzerland","CH","Aviation Gasoline","exio" +"32629","Switzerland","CH","Gasoline Type Jet Fuel","exio" +"32630","Switzerland","CH","Kerosene Type Jet Fuel","exio" +"32631","Switzerland","CH","Kerosene","exio" +"32632","Switzerland","CH","Gas/Diesel Oil","exio" +"32633","Switzerland","CH","Heavy Fuel Oil","exio" +"32634","Switzerland","CH","Refinery Gas","exio" +"32635","Switzerland","CH","Liquefied Petroleum Gases (LPG)","exio" +"32636","Switzerland","CH","Refinery Feedstocks","exio" +"32637","Switzerland","CH","Ethane","exio" +"32638","Switzerland","CH","Naphtha","exio" +"32639","Switzerland","CH","White Spirit & SBP","exio" +"32640","Switzerland","CH","Lubricants","exio" +"32641","Switzerland","CH","Bitumen","exio" +"32642","Switzerland","CH","Paraffin Waxes","exio" +"32643","Switzerland","CH","Petroleum Coke","exio" +"32644","Switzerland","CH","Non-specified Petroleum Products","exio" +"32645","Switzerland","CH","Nuclear fuel","exio" +"32646","Switzerland","CH","Plastics, basic","exio" +"32647","Switzerland","CH","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"32648","Switzerland","CH","N-fertiliser","exio" +"32649","Switzerland","CH","P- and other fertiliser","exio" +"32650","Switzerland","CH","Chemicals nec","exio" +"32651","Switzerland","CH","Charcoal","exio" +"32652","Switzerland","CH","Additives/Blending Components","exio" +"32653","Switzerland","CH","Biogasoline","exio" +"32654","Switzerland","CH","Biodiesels","exio" +"32655","Switzerland","CH","Other Liquid Biofuels","exio" +"32656","Switzerland","CH","Rubber and plastic products","exio" +"32657","Switzerland","CH","Glass and glass products","exio" +"32658","Switzerland","CH","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"32659","Switzerland","CH","Ceramic goods","exio" +"32660","Switzerland","CH","Bricks, tiles and construction products, in baked clay","exio" +"32661","Switzerland","CH","Cement, lime and plaster","exio" +"32662","Switzerland","CH","Ash for treatment, Re-processing of ash into clinker","exio" +"32663","Switzerland","CH","Other non-metallic mineral products","exio" +"32664","Switzerland","CH","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"32665","Switzerland","CH","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"32666","Switzerland","CH","Precious metals","exio" +"32667","Switzerland","CH","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"32668","Switzerland","CH","Aluminium and aluminium products","exio" +"32669","Switzerland","CH","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"32670","Switzerland","CH","Lead, zinc and tin and products thereof","exio" +"32671","Switzerland","CH","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"32672","Switzerland","CH","Copper products","exio" +"32673","Switzerland","CH","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"32674","Switzerland","CH","Other non-ferrous metal products","exio" +"32675","Switzerland","CH","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"32676","Switzerland","CH","Foundry work services","exio" +"32677","Switzerland","CH","Fabricated metal products, except machinery and equipment","exio" +"32678","Switzerland","CH","Machinery and equipment n.e.c.","exio" +"32679","Switzerland","CH","Office machinery and computers","exio" +"32680","Switzerland","CH","Electrical machinery and apparatus n.e.c.","exio" +"32681","Switzerland","CH","Radio, television and communication equipment and apparatus","exio" +"32682","Switzerland","CH","Medical, precision and optical instruments, watches and clocks","exio" +"32683","Switzerland","CH","Motor vehicles, trailers and semi-trailers","exio" +"32684","Switzerland","CH","Other transport equipment","exio" +"32685","Switzerland","CH","Furniture; other manufactured goods n.e.c.","exio" +"32686","Switzerland","CH","Secondary raw materials","exio" +"32687","Switzerland","CH","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"32688","Switzerland","CH","Electricity by coal","exio" +"32689","Switzerland","CH","Electricity by gas","exio" +"32690","Switzerland","CH","Electricity by nuclear","exio" +"32691","Switzerland","CH","Electricity by hydro","exio" +"32692","Switzerland","CH","Electricity by wind","exio" +"32693","Switzerland","CH","Electricity by petroleum and other oil derivatives","exio" +"32694","Switzerland","CH","Electricity by biomass and waste","exio" +"32695","Switzerland","CH","Electricity by solar photovoltaic","exio" +"32696","Switzerland","CH","Electricity by solar thermal","exio" +"32697","Switzerland","CH","Electricity by tide, wave, ocean","exio" +"32698","Switzerland","CH","Electricity by Geothermal","exio" +"32699","Switzerland","CH","Electricity nec","exio" +"32700","Switzerland","CH","Transmission services of electricity","exio" +"32701","Switzerland","CH","Distribution and trade services of electricity","exio" +"32702","Switzerland","CH","Coke oven gas","exio" +"32703","Switzerland","CH","Blast Furnace Gas","exio" +"32704","Switzerland","CH","Oxygen Steel Furnace Gas","exio" +"32705","Switzerland","CH","Gas Works Gas","exio" +"32706","Switzerland","CH","Biogas","exio" +"32707","Switzerland","CH","Distribution services of gaseous fuels through mains","exio" +"32708","Switzerland","CH","Steam and hot water supply services","exio" +"32709","Switzerland","CH","Collected and purified water, distribution services of water","exio" +"32710","Switzerland","CH","Construction work","exio" +"32711","Switzerland","CH","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"32712","Switzerland","CH","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"32713","Switzerland","CH","Retail trade services of motor fuel","exio" +"32714","Switzerland","CH","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"32715","Switzerland","CH","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"32716","Switzerland","CH","Hotel and restaurant services","exio" +"32717","Switzerland","CH","Railway transportation services","exio" +"32718","Switzerland","CH","Other land transportation services","exio" +"32719","Switzerland","CH","Transportation services via pipelines","exio" +"32720","Switzerland","CH","Sea and coastal water transportation services","exio" +"32721","Switzerland","CH","Inland water transportation services","exio" +"32722","Switzerland","CH","Air transport services","exio" +"32723","Switzerland","CH","Supporting and auxiliary transport services; travel agency services","exio" +"32724","Switzerland","CH","Post and telecommunication services","exio" +"32725","Switzerland","CH","Financial intermediation services, except insurance and pension funding services","exio" +"32726","Switzerland","CH","Insurance and pension funding services, except compulsory social security services","exio" +"32727","Switzerland","CH","Services auxiliary to financial intermediation","exio" +"32728","Switzerland","CH","Real estate services","exio" +"32729","Switzerland","CH","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"32730","Switzerland","CH","Computer and related services","exio" +"32731","Switzerland","CH","Research and development services","exio" +"32732","Switzerland","CH","Other business services","exio" +"32733","Switzerland","CH","Public administration and defence services; compulsory social security services","exio" +"32734","Switzerland","CH","Education services","exio" +"32735","Switzerland","CH","Health and social work services","exio" +"32736","Switzerland","CH","Food waste for treatment: incineration","exio" +"32737","Switzerland","CH","Paper waste for treatment: incineration","exio" +"32738","Switzerland","CH","Plastic waste for treatment: incineration","exio" +"32739","Switzerland","CH","Intert/metal waste for treatment: incineration","exio" +"32740","Switzerland","CH","Textiles waste for treatment: incineration","exio" +"32741","Switzerland","CH","Wood waste for treatment: incineration","exio" +"32742","Switzerland","CH","Oil/hazardous waste for treatment: incineration","exio" +"32743","Switzerland","CH","Food waste for treatment: biogasification and land application","exio" +"32744","Switzerland","CH","Paper waste for treatment: biogasification and land application","exio" +"32745","Switzerland","CH","Sewage sludge for treatment: biogasification and land application","exio" +"32746","Switzerland","CH","Food waste for treatment: composting and land application","exio" +"32747","Switzerland","CH","Paper and wood waste for treatment: composting and land application","exio" +"32748","Switzerland","CH","Food waste for treatment: waste water treatment","exio" +"32749","Switzerland","CH","Other waste for treatment: waste water treatment","exio" +"32750","Switzerland","CH","Food waste for treatment: landfill","exio" +"32751","Switzerland","CH","Paper for treatment: landfill","exio" +"32752","Switzerland","CH","Plastic waste for treatment: landfill","exio" +"32753","Switzerland","CH","Inert/metal/hazardous waste for treatment: landfill","exio" +"32754","Switzerland","CH","Textiles waste for treatment: landfill","exio" +"32755","Switzerland","CH","Wood waste for treatment: landfill","exio" +"32756","Switzerland","CH","Membership organisation services n.e.c.","exio" +"32757","Switzerland","CH","Recreational, cultural and sporting services","exio" +"32758","Switzerland","CH","Other services","exio" +"32759","Switzerland","CH","Private households with employed persons","exio" +"32760","Switzerland","CH","Extra-territorial organizations and bodies","exio" +"32761","Turkey","TR","Paddy rice","exio" +"32762","Turkey","TR","Wheat","exio" +"32763","Turkey","TR","Cereal grains nec","exio" +"32764","Turkey","TR","Vegetables, fruit, nuts","exio" +"32765","Turkey","TR","Oil seeds","exio" +"32766","Turkey","TR","Sugar cane, sugar beet","exio" +"32767","Turkey","TR","Plant-based fibers","exio" +"32768","Turkey","TR","Crops nec","exio" +"32769","Turkey","TR","Cattle","exio" +"32770","Turkey","TR","Pigs","exio" +"32771","Turkey","TR","Poultry","exio" +"32772","Turkey","TR","Meat animals nec","exio" +"32773","Turkey","TR","Animal products nec","exio" +"32774","Turkey","TR","Raw milk","exio" +"32775","Turkey","TR","Wool, silk-worm cocoons","exio" +"32776","Turkey","TR","Manure (conventional treatment)","exio" +"32777","Turkey","TR","Manure (biogas treatment)","exio" +"32778","Turkey","TR","Products of forestry, logging and related services","exio" +"32779","Turkey","TR","Fish and other fishing products; services incidental of fishing","exio" +"32780","Turkey","TR","Anthracite","exio" +"32781","Turkey","TR","Coking Coal","exio" +"32782","Turkey","TR","Other Bituminous Coal","exio" +"32783","Turkey","TR","Sub-Bituminous Coal","exio" +"32784","Turkey","TR","Patent Fuel","exio" +"32785","Turkey","TR","Lignite/Brown Coal","exio" +"32786","Turkey","TR","BKB/Peat Briquettes","exio" +"32787","Turkey","TR","Peat","exio" +"32788","Turkey","TR","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"32789","Turkey","TR","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"32790","Turkey","TR","Natural Gas Liquids","exio" +"32791","Turkey","TR","Other Hydrocarbons","exio" +"32792","Turkey","TR","Uranium and thorium ores","exio" +"32793","Turkey","TR","Iron ores","exio" +"32794","Turkey","TR","Copper ores and concentrates","exio" +"32795","Turkey","TR","Nickel ores and concentrates","exio" +"32796","Turkey","TR","Aluminium ores and concentrates","exio" +"32797","Turkey","TR","Precious metal ores and concentrates","exio" +"32798","Turkey","TR","Lead, zinc and tin ores and concentrates","exio" +"32799","Turkey","TR","Other non-ferrous metal ores and concentrates","exio" +"32800","Turkey","TR","Stone","exio" +"32801","Turkey","TR","Sand and clay","exio" +"32802","Turkey","TR","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"32803","Turkey","TR","Products of meat cattle","exio" +"32804","Turkey","TR","Products of meat pigs","exio" +"32805","Turkey","TR","Products of meat poultry","exio" +"32806","Turkey","TR","Meat products nec","exio" +"32807","Turkey","TR","products of Vegetable oils and fats","exio" +"32808","Turkey","TR","Dairy products","exio" +"32809","Turkey","TR","Processed rice","exio" +"32810","Turkey","TR","Sugar","exio" +"32811","Turkey","TR","Food products nec","exio" +"32812","Turkey","TR","Beverages","exio" +"32813","Turkey","TR","Fish products","exio" +"32814","Turkey","TR","Tobacco products","exio" +"32815","Turkey","TR","Textiles","exio" +"32816","Turkey","TR","Wearing apparel; furs","exio" +"32817","Turkey","TR","Leather and leather products","exio" +"32818","Turkey","TR","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"32819","Turkey","TR","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"32820","Turkey","TR","Pulp","exio" +"32821","Turkey","TR","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"32822","Turkey","TR","Paper and paper products","exio" +"32823","Turkey","TR","Printed matter and recorded media","exio" +"32824","Turkey","TR","Coke Oven Coke","exio" +"32825","Turkey","TR","Gas Coke","exio" +"32826","Turkey","TR","Coal Tar","exio" +"32827","Turkey","TR","Motor Gasoline","exio" +"32828","Turkey","TR","Aviation Gasoline","exio" +"32829","Turkey","TR","Gasoline Type Jet Fuel","exio" +"32830","Turkey","TR","Kerosene Type Jet Fuel","exio" +"32831","Turkey","TR","Kerosene","exio" +"32832","Turkey","TR","Gas/Diesel Oil","exio" +"32833","Turkey","TR","Heavy Fuel Oil","exio" +"32834","Turkey","TR","Refinery Gas","exio" +"32835","Turkey","TR","Liquefied Petroleum Gases (LPG)","exio" +"32836","Turkey","TR","Refinery Feedstocks","exio" +"32837","Turkey","TR","Ethane","exio" +"32838","Turkey","TR","Naphtha","exio" +"32839","Turkey","TR","White Spirit & SBP","exio" +"32840","Turkey","TR","Lubricants","exio" +"32841","Turkey","TR","Bitumen","exio" +"32842","Turkey","TR","Paraffin Waxes","exio" +"32843","Turkey","TR","Petroleum Coke","exio" +"32844","Turkey","TR","Non-specified Petroleum Products","exio" +"32845","Turkey","TR","Nuclear fuel","exio" +"32846","Turkey","TR","Plastics, basic","exio" +"32847","Turkey","TR","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"32848","Turkey","TR","N-fertiliser","exio" +"32849","Turkey","TR","P- and other fertiliser","exio" +"32850","Turkey","TR","Chemicals nec","exio" +"32851","Turkey","TR","Charcoal","exio" +"32852","Turkey","TR","Additives/Blending Components","exio" +"32853","Turkey","TR","Biogasoline","exio" +"32854","Turkey","TR","Biodiesels","exio" +"32855","Turkey","TR","Other Liquid Biofuels","exio" +"32856","Turkey","TR","Rubber and plastic products","exio" +"32857","Turkey","TR","Glass and glass products","exio" +"32858","Turkey","TR","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"32859","Turkey","TR","Ceramic goods","exio" +"32860","Turkey","TR","Bricks, tiles and construction products, in baked clay","exio" +"32861","Turkey","TR","Cement, lime and plaster","exio" +"32862","Turkey","TR","Ash for treatment, Re-processing of ash into clinker","exio" +"32863","Turkey","TR","Other non-metallic mineral products","exio" +"32864","Turkey","TR","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"32865","Turkey","TR","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"32866","Turkey","TR","Precious metals","exio" +"32867","Turkey","TR","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"32868","Turkey","TR","Aluminium and aluminium products","exio" +"32869","Turkey","TR","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"32870","Turkey","TR","Lead, zinc and tin and products thereof","exio" +"32871","Turkey","TR","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"32872","Turkey","TR","Copper products","exio" +"32873","Turkey","TR","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"32874","Turkey","TR","Other non-ferrous metal products","exio" +"32875","Turkey","TR","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"32876","Turkey","TR","Foundry work services","exio" +"32877","Turkey","TR","Fabricated metal products, except machinery and equipment","exio" +"32878","Turkey","TR","Machinery and equipment n.e.c.","exio" +"32879","Turkey","TR","Office machinery and computers","exio" +"32880","Turkey","TR","Electrical machinery and apparatus n.e.c.","exio" +"32881","Turkey","TR","Radio, television and communication equipment and apparatus","exio" +"32882","Turkey","TR","Medical, precision and optical instruments, watches and clocks","exio" +"32883","Turkey","TR","Motor vehicles, trailers and semi-trailers","exio" +"32884","Turkey","TR","Other transport equipment","exio" +"32885","Turkey","TR","Furniture; other manufactured goods n.e.c.","exio" +"32886","Turkey","TR","Secondary raw materials","exio" +"32887","Turkey","TR","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"32888","Turkey","TR","Electricity by coal","exio" +"32889","Turkey","TR","Electricity by gas","exio" +"32890","Turkey","TR","Electricity by nuclear","exio" +"32891","Turkey","TR","Electricity by hydro","exio" +"32892","Turkey","TR","Electricity by wind","exio" +"32893","Turkey","TR","Electricity by petroleum and other oil derivatives","exio" +"32894","Turkey","TR","Electricity by biomass and waste","exio" +"32895","Turkey","TR","Electricity by solar photovoltaic","exio" +"32896","Turkey","TR","Electricity by solar thermal","exio" +"32897","Turkey","TR","Electricity by tide, wave, ocean","exio" +"32898","Turkey","TR","Electricity by Geothermal","exio" +"32899","Turkey","TR","Electricity nec","exio" +"32900","Turkey","TR","Transmission services of electricity","exio" +"32901","Turkey","TR","Distribution and trade services of electricity","exio" +"32902","Turkey","TR","Coke oven gas","exio" +"32903","Turkey","TR","Blast Furnace Gas","exio" +"32904","Turkey","TR","Oxygen Steel Furnace Gas","exio" +"32905","Turkey","TR","Gas Works Gas","exio" +"32906","Turkey","TR","Biogas","exio" +"32907","Turkey","TR","Distribution services of gaseous fuels through mains","exio" +"32908","Turkey","TR","Steam and hot water supply services","exio" +"32909","Turkey","TR","Collected and purified water, distribution services of water","exio" +"32910","Turkey","TR","Construction work","exio" +"32911","Turkey","TR","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"32912","Turkey","TR","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"32913","Turkey","TR","Retail trade services of motor fuel","exio" +"32914","Turkey","TR","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"32915","Turkey","TR","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"32916","Turkey","TR","Hotel and restaurant services","exio" +"32917","Turkey","TR","Railway transportation services","exio" +"32918","Turkey","TR","Other land transportation services","exio" +"32919","Turkey","TR","Transportation services via pipelines","exio" +"32920","Turkey","TR","Sea and coastal water transportation services","exio" +"32921","Turkey","TR","Inland water transportation services","exio" +"32922","Turkey","TR","Air transport services","exio" +"32923","Turkey","TR","Supporting and auxiliary transport services; travel agency services","exio" +"32924","Turkey","TR","Post and telecommunication services","exio" +"32925","Turkey","TR","Financial intermediation services, except insurance and pension funding services","exio" +"32926","Turkey","TR","Insurance and pension funding services, except compulsory social security services","exio" +"32927","Turkey","TR","Services auxiliary to financial intermediation","exio" +"32928","Turkey","TR","Real estate services","exio" +"32929","Turkey","TR","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"32930","Turkey","TR","Computer and related services","exio" +"32931","Turkey","TR","Research and development services","exio" +"32932","Turkey","TR","Other business services","exio" +"32933","Turkey","TR","Public administration and defence services; compulsory social security services","exio" +"32934","Turkey","TR","Education services","exio" +"32935","Turkey","TR","Health and social work services","exio" +"32936","Turkey","TR","Food waste for treatment: incineration","exio" +"32937","Turkey","TR","Paper waste for treatment: incineration","exio" +"32938","Turkey","TR","Plastic waste for treatment: incineration","exio" +"32939","Turkey","TR","Intert/metal waste for treatment: incineration","exio" +"32940","Turkey","TR","Textiles waste for treatment: incineration","exio" +"32941","Turkey","TR","Wood waste for treatment: incineration","exio" +"32942","Turkey","TR","Oil/hazardous waste for treatment: incineration","exio" +"32943","Turkey","TR","Food waste for treatment: biogasification and land application","exio" +"32944","Turkey","TR","Paper waste for treatment: biogasification and land application","exio" +"32945","Turkey","TR","Sewage sludge for treatment: biogasification and land application","exio" +"32946","Turkey","TR","Food waste for treatment: composting and land application","exio" +"32947","Turkey","TR","Paper and wood waste for treatment: composting and land application","exio" +"32948","Turkey","TR","Food waste for treatment: waste water treatment","exio" +"32949","Turkey","TR","Other waste for treatment: waste water treatment","exio" +"32950","Turkey","TR","Food waste for treatment: landfill","exio" +"32951","Turkey","TR","Paper for treatment: landfill","exio" +"32952","Turkey","TR","Plastic waste for treatment: landfill","exio" +"32953","Turkey","TR","Inert/metal/hazardous waste for treatment: landfill","exio" +"32954","Turkey","TR","Textiles waste for treatment: landfill","exio" +"32955","Turkey","TR","Wood waste for treatment: landfill","exio" +"32956","Turkey","TR","Membership organisation services n.e.c.","exio" +"32957","Turkey","TR","Recreational, cultural and sporting services","exio" +"32958","Turkey","TR","Other services","exio" +"32959","Turkey","TR","Private households with employed persons","exio" +"32960","Turkey","TR","Extra-territorial organizations and bodies","exio" +"32961","Taiwan","TW","Paddy rice","exio" +"32962","Taiwan","TW","Wheat","exio" +"32963","Taiwan","TW","Cereal grains nec","exio" +"32964","Taiwan","TW","Vegetables, fruit, nuts","exio" +"32965","Taiwan","TW","Oil seeds","exio" +"32966","Taiwan","TW","Sugar cane, sugar beet","exio" +"32967","Taiwan","TW","Plant-based fibers","exio" +"32968","Taiwan","TW","Crops nec","exio" +"32969","Taiwan","TW","Cattle","exio" +"32970","Taiwan","TW","Pigs","exio" +"32971","Taiwan","TW","Poultry","exio" +"32972","Taiwan","TW","Meat animals nec","exio" +"32973","Taiwan","TW","Animal products nec","exio" +"32974","Taiwan","TW","Raw milk","exio" +"32975","Taiwan","TW","Wool, silk-worm cocoons","exio" +"32976","Taiwan","TW","Manure (conventional treatment)","exio" +"32977","Taiwan","TW","Manure (biogas treatment)","exio" +"32978","Taiwan","TW","Products of forestry, logging and related services","exio" +"32979","Taiwan","TW","Fish and other fishing products; services incidental of fishing","exio" +"32980","Taiwan","TW","Anthracite","exio" +"32981","Taiwan","TW","Coking Coal","exio" +"32982","Taiwan","TW","Other Bituminous Coal","exio" +"32983","Taiwan","TW","Sub-Bituminous Coal","exio" +"32984","Taiwan","TW","Patent Fuel","exio" +"32985","Taiwan","TW","Lignite/Brown Coal","exio" +"32986","Taiwan","TW","BKB/Peat Briquettes","exio" +"32987","Taiwan","TW","Peat","exio" +"32988","Taiwan","TW","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"32989","Taiwan","TW","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"32990","Taiwan","TW","Natural Gas Liquids","exio" +"32991","Taiwan","TW","Other Hydrocarbons","exio" +"32992","Taiwan","TW","Uranium and thorium ores","exio" +"32993","Taiwan","TW","Iron ores","exio" +"32994","Taiwan","TW","Copper ores and concentrates","exio" +"32995","Taiwan","TW","Nickel ores and concentrates","exio" +"32996","Taiwan","TW","Aluminium ores and concentrates","exio" +"32997","Taiwan","TW","Precious metal ores and concentrates","exio" +"32998","Taiwan","TW","Lead, zinc and tin ores and concentrates","exio" +"32999","Taiwan","TW","Other non-ferrous metal ores and concentrates","exio" +"33000","Taiwan","TW","Stone","exio" +"33001","Taiwan","TW","Sand and clay","exio" +"33002","Taiwan","TW","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"33003","Taiwan","TW","Products of meat cattle","exio" +"33004","Taiwan","TW","Products of meat pigs","exio" +"33005","Taiwan","TW","Products of meat poultry","exio" +"33006","Taiwan","TW","Meat products nec","exio" +"33007","Taiwan","TW","products of Vegetable oils and fats","exio" +"33008","Taiwan","TW","Dairy products","exio" +"33009","Taiwan","TW","Processed rice","exio" +"33010","Taiwan","TW","Sugar","exio" +"33011","Taiwan","TW","Food products nec","exio" +"33012","Taiwan","TW","Beverages","exio" +"33013","Taiwan","TW","Fish products","exio" +"33014","Taiwan","TW","Tobacco products","exio" +"33015","Taiwan","TW","Textiles","exio" +"33016","Taiwan","TW","Wearing apparel; furs","exio" +"33017","Taiwan","TW","Leather and leather products","exio" +"33018","Taiwan","TW","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"33019","Taiwan","TW","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"33020","Taiwan","TW","Pulp","exio" +"33021","Taiwan","TW","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"33022","Taiwan","TW","Paper and paper products","exio" +"33023","Taiwan","TW","Printed matter and recorded media","exio" +"33024","Taiwan","TW","Coke Oven Coke","exio" +"33025","Taiwan","TW","Gas Coke","exio" +"33026","Taiwan","TW","Coal Tar","exio" +"33027","Taiwan","TW","Motor Gasoline","exio" +"33028","Taiwan","TW","Aviation Gasoline","exio" +"33029","Taiwan","TW","Gasoline Type Jet Fuel","exio" +"33030","Taiwan","TW","Kerosene Type Jet Fuel","exio" +"33031","Taiwan","TW","Kerosene","exio" +"33032","Taiwan","TW","Gas/Diesel Oil","exio" +"33033","Taiwan","TW","Heavy Fuel Oil","exio" +"33034","Taiwan","TW","Refinery Gas","exio" +"33035","Taiwan","TW","Liquefied Petroleum Gases (LPG)","exio" +"33036","Taiwan","TW","Refinery Feedstocks","exio" +"33037","Taiwan","TW","Ethane","exio" +"33038","Taiwan","TW","Naphtha","exio" +"33039","Taiwan","TW","White Spirit & SBP","exio" +"33040","Taiwan","TW","Lubricants","exio" +"33041","Taiwan","TW","Bitumen","exio" +"33042","Taiwan","TW","Paraffin Waxes","exio" +"33043","Taiwan","TW","Petroleum Coke","exio" +"33044","Taiwan","TW","Non-specified Petroleum Products","exio" +"33045","Taiwan","TW","Nuclear fuel","exio" +"33046","Taiwan","TW","Plastics, basic","exio" +"33047","Taiwan","TW","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"33048","Taiwan","TW","N-fertiliser","exio" +"33049","Taiwan","TW","P- and other fertiliser","exio" +"33050","Taiwan","TW","Chemicals nec","exio" +"33051","Taiwan","TW","Charcoal","exio" +"33052","Taiwan","TW","Additives/Blending Components","exio" +"33053","Taiwan","TW","Biogasoline","exio" +"33054","Taiwan","TW","Biodiesels","exio" +"33055","Taiwan","TW","Other Liquid Biofuels","exio" +"33056","Taiwan","TW","Rubber and plastic products","exio" +"33057","Taiwan","TW","Glass and glass products","exio" +"33058","Taiwan","TW","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"33059","Taiwan","TW","Ceramic goods","exio" +"33060","Taiwan","TW","Bricks, tiles and construction products, in baked clay","exio" +"33061","Taiwan","TW","Cement, lime and plaster","exio" +"33062","Taiwan","TW","Ash for treatment, Re-processing of ash into clinker","exio" +"33063","Taiwan","TW","Other non-metallic mineral products","exio" +"33064","Taiwan","TW","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"33065","Taiwan","TW","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"33066","Taiwan","TW","Precious metals","exio" +"33067","Taiwan","TW","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"33068","Taiwan","TW","Aluminium and aluminium products","exio" +"33069","Taiwan","TW","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"33070","Taiwan","TW","Lead, zinc and tin and products thereof","exio" +"33071","Taiwan","TW","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"33072","Taiwan","TW","Copper products","exio" +"33073","Taiwan","TW","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"33074","Taiwan","TW","Other non-ferrous metal products","exio" +"33075","Taiwan","TW","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"33076","Taiwan","TW","Foundry work services","exio" +"33077","Taiwan","TW","Fabricated metal products, except machinery and equipment","exio" +"33078","Taiwan","TW","Machinery and equipment n.e.c.","exio" +"33079","Taiwan","TW","Office machinery and computers","exio" +"33080","Taiwan","TW","Electrical machinery and apparatus n.e.c.","exio" +"33081","Taiwan","TW","Radio, television and communication equipment and apparatus","exio" +"33082","Taiwan","TW","Medical, precision and optical instruments, watches and clocks","exio" +"33083","Taiwan","TW","Motor vehicles, trailers and semi-trailers","exio" +"33084","Taiwan","TW","Other transport equipment","exio" +"33085","Taiwan","TW","Furniture; other manufactured goods n.e.c.","exio" +"33086","Taiwan","TW","Secondary raw materials","exio" +"33087","Taiwan","TW","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"33088","Taiwan","TW","Electricity by coal","exio" +"33089","Taiwan","TW","Electricity by gas","exio" +"33090","Taiwan","TW","Electricity by nuclear","exio" +"33091","Taiwan","TW","Electricity by hydro","exio" +"33092","Taiwan","TW","Electricity by wind","exio" +"33093","Taiwan","TW","Electricity by petroleum and other oil derivatives","exio" +"33094","Taiwan","TW","Electricity by biomass and waste","exio" +"33095","Taiwan","TW","Electricity by solar photovoltaic","exio" +"33096","Taiwan","TW","Electricity by solar thermal","exio" +"33097","Taiwan","TW","Electricity by tide, wave, ocean","exio" +"33098","Taiwan","TW","Electricity by Geothermal","exio" +"33099","Taiwan","TW","Electricity nec","exio" +"33100","Taiwan","TW","Transmission services of electricity","exio" +"33101","Taiwan","TW","Distribution and trade services of electricity","exio" +"33102","Taiwan","TW","Coke oven gas","exio" +"33103","Taiwan","TW","Blast Furnace Gas","exio" +"33104","Taiwan","TW","Oxygen Steel Furnace Gas","exio" +"33105","Taiwan","TW","Gas Works Gas","exio" +"33106","Taiwan","TW","Biogas","exio" +"33107","Taiwan","TW","Distribution services of gaseous fuels through mains","exio" +"33108","Taiwan","TW","Steam and hot water supply services","exio" +"33109","Taiwan","TW","Collected and purified water, distribution services of water","exio" +"33110","Taiwan","TW","Construction work","exio" +"33111","Taiwan","TW","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"33112","Taiwan","TW","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"33113","Taiwan","TW","Retail trade services of motor fuel","exio" +"33114","Taiwan","TW","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"33115","Taiwan","TW","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"33116","Taiwan","TW","Hotel and restaurant services","exio" +"33117","Taiwan","TW","Railway transportation services","exio" +"33118","Taiwan","TW","Other land transportation services","exio" +"33119","Taiwan","TW","Transportation services via pipelines","exio" +"33120","Taiwan","TW","Sea and coastal water transportation services","exio" +"33121","Taiwan","TW","Inland water transportation services","exio" +"33122","Taiwan","TW","Air transport services","exio" +"33123","Taiwan","TW","Supporting and auxiliary transport services; travel agency services","exio" +"33124","Taiwan","TW","Post and telecommunication services","exio" +"33125","Taiwan","TW","Financial intermediation services, except insurance and pension funding services","exio" +"33126","Taiwan","TW","Insurance and pension funding services, except compulsory social security services","exio" +"33127","Taiwan","TW","Services auxiliary to financial intermediation","exio" +"33128","Taiwan","TW","Real estate services","exio" +"33129","Taiwan","TW","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"33130","Taiwan","TW","Computer and related services","exio" +"33131","Taiwan","TW","Research and development services","exio" +"33132","Taiwan","TW","Other business services","exio" +"33133","Taiwan","TW","Public administration and defence services; compulsory social security services","exio" +"33134","Taiwan","TW","Education services","exio" +"33135","Taiwan","TW","Health and social work services","exio" +"33136","Taiwan","TW","Food waste for treatment: incineration","exio" +"33137","Taiwan","TW","Paper waste for treatment: incineration","exio" +"33138","Taiwan","TW","Plastic waste for treatment: incineration","exio" +"33139","Taiwan","TW","Intert/metal waste for treatment: incineration","exio" +"33140","Taiwan","TW","Textiles waste for treatment: incineration","exio" +"33141","Taiwan","TW","Wood waste for treatment: incineration","exio" +"33142","Taiwan","TW","Oil/hazardous waste for treatment: incineration","exio" +"33143","Taiwan","TW","Food waste for treatment: biogasification and land application","exio" +"33144","Taiwan","TW","Paper waste for treatment: biogasification and land application","exio" +"33145","Taiwan","TW","Sewage sludge for treatment: biogasification and land application","exio" +"33146","Taiwan","TW","Food waste for treatment: composting and land application","exio" +"33147","Taiwan","TW","Paper and wood waste for treatment: composting and land application","exio" +"33148","Taiwan","TW","Food waste for treatment: waste water treatment","exio" +"33149","Taiwan","TW","Other waste for treatment: waste water treatment","exio" +"33150","Taiwan","TW","Food waste for treatment: landfill","exio" +"33151","Taiwan","TW","Paper for treatment: landfill","exio" +"33152","Taiwan","TW","Plastic waste for treatment: landfill","exio" +"33153","Taiwan","TW","Inert/metal/hazardous waste for treatment: landfill","exio" +"33154","Taiwan","TW","Textiles waste for treatment: landfill","exio" +"33155","Taiwan","TW","Wood waste for treatment: landfill","exio" +"33156","Taiwan","TW","Membership organisation services n.e.c.","exio" +"33157","Taiwan","TW","Recreational, cultural and sporting services","exio" +"33158","Taiwan","TW","Other services","exio" +"33159","Taiwan","TW","Private households with employed persons","exio" +"33160","Taiwan","TW","Extra-territorial organizations and bodies","exio" +"33161","Norway","NO","Paddy rice","exio" +"33162","Norway","NO","Wheat","exio" +"33163","Norway","NO","Cereal grains nec","exio" +"33164","Norway","NO","Vegetables, fruit, nuts","exio" +"33165","Norway","NO","Oil seeds","exio" +"33166","Norway","NO","Sugar cane, sugar beet","exio" +"33167","Norway","NO","Plant-based fibers","exio" +"33168","Norway","NO","Crops nec","exio" +"33169","Norway","NO","Cattle","exio" +"33170","Norway","NO","Pigs","exio" +"33171","Norway","NO","Poultry","exio" +"33172","Norway","NO","Meat animals nec","exio" +"33173","Norway","NO","Animal products nec","exio" +"33174","Norway","NO","Raw milk","exio" +"33175","Norway","NO","Wool, silk-worm cocoons","exio" +"33176","Norway","NO","Manure (conventional treatment)","exio" +"33177","Norway","NO","Manure (biogas treatment)","exio" +"33178","Norway","NO","Products of forestry, logging and related services","exio" +"33179","Norway","NO","Fish and other fishing products; services incidental of fishing","exio" +"33180","Norway","NO","Anthracite","exio" +"33181","Norway","NO","Coking Coal","exio" +"33182","Norway","NO","Other Bituminous Coal","exio" +"33183","Norway","NO","Sub-Bituminous Coal","exio" +"33184","Norway","NO","Patent Fuel","exio" +"33185","Norway","NO","Lignite/Brown Coal","exio" +"33186","Norway","NO","BKB/Peat Briquettes","exio" +"33187","Norway","NO","Peat","exio" +"33188","Norway","NO","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"33189","Norway","NO","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"33190","Norway","NO","Natural Gas Liquids","exio" +"33191","Norway","NO","Other Hydrocarbons","exio" +"33192","Norway","NO","Uranium and thorium ores","exio" +"33193","Norway","NO","Iron ores","exio" +"33194","Norway","NO","Copper ores and concentrates","exio" +"33195","Norway","NO","Nickel ores and concentrates","exio" +"33196","Norway","NO","Aluminium ores and concentrates","exio" +"33197","Norway","NO","Precious metal ores and concentrates","exio" +"33198","Norway","NO","Lead, zinc and tin ores and concentrates","exio" +"33199","Norway","NO","Other non-ferrous metal ores and concentrates","exio" +"33200","Norway","NO","Stone","exio" +"33201","Norway","NO","Sand and clay","exio" +"33202","Norway","NO","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"33203","Norway","NO","Products of meat cattle","exio" +"33204","Norway","NO","Products of meat pigs","exio" +"33205","Norway","NO","Products of meat poultry","exio" +"33206","Norway","NO","Meat products nec","exio" +"33207","Norway","NO","products of Vegetable oils and fats","exio" +"33208","Norway","NO","Dairy products","exio" +"33209","Norway","NO","Processed rice","exio" +"33210","Norway","NO","Sugar","exio" +"33211","Norway","NO","Food products nec","exio" +"33212","Norway","NO","Beverages","exio" +"33213","Norway","NO","Fish products","exio" +"33214","Norway","NO","Tobacco products","exio" +"33215","Norway","NO","Textiles","exio" +"33216","Norway","NO","Wearing apparel; furs","exio" +"33217","Norway","NO","Leather and leather products","exio" +"33218","Norway","NO","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"33219","Norway","NO","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"33220","Norway","NO","Pulp","exio" +"33221","Norway","NO","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"33222","Norway","NO","Paper and paper products","exio" +"33223","Norway","NO","Printed matter and recorded media","exio" +"33224","Norway","NO","Coke Oven Coke","exio" +"33225","Norway","NO","Gas Coke","exio" +"33226","Norway","NO","Coal Tar","exio" +"33227","Norway","NO","Motor Gasoline","exio" +"33228","Norway","NO","Aviation Gasoline","exio" +"33229","Norway","NO","Gasoline Type Jet Fuel","exio" +"33230","Norway","NO","Kerosene Type Jet Fuel","exio" +"33231","Norway","NO","Kerosene","exio" +"33232","Norway","NO","Gas/Diesel Oil","exio" +"33233","Norway","NO","Heavy Fuel Oil","exio" +"33234","Norway","NO","Refinery Gas","exio" +"33235","Norway","NO","Liquefied Petroleum Gases (LPG)","exio" +"33236","Norway","NO","Refinery Feedstocks","exio" +"33237","Norway","NO","Ethane","exio" +"33238","Norway","NO","Naphtha","exio" +"33239","Norway","NO","White Spirit & SBP","exio" +"33240","Norway","NO","Lubricants","exio" +"33241","Norway","NO","Bitumen","exio" +"33242","Norway","NO","Paraffin Waxes","exio" +"33243","Norway","NO","Petroleum Coke","exio" +"33244","Norway","NO","Non-specified Petroleum Products","exio" +"33245","Norway","NO","Nuclear fuel","exio" +"33246","Norway","NO","Plastics, basic","exio" +"33247","Norway","NO","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"33248","Norway","NO","N-fertiliser","exio" +"33249","Norway","NO","P- and other fertiliser","exio" +"33250","Norway","NO","Chemicals nec","exio" +"33251","Norway","NO","Charcoal","exio" +"33252","Norway","NO","Additives/Blending Components","exio" +"33253","Norway","NO","Biogasoline","exio" +"33254","Norway","NO","Biodiesels","exio" +"33255","Norway","NO","Other Liquid Biofuels","exio" +"33256","Norway","NO","Rubber and plastic products","exio" +"33257","Norway","NO","Glass and glass products","exio" +"33258","Norway","NO","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"33259","Norway","NO","Ceramic goods","exio" +"33260","Norway","NO","Bricks, tiles and construction products, in baked clay","exio" +"33261","Norway","NO","Cement, lime and plaster","exio" +"33262","Norway","NO","Ash for treatment, Re-processing of ash into clinker","exio" +"33263","Norway","NO","Other non-metallic mineral products","exio" +"33264","Norway","NO","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"33265","Norway","NO","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"33266","Norway","NO","Precious metals","exio" +"33267","Norway","NO","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"33268","Norway","NO","Aluminium and aluminium products","exio" +"33269","Norway","NO","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"33270","Norway","NO","Lead, zinc and tin and products thereof","exio" +"33271","Norway","NO","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"33272","Norway","NO","Copper products","exio" +"33273","Norway","NO","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"33274","Norway","NO","Other non-ferrous metal products","exio" +"33275","Norway","NO","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"33276","Norway","NO","Foundry work services","exio" +"33277","Norway","NO","Fabricated metal products, except machinery and equipment","exio" +"33278","Norway","NO","Machinery and equipment n.e.c.","exio" +"33279","Norway","NO","Office machinery and computers","exio" +"33280","Norway","NO","Electrical machinery and apparatus n.e.c.","exio" +"33281","Norway","NO","Radio, television and communication equipment and apparatus","exio" +"33282","Norway","NO","Medical, precision and optical instruments, watches and clocks","exio" +"33283","Norway","NO","Motor vehicles, trailers and semi-trailers","exio" +"33284","Norway","NO","Other transport equipment","exio" +"33285","Norway","NO","Furniture; other manufactured goods n.e.c.","exio" +"33286","Norway","NO","Secondary raw materials","exio" +"33287","Norway","NO","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"33288","Norway","NO","Electricity by coal","exio" +"33289","Norway","NO","Electricity by gas","exio" +"33290","Norway","NO","Electricity by nuclear","exio" +"33291","Norway","NO","Electricity by hydro","exio" +"33292","Norway","NO","Electricity by wind","exio" +"33293","Norway","NO","Electricity by petroleum and other oil derivatives","exio" +"33294","Norway","NO","Electricity by biomass and waste","exio" +"33295","Norway","NO","Electricity by solar photovoltaic","exio" +"33296","Norway","NO","Electricity by solar thermal","exio" +"33297","Norway","NO","Electricity by tide, wave, ocean","exio" +"33298","Norway","NO","Electricity by Geothermal","exio" +"33299","Norway","NO","Electricity nec","exio" +"33300","Norway","NO","Transmission services of electricity","exio" +"33301","Norway","NO","Distribution and trade services of electricity","exio" +"33302","Norway","NO","Coke oven gas","exio" +"33303","Norway","NO","Blast Furnace Gas","exio" +"33304","Norway","NO","Oxygen Steel Furnace Gas","exio" +"33305","Norway","NO","Gas Works Gas","exio" +"33306","Norway","NO","Biogas","exio" +"33307","Norway","NO","Distribution services of gaseous fuels through mains","exio" +"33308","Norway","NO","Steam and hot water supply services","exio" +"33309","Norway","NO","Collected and purified water, distribution services of water","exio" +"33310","Norway","NO","Construction work","exio" +"33311","Norway","NO","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"33312","Norway","NO","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"33313","Norway","NO","Retail trade services of motor fuel","exio" +"33314","Norway","NO","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"33315","Norway","NO","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"33316","Norway","NO","Hotel and restaurant services","exio" +"33317","Norway","NO","Railway transportation services","exio" +"33318","Norway","NO","Other land transportation services","exio" +"33319","Norway","NO","Transportation services via pipelines","exio" +"33320","Norway","NO","Sea and coastal water transportation services","exio" +"33321","Norway","NO","Inland water transportation services","exio" +"33322","Norway","NO","Air transport services","exio" +"33323","Norway","NO","Supporting and auxiliary transport services; travel agency services","exio" +"33324","Norway","NO","Post and telecommunication services","exio" +"33325","Norway","NO","Financial intermediation services, except insurance and pension funding services","exio" +"33326","Norway","NO","Insurance and pension funding services, except compulsory social security services","exio" +"33327","Norway","NO","Services auxiliary to financial intermediation","exio" +"33328","Norway","NO","Real estate services","exio" +"33329","Norway","NO","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"33330","Norway","NO","Computer and related services","exio" +"33331","Norway","NO","Research and development services","exio" +"33332","Norway","NO","Other business services","exio" +"33333","Norway","NO","Public administration and defence services; compulsory social security services","exio" +"33334","Norway","NO","Education services","exio" +"33335","Norway","NO","Health and social work services","exio" +"33336","Norway","NO","Food waste for treatment: incineration","exio" +"33337","Norway","NO","Paper waste for treatment: incineration","exio" +"33338","Norway","NO","Plastic waste for treatment: incineration","exio" +"33339","Norway","NO","Intert/metal waste for treatment: incineration","exio" +"33340","Norway","NO","Textiles waste for treatment: incineration","exio" +"33341","Norway","NO","Wood waste for treatment: incineration","exio" +"33342","Norway","NO","Oil/hazardous waste for treatment: incineration","exio" +"33343","Norway","NO","Food waste for treatment: biogasification and land application","exio" +"33344","Norway","NO","Paper waste for treatment: biogasification and land application","exio" +"33345","Norway","NO","Sewage sludge for treatment: biogasification and land application","exio" +"33346","Norway","NO","Food waste for treatment: composting and land application","exio" +"33347","Norway","NO","Paper and wood waste for treatment: composting and land application","exio" +"33348","Norway","NO","Food waste for treatment: waste water treatment","exio" +"33349","Norway","NO","Other waste for treatment: waste water treatment","exio" +"33350","Norway","NO","Food waste for treatment: landfill","exio" +"33351","Norway","NO","Paper for treatment: landfill","exio" +"33352","Norway","NO","Plastic waste for treatment: landfill","exio" +"33353","Norway","NO","Inert/metal/hazardous waste for treatment: landfill","exio" +"33354","Norway","NO","Textiles waste for treatment: landfill","exio" +"33355","Norway","NO","Wood waste for treatment: landfill","exio" +"33356","Norway","NO","Membership organisation services n.e.c.","exio" +"33357","Norway","NO","Recreational, cultural and sporting services","exio" +"33358","Norway","NO","Other services","exio" +"33359","Norway","NO","Private households with employed persons","exio" +"33360","Norway","NO","Extra-territorial organizations and bodies","exio" +"33361","Indonesia","ID","Paddy rice","exio" +"33362","Indonesia","ID","Wheat","exio" +"33363","Indonesia","ID","Cereal grains nec","exio" +"33364","Indonesia","ID","Vegetables, fruit, nuts","exio" +"33365","Indonesia","ID","Oil seeds","exio" +"33366","Indonesia","ID","Sugar cane, sugar beet","exio" +"33367","Indonesia","ID","Plant-based fibers","exio" +"33368","Indonesia","ID","Crops nec","exio" +"33369","Indonesia","ID","Cattle","exio" +"33370","Indonesia","ID","Pigs","exio" +"33371","Indonesia","ID","Poultry","exio" +"33372","Indonesia","ID","Meat animals nec","exio" +"33373","Indonesia","ID","Animal products nec","exio" +"33374","Indonesia","ID","Raw milk","exio" +"33375","Indonesia","ID","Wool, silk-worm cocoons","exio" +"33376","Indonesia","ID","Manure (conventional treatment)","exio" +"33377","Indonesia","ID","Manure (biogas treatment)","exio" +"33378","Indonesia","ID","Products of forestry, logging and related services","exio" +"33379","Indonesia","ID","Fish and other fishing products; services incidental of fishing","exio" +"33380","Indonesia","ID","Anthracite","exio" +"33381","Indonesia","ID","Coking Coal","exio" +"33382","Indonesia","ID","Other Bituminous Coal","exio" +"33383","Indonesia","ID","Sub-Bituminous Coal","exio" +"33384","Indonesia","ID","Patent Fuel","exio" +"33385","Indonesia","ID","Lignite/Brown Coal","exio" +"33386","Indonesia","ID","BKB/Peat Briquettes","exio" +"33387","Indonesia","ID","Peat","exio" +"33388","Indonesia","ID","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"33389","Indonesia","ID","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"33390","Indonesia","ID","Natural Gas Liquids","exio" +"33391","Indonesia","ID","Other Hydrocarbons","exio" +"33392","Indonesia","ID","Uranium and thorium ores","exio" +"33393","Indonesia","ID","Iron ores","exio" +"33394","Indonesia","ID","Copper ores and concentrates","exio" +"33395","Indonesia","ID","Nickel ores and concentrates","exio" +"33396","Indonesia","ID","Aluminium ores and concentrates","exio" +"33397","Indonesia","ID","Precious metal ores and concentrates","exio" +"33398","Indonesia","ID","Lead, zinc and tin ores and concentrates","exio" +"33399","Indonesia","ID","Other non-ferrous metal ores and concentrates","exio" +"33400","Indonesia","ID","Stone","exio" +"33401","Indonesia","ID","Sand and clay","exio" +"33402","Indonesia","ID","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"33403","Indonesia","ID","Products of meat cattle","exio" +"33404","Indonesia","ID","Products of meat pigs","exio" +"33405","Indonesia","ID","Products of meat poultry","exio" +"33406","Indonesia","ID","Meat products nec","exio" +"33407","Indonesia","ID","products of Vegetable oils and fats","exio" +"33408","Indonesia","ID","Dairy products","exio" +"33409","Indonesia","ID","Processed rice","exio" +"33410","Indonesia","ID","Sugar","exio" +"33411","Indonesia","ID","Food products nec","exio" +"33412","Indonesia","ID","Beverages","exio" +"33413","Indonesia","ID","Fish products","exio" +"33414","Indonesia","ID","Tobacco products","exio" +"33415","Indonesia","ID","Textiles","exio" +"33416","Indonesia","ID","Wearing apparel; furs","exio" +"33417","Indonesia","ID","Leather and leather products","exio" +"33418","Indonesia","ID","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"33419","Indonesia","ID","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"33420","Indonesia","ID","Pulp","exio" +"33421","Indonesia","ID","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"33422","Indonesia","ID","Paper and paper products","exio" +"33423","Indonesia","ID","Printed matter and recorded media","exio" +"33424","Indonesia","ID","Coke Oven Coke","exio" +"33425","Indonesia","ID","Gas Coke","exio" +"33426","Indonesia","ID","Coal Tar","exio" +"33427","Indonesia","ID","Motor Gasoline","exio" +"33428","Indonesia","ID","Aviation Gasoline","exio" +"33429","Indonesia","ID","Gasoline Type Jet Fuel","exio" +"33430","Indonesia","ID","Kerosene Type Jet Fuel","exio" +"33431","Indonesia","ID","Kerosene","exio" +"33432","Indonesia","ID","Gas/Diesel Oil","exio" +"33433","Indonesia","ID","Heavy Fuel Oil","exio" +"33434","Indonesia","ID","Refinery Gas","exio" +"33435","Indonesia","ID","Liquefied Petroleum Gases (LPG)","exio" +"33436","Indonesia","ID","Refinery Feedstocks","exio" +"33437","Indonesia","ID","Ethane","exio" +"33438","Indonesia","ID","Naphtha","exio" +"33439","Indonesia","ID","White Spirit & SBP","exio" +"33440","Indonesia","ID","Lubricants","exio" +"33441","Indonesia","ID","Bitumen","exio" +"33442","Indonesia","ID","Paraffin Waxes","exio" +"33443","Indonesia","ID","Petroleum Coke","exio" +"33444","Indonesia","ID","Non-specified Petroleum Products","exio" +"33445","Indonesia","ID","Nuclear fuel","exio" +"33446","Indonesia","ID","Plastics, basic","exio" +"33447","Indonesia","ID","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"33448","Indonesia","ID","N-fertiliser","exio" +"33449","Indonesia","ID","P- and other fertiliser","exio" +"33450","Indonesia","ID","Chemicals nec","exio" +"33451","Indonesia","ID","Charcoal","exio" +"33452","Indonesia","ID","Additives/Blending Components","exio" +"33453","Indonesia","ID","Biogasoline","exio" +"33454","Indonesia","ID","Biodiesels","exio" +"33455","Indonesia","ID","Other Liquid Biofuels","exio" +"33456","Indonesia","ID","Rubber and plastic products","exio" +"33457","Indonesia","ID","Glass and glass products","exio" +"33458","Indonesia","ID","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"33459","Indonesia","ID","Ceramic goods","exio" +"33460","Indonesia","ID","Bricks, tiles and construction products, in baked clay","exio" +"33461","Indonesia","ID","Cement, lime and plaster","exio" +"33462","Indonesia","ID","Ash for treatment, Re-processing of ash into clinker","exio" +"33463","Indonesia","ID","Other non-metallic mineral products","exio" +"33464","Indonesia","ID","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"33465","Indonesia","ID","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"33466","Indonesia","ID","Precious metals","exio" +"33467","Indonesia","ID","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"33468","Indonesia","ID","Aluminium and aluminium products","exio" +"33469","Indonesia","ID","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"33470","Indonesia","ID","Lead, zinc and tin and products thereof","exio" +"33471","Indonesia","ID","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"33472","Indonesia","ID","Copper products","exio" +"33473","Indonesia","ID","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"33474","Indonesia","ID","Other non-ferrous metal products","exio" +"33475","Indonesia","ID","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"33476","Indonesia","ID","Foundry work services","exio" +"33477","Indonesia","ID","Fabricated metal products, except machinery and equipment","exio" +"33478","Indonesia","ID","Machinery and equipment n.e.c.","exio" +"33479","Indonesia","ID","Office machinery and computers","exio" +"33480","Indonesia","ID","Electrical machinery and apparatus n.e.c.","exio" +"33481","Indonesia","ID","Radio, television and communication equipment and apparatus","exio" +"33482","Indonesia","ID","Medical, precision and optical instruments, watches and clocks","exio" +"33483","Indonesia","ID","Motor vehicles, trailers and semi-trailers","exio" +"33484","Indonesia","ID","Other transport equipment","exio" +"33485","Indonesia","ID","Furniture; other manufactured goods n.e.c.","exio" +"33486","Indonesia","ID","Secondary raw materials","exio" +"33487","Indonesia","ID","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"33488","Indonesia","ID","Electricity by coal","exio" +"33489","Indonesia","ID","Electricity by gas","exio" +"33490","Indonesia","ID","Electricity by nuclear","exio" +"33491","Indonesia","ID","Electricity by hydro","exio" +"33492","Indonesia","ID","Electricity by wind","exio" +"33493","Indonesia","ID","Electricity by petroleum and other oil derivatives","exio" +"33494","Indonesia","ID","Electricity by biomass and waste","exio" +"33495","Indonesia","ID","Electricity by solar photovoltaic","exio" +"33496","Indonesia","ID","Electricity by solar thermal","exio" +"33497","Indonesia","ID","Electricity by tide, wave, ocean","exio" +"33498","Indonesia","ID","Electricity by Geothermal","exio" +"33499","Indonesia","ID","Electricity nec","exio" +"33500","Indonesia","ID","Transmission services of electricity","exio" +"33501","Indonesia","ID","Distribution and trade services of electricity","exio" +"33502","Indonesia","ID","Coke oven gas","exio" +"33503","Indonesia","ID","Blast Furnace Gas","exio" +"33504","Indonesia","ID","Oxygen Steel Furnace Gas","exio" +"33505","Indonesia","ID","Gas Works Gas","exio" +"33506","Indonesia","ID","Biogas","exio" +"33507","Indonesia","ID","Distribution services of gaseous fuels through mains","exio" +"33508","Indonesia","ID","Steam and hot water supply services","exio" +"33509","Indonesia","ID","Collected and purified water, distribution services of water","exio" +"33510","Indonesia","ID","Construction work","exio" +"33511","Indonesia","ID","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"33512","Indonesia","ID","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"33513","Indonesia","ID","Retail trade services of motor fuel","exio" +"33514","Indonesia","ID","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"33515","Indonesia","ID","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"33516","Indonesia","ID","Hotel and restaurant services","exio" +"33517","Indonesia","ID","Railway transportation services","exio" +"33518","Indonesia","ID","Other land transportation services","exio" +"33519","Indonesia","ID","Transportation services via pipelines","exio" +"33520","Indonesia","ID","Sea and coastal water transportation services","exio" +"33521","Indonesia","ID","Inland water transportation services","exio" +"33522","Indonesia","ID","Air transport services","exio" +"33523","Indonesia","ID","Supporting and auxiliary transport services; travel agency services","exio" +"33524","Indonesia","ID","Post and telecommunication services","exio" +"33525","Indonesia","ID","Financial intermediation services, except insurance and pension funding services","exio" +"33526","Indonesia","ID","Insurance and pension funding services, except compulsory social security services","exio" +"33527","Indonesia","ID","Services auxiliary to financial intermediation","exio" +"33528","Indonesia","ID","Real estate services","exio" +"33529","Indonesia","ID","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"33530","Indonesia","ID","Computer and related services","exio" +"33531","Indonesia","ID","Research and development services","exio" +"33532","Indonesia","ID","Other business services","exio" +"33533","Indonesia","ID","Public administration and defence services; compulsory social security services","exio" +"33534","Indonesia","ID","Education services","exio" +"33535","Indonesia","ID","Health and social work services","exio" +"33536","Indonesia","ID","Food waste for treatment: incineration","exio" +"33537","Indonesia","ID","Paper waste for treatment: incineration","exio" +"33538","Indonesia","ID","Plastic waste for treatment: incineration","exio" +"33539","Indonesia","ID","Intert/metal waste for treatment: incineration","exio" +"33540","Indonesia","ID","Textiles waste for treatment: incineration","exio" +"33541","Indonesia","ID","Wood waste for treatment: incineration","exio" +"33542","Indonesia","ID","Oil/hazardous waste for treatment: incineration","exio" +"33543","Indonesia","ID","Food waste for treatment: biogasification and land application","exio" +"33544","Indonesia","ID","Paper waste for treatment: biogasification and land application","exio" +"33545","Indonesia","ID","Sewage sludge for treatment: biogasification and land application","exio" +"33546","Indonesia","ID","Food waste for treatment: composting and land application","exio" +"33547","Indonesia","ID","Paper and wood waste for treatment: composting and land application","exio" +"33548","Indonesia","ID","Food waste for treatment: waste water treatment","exio" +"33549","Indonesia","ID","Other waste for treatment: waste water treatment","exio" +"33550","Indonesia","ID","Food waste for treatment: landfill","exio" +"33551","Indonesia","ID","Paper for treatment: landfill","exio" +"33552","Indonesia","ID","Plastic waste for treatment: landfill","exio" +"33553","Indonesia","ID","Inert/metal/hazardous waste for treatment: landfill","exio" +"33554","Indonesia","ID","Textiles waste for treatment: landfill","exio" +"33555","Indonesia","ID","Wood waste for treatment: landfill","exio" +"33556","Indonesia","ID","Membership organisation services n.e.c.","exio" +"33557","Indonesia","ID","Recreational, cultural and sporting services","exio" +"33558","Indonesia","ID","Other services","exio" +"33559","Indonesia","ID","Private households with employed persons","exio" +"33560","Indonesia","ID","Extra-territorial organizations and bodies","exio" +"33561","South Africa","ZA","Paddy rice","exio" +"33562","South Africa","ZA","Wheat","exio" +"33563","South Africa","ZA","Cereal grains nec","exio" +"33564","South Africa","ZA","Vegetables, fruit, nuts","exio" +"33565","South Africa","ZA","Oil seeds","exio" +"33566","South Africa","ZA","Sugar cane, sugar beet","exio" +"33567","South Africa","ZA","Plant-based fibers","exio" +"33568","South Africa","ZA","Crops nec","exio" +"33569","South Africa","ZA","Cattle","exio" +"33570","South Africa","ZA","Pigs","exio" +"33571","South Africa","ZA","Poultry","exio" +"33572","South Africa","ZA","Meat animals nec","exio" +"33573","South Africa","ZA","Animal products nec","exio" +"33574","South Africa","ZA","Raw milk","exio" +"33575","South Africa","ZA","Wool, silk-worm cocoons","exio" +"33576","South Africa","ZA","Manure (conventional treatment)","exio" +"33577","South Africa","ZA","Manure (biogas treatment)","exio" +"33578","South Africa","ZA","Products of forestry, logging and related services","exio" +"33579","South Africa","ZA","Fish and other fishing products; services incidental of fishing","exio" +"33580","South Africa","ZA","Anthracite","exio" +"33581","South Africa","ZA","Coking Coal","exio" +"33582","South Africa","ZA","Other Bituminous Coal","exio" +"33583","South Africa","ZA","Sub-Bituminous Coal","exio" +"33584","South Africa","ZA","Patent Fuel","exio" +"33585","South Africa","ZA","Lignite/Brown Coal","exio" +"33586","South Africa","ZA","BKB/Peat Briquettes","exio" +"33587","South Africa","ZA","Peat","exio" +"33588","South Africa","ZA","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"33589","South Africa","ZA","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"33590","South Africa","ZA","Natural Gas Liquids","exio" +"33591","South Africa","ZA","Other Hydrocarbons","exio" +"33592","South Africa","ZA","Uranium and thorium ores","exio" +"33593","South Africa","ZA","Iron ores","exio" +"33594","South Africa","ZA","Copper ores and concentrates","exio" +"33595","South Africa","ZA","Nickel ores and concentrates","exio" +"33596","South Africa","ZA","Aluminium ores and concentrates","exio" +"33597","South Africa","ZA","Precious metal ores and concentrates","exio" +"33598","South Africa","ZA","Lead, zinc and tin ores and concentrates","exio" +"33599","South Africa","ZA","Other non-ferrous metal ores and concentrates","exio" +"33600","South Africa","ZA","Stone","exio" +"33601","South Africa","ZA","Sand and clay","exio" +"33602","South Africa","ZA","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"33603","South Africa","ZA","Products of meat cattle","exio" +"33604","South Africa","ZA","Products of meat pigs","exio" +"33605","South Africa","ZA","Products of meat poultry","exio" +"33606","South Africa","ZA","Meat products nec","exio" +"33607","South Africa","ZA","products of Vegetable oils and fats","exio" +"33608","South Africa","ZA","Dairy products","exio" +"33609","South Africa","ZA","Processed rice","exio" +"33610","South Africa","ZA","Sugar","exio" +"33611","South Africa","ZA","Food products nec","exio" +"33612","South Africa","ZA","Beverages","exio" +"33613","South Africa","ZA","Fish products","exio" +"33614","South Africa","ZA","Tobacco products","exio" +"33615","South Africa","ZA","Textiles","exio" +"33616","South Africa","ZA","Wearing apparel; furs","exio" +"33617","South Africa","ZA","Leather and leather products","exio" +"33618","South Africa","ZA","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"33619","South Africa","ZA","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"33620","South Africa","ZA","Pulp","exio" +"33621","South Africa","ZA","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"33622","South Africa","ZA","Paper and paper products","exio" +"33623","South Africa","ZA","Printed matter and recorded media","exio" +"33624","South Africa","ZA","Coke Oven Coke","exio" +"33625","South Africa","ZA","Gas Coke","exio" +"33626","South Africa","ZA","Coal Tar","exio" +"33627","South Africa","ZA","Motor Gasoline","exio" +"33628","South Africa","ZA","Aviation Gasoline","exio" +"33629","South Africa","ZA","Gasoline Type Jet Fuel","exio" +"33630","South Africa","ZA","Kerosene Type Jet Fuel","exio" +"33631","South Africa","ZA","Kerosene","exio" +"33632","South Africa","ZA","Gas/Diesel Oil","exio" +"33633","South Africa","ZA","Heavy Fuel Oil","exio" +"33634","South Africa","ZA","Refinery Gas","exio" +"33635","South Africa","ZA","Liquefied Petroleum Gases (LPG)","exio" +"33636","South Africa","ZA","Refinery Feedstocks","exio" +"33637","South Africa","ZA","Ethane","exio" +"33638","South Africa","ZA","Naphtha","exio" +"33639","South Africa","ZA","White Spirit & SBP","exio" +"33640","South Africa","ZA","Lubricants","exio" +"33641","South Africa","ZA","Bitumen","exio" +"33642","South Africa","ZA","Paraffin Waxes","exio" +"33643","South Africa","ZA","Petroleum Coke","exio" +"33644","South Africa","ZA","Non-specified Petroleum Products","exio" +"33645","South Africa","ZA","Nuclear fuel","exio" +"33646","South Africa","ZA","Plastics, basic","exio" +"33647","South Africa","ZA","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"33648","South Africa","ZA","N-fertiliser","exio" +"33649","South Africa","ZA","P- and other fertiliser","exio" +"33650","South Africa","ZA","Chemicals nec","exio" +"33651","South Africa","ZA","Charcoal","exio" +"33652","South Africa","ZA","Additives/Blending Components","exio" +"33653","South Africa","ZA","Biogasoline","exio" +"33654","South Africa","ZA","Biodiesels","exio" +"33655","South Africa","ZA","Other Liquid Biofuels","exio" +"33656","South Africa","ZA","Rubber and plastic products","exio" +"33657","South Africa","ZA","Glass and glass products","exio" +"33658","South Africa","ZA","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"33659","South Africa","ZA","Ceramic goods","exio" +"33660","South Africa","ZA","Bricks, tiles and construction products, in baked clay","exio" +"33661","South Africa","ZA","Cement, lime and plaster","exio" +"33662","South Africa","ZA","Ash for treatment, Re-processing of ash into clinker","exio" +"33663","South Africa","ZA","Other non-metallic mineral products","exio" +"33664","South Africa","ZA","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"33665","South Africa","ZA","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"33666","South Africa","ZA","Precious metals","exio" +"33667","South Africa","ZA","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"33668","South Africa","ZA","Aluminium and aluminium products","exio" +"33669","South Africa","ZA","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"33670","South Africa","ZA","Lead, zinc and tin and products thereof","exio" +"33671","South Africa","ZA","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"33672","South Africa","ZA","Copper products","exio" +"33673","South Africa","ZA","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"33674","South Africa","ZA","Other non-ferrous metal products","exio" +"33675","South Africa","ZA","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"33676","South Africa","ZA","Foundry work services","exio" +"33677","South Africa","ZA","Fabricated metal products, except machinery and equipment","exio" +"33678","South Africa","ZA","Machinery and equipment n.e.c.","exio" +"33679","South Africa","ZA","Office machinery and computers","exio" +"33680","South Africa","ZA","Electrical machinery and apparatus n.e.c.","exio" +"33681","South Africa","ZA","Radio, television and communication equipment and apparatus","exio" +"33682","South Africa","ZA","Medical, precision and optical instruments, watches and clocks","exio" +"33683","South Africa","ZA","Motor vehicles, trailers and semi-trailers","exio" +"33684","South Africa","ZA","Other transport equipment","exio" +"33685","South Africa","ZA","Furniture; other manufactured goods n.e.c.","exio" +"33686","South Africa","ZA","Secondary raw materials","exio" +"33687","South Africa","ZA","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"33688","South Africa","ZA","Electricity by coal","exio" +"33689","South Africa","ZA","Electricity by gas","exio" +"33690","South Africa","ZA","Electricity by nuclear","exio" +"33691","South Africa","ZA","Electricity by hydro","exio" +"33692","South Africa","ZA","Electricity by wind","exio" +"33693","South Africa","ZA","Electricity by petroleum and other oil derivatives","exio" +"33694","South Africa","ZA","Electricity by biomass and waste","exio" +"33695","South Africa","ZA","Electricity by solar photovoltaic","exio" +"33696","South Africa","ZA","Electricity by solar thermal","exio" +"33697","South Africa","ZA","Electricity by tide, wave, ocean","exio" +"33698","South Africa","ZA","Electricity by Geothermal","exio" +"33699","South Africa","ZA","Electricity nec","exio" +"33700","South Africa","ZA","Transmission services of electricity","exio" +"33701","South Africa","ZA","Distribution and trade services of electricity","exio" +"33702","South Africa","ZA","Coke oven gas","exio" +"33703","South Africa","ZA","Blast Furnace Gas","exio" +"33704","South Africa","ZA","Oxygen Steel Furnace Gas","exio" +"33705","South Africa","ZA","Gas Works Gas","exio" +"33706","South Africa","ZA","Biogas","exio" +"33707","South Africa","ZA","Distribution services of gaseous fuels through mains","exio" +"33708","South Africa","ZA","Steam and hot water supply services","exio" +"33709","South Africa","ZA","Collected and purified water, distribution services of water","exio" +"33710","South Africa","ZA","Construction work","exio" +"33711","South Africa","ZA","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"33712","South Africa","ZA","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"33713","South Africa","ZA","Retail trade services of motor fuel","exio" +"33714","South Africa","ZA","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"33715","South Africa","ZA","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"33716","South Africa","ZA","Hotel and restaurant services","exio" +"33717","South Africa","ZA","Railway transportation services","exio" +"33718","South Africa","ZA","Other land transportation services","exio" +"33719","South Africa","ZA","Transportation services via pipelines","exio" +"33720","South Africa","ZA","Sea and coastal water transportation services","exio" +"33721","South Africa","ZA","Inland water transportation services","exio" +"33722","South Africa","ZA","Air transport services","exio" +"33723","South Africa","ZA","Supporting and auxiliary transport services; travel agency services","exio" +"33724","South Africa","ZA","Post and telecommunication services","exio" +"33725","South Africa","ZA","Financial intermediation services, except insurance and pension funding services","exio" +"33726","South Africa","ZA","Insurance and pension funding services, except compulsory social security services","exio" +"33727","South Africa","ZA","Services auxiliary to financial intermediation","exio" +"33728","South Africa","ZA","Real estate services","exio" +"33729","South Africa","ZA","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"33730","South Africa","ZA","Computer and related services","exio" +"33731","South Africa","ZA","Research and development services","exio" +"33732","South Africa","ZA","Other business services","exio" +"33733","South Africa","ZA","Public administration and defence services; compulsory social security services","exio" +"33734","South Africa","ZA","Education services","exio" +"33735","South Africa","ZA","Health and social work services","exio" +"33736","South Africa","ZA","Food waste for treatment: incineration","exio" +"33737","South Africa","ZA","Paper waste for treatment: incineration","exio" +"33738","South Africa","ZA","Plastic waste for treatment: incineration","exio" +"33739","South Africa","ZA","Intert/metal waste for treatment: incineration","exio" +"33740","South Africa","ZA","Textiles waste for treatment: incineration","exio" +"33741","South Africa","ZA","Wood waste for treatment: incineration","exio" +"33742","South Africa","ZA","Oil/hazardous waste for treatment: incineration","exio" +"33743","South Africa","ZA","Food waste for treatment: biogasification and land application","exio" +"33744","South Africa","ZA","Paper waste for treatment: biogasification and land application","exio" +"33745","South Africa","ZA","Sewage sludge for treatment: biogasification and land application","exio" +"33746","South Africa","ZA","Food waste for treatment: composting and land application","exio" +"33747","South Africa","ZA","Paper and wood waste for treatment: composting and land application","exio" +"33748","South Africa","ZA","Food waste for treatment: waste water treatment","exio" +"33749","South Africa","ZA","Other waste for treatment: waste water treatment","exio" +"33750","South Africa","ZA","Food waste for treatment: landfill","exio" +"33751","South Africa","ZA","Paper for treatment: landfill","exio" +"33752","South Africa","ZA","Plastic waste for treatment: landfill","exio" +"33753","South Africa","ZA","Inert/metal/hazardous waste for treatment: landfill","exio" +"33754","South Africa","ZA","Textiles waste for treatment: landfill","exio" +"33755","South Africa","ZA","Wood waste for treatment: landfill","exio" +"33756","South Africa","ZA","Membership organisation services n.e.c.","exio" +"33757","South Africa","ZA","Recreational, cultural and sporting services","exio" +"33758","South Africa","ZA","Other services","exio" +"33759","South Africa","ZA","Private households with employed persons","exio" +"33760","South Africa","ZA","Extra-territorial organizations and bodies","exio" +"33761","RoW Asia and Pacific","WA","Paddy rice","exio" +"33762","RoW Asia and Pacific","WA","Wheat","exio" +"33763","RoW Asia and Pacific","WA","Cereal grains nec","exio" +"33764","RoW Asia and Pacific","WA","Vegetables, fruit, nuts","exio" +"33765","RoW Asia and Pacific","WA","Oil seeds","exio" +"33766","RoW Asia and Pacific","WA","Sugar cane, sugar beet","exio" +"33767","RoW Asia and Pacific","WA","Plant-based fibers","exio" +"33768","RoW Asia and Pacific","WA","Crops nec","exio" +"33769","RoW Asia and Pacific","WA","Cattle","exio" +"33770","RoW Asia and Pacific","WA","Pigs","exio" +"33771","RoW Asia and Pacific","WA","Poultry","exio" +"33772","RoW Asia and Pacific","WA","Meat animals nec","exio" +"33773","RoW Asia and Pacific","WA","Animal products nec","exio" +"33774","RoW Asia and Pacific","WA","Raw milk","exio" +"33775","RoW Asia and Pacific","WA","Wool, silk-worm cocoons","exio" +"33776","RoW Asia and Pacific","WA","Manure (conventional treatment)","exio" +"33777","RoW Asia and Pacific","WA","Manure (biogas treatment)","exio" +"33778","RoW Asia and Pacific","WA","Products of forestry, logging and related services","exio" +"33779","RoW Asia and Pacific","WA","Fish and other fishing products; services incidental of fishing","exio" +"33780","RoW Asia and Pacific","WA","Anthracite","exio" +"33781","RoW Asia and Pacific","WA","Coking Coal","exio" +"33782","RoW Asia and Pacific","WA","Other Bituminous Coal","exio" +"33783","RoW Asia and Pacific","WA","Sub-Bituminous Coal","exio" +"33784","RoW Asia and Pacific","WA","Patent Fuel","exio" +"33785","RoW Asia and Pacific","WA","Lignite/Brown Coal","exio" +"33786","RoW Asia and Pacific","WA","BKB/Peat Briquettes","exio" +"33787","RoW Asia and Pacific","WA","Peat","exio" +"33788","RoW Asia and Pacific","WA","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"33789","RoW Asia and Pacific","WA","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"33790","RoW Asia and Pacific","WA","Natural Gas Liquids","exio" +"33791","RoW Asia and Pacific","WA","Other Hydrocarbons","exio" +"33792","RoW Asia and Pacific","WA","Uranium and thorium ores","exio" +"33793","RoW Asia and Pacific","WA","Iron ores","exio" +"33794","RoW Asia and Pacific","WA","Copper ores and concentrates","exio" +"33795","RoW Asia and Pacific","WA","Nickel ores and concentrates","exio" +"33796","RoW Asia and Pacific","WA","Aluminium ores and concentrates","exio" +"33797","RoW Asia and Pacific","WA","Precious metal ores and concentrates","exio" +"33798","RoW Asia and Pacific","WA","Lead, zinc and tin ores and concentrates","exio" +"33799","RoW Asia and Pacific","WA","Other non-ferrous metal ores and concentrates","exio" +"33800","RoW Asia and Pacific","WA","Stone","exio" +"33801","RoW Asia and Pacific","WA","Sand and clay","exio" +"33802","RoW Asia and Pacific","WA","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"33803","RoW Asia and Pacific","WA","Products of meat cattle","exio" +"33804","RoW Asia and Pacific","WA","Products of meat pigs","exio" +"33805","RoW Asia and Pacific","WA","Products of meat poultry","exio" +"33806","RoW Asia and Pacific","WA","Meat products nec","exio" +"33807","RoW Asia and Pacific","WA","products of Vegetable oils and fats","exio" +"33808","RoW Asia and Pacific","WA","Dairy products","exio" +"33809","RoW Asia and Pacific","WA","Processed rice","exio" +"33810","RoW Asia and Pacific","WA","Sugar","exio" +"33811","RoW Asia and Pacific","WA","Food products nec","exio" +"33812","RoW Asia and Pacific","WA","Beverages","exio" +"33813","RoW Asia and Pacific","WA","Fish products","exio" +"33814","RoW Asia and Pacific","WA","Tobacco products","exio" +"33815","RoW Asia and Pacific","WA","Textiles","exio" +"33816","RoW Asia and Pacific","WA","Wearing apparel; furs","exio" +"33817","RoW Asia and Pacific","WA","Leather and leather products","exio" +"33818","RoW Asia and Pacific","WA","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"33819","RoW Asia and Pacific","WA","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"33820","RoW Asia and Pacific","WA","Pulp","exio" +"33821","RoW Asia and Pacific","WA","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"33822","RoW Asia and Pacific","WA","Paper and paper products","exio" +"33823","RoW Asia and Pacific","WA","Printed matter and recorded media","exio" +"33824","RoW Asia and Pacific","WA","Coke Oven Coke","exio" +"33825","RoW Asia and Pacific","WA","Gas Coke","exio" +"33826","RoW Asia and Pacific","WA","Coal Tar","exio" +"33827","RoW Asia and Pacific","WA","Motor Gasoline","exio" +"33828","RoW Asia and Pacific","WA","Aviation Gasoline","exio" +"33829","RoW Asia and Pacific","WA","Gasoline Type Jet Fuel","exio" +"33830","RoW Asia and Pacific","WA","Kerosene Type Jet Fuel","exio" +"33831","RoW Asia and Pacific","WA","Kerosene","exio" +"33832","RoW Asia and Pacific","WA","Gas/Diesel Oil","exio" +"33833","RoW Asia and Pacific","WA","Heavy Fuel Oil","exio" +"33834","RoW Asia and Pacific","WA","Refinery Gas","exio" +"33835","RoW Asia and Pacific","WA","Liquefied Petroleum Gases (LPG)","exio" +"33836","RoW Asia and Pacific","WA","Refinery Feedstocks","exio" +"33837","RoW Asia and Pacific","WA","Ethane","exio" +"33838","RoW Asia and Pacific","WA","Naphtha","exio" +"33839","RoW Asia and Pacific","WA","White Spirit & SBP","exio" +"33840","RoW Asia and Pacific","WA","Lubricants","exio" +"33841","RoW Asia and Pacific","WA","Bitumen","exio" +"33842","RoW Asia and Pacific","WA","Paraffin Waxes","exio" +"33843","RoW Asia and Pacific","WA","Petroleum Coke","exio" +"33844","RoW Asia and Pacific","WA","Non-specified Petroleum Products","exio" +"33845","RoW Asia and Pacific","WA","Nuclear fuel","exio" +"33846","RoW Asia and Pacific","WA","Plastics, basic","exio" +"33847","RoW Asia and Pacific","WA","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"33848","RoW Asia and Pacific","WA","N-fertiliser","exio" +"33849","RoW Asia and Pacific","WA","P- and other fertiliser","exio" +"33850","RoW Asia and Pacific","WA","Chemicals nec","exio" +"33851","RoW Asia and Pacific","WA","Charcoal","exio" +"33852","RoW Asia and Pacific","WA","Additives/Blending Components","exio" +"33853","RoW Asia and Pacific","WA","Biogasoline","exio" +"33854","RoW Asia and Pacific","WA","Biodiesels","exio" +"33855","RoW Asia and Pacific","WA","Other Liquid Biofuels","exio" +"33856","RoW Asia and Pacific","WA","Rubber and plastic products","exio" +"33857","RoW Asia and Pacific","WA","Glass and glass products","exio" +"33858","RoW Asia and Pacific","WA","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"33859","RoW Asia and Pacific","WA","Ceramic goods","exio" +"33860","RoW Asia and Pacific","WA","Bricks, tiles and construction products, in baked clay","exio" +"33861","RoW Asia and Pacific","WA","Cement, lime and plaster","exio" +"33862","RoW Asia and Pacific","WA","Ash for treatment, Re-processing of ash into clinker","exio" +"33863","RoW Asia and Pacific","WA","Other non-metallic mineral products","exio" +"33864","RoW Asia and Pacific","WA","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"33865","RoW Asia and Pacific","WA","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"33866","RoW Asia and Pacific","WA","Precious metals","exio" +"33867","RoW Asia and Pacific","WA","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"33868","RoW Asia and Pacific","WA","Aluminium and aluminium products","exio" +"33869","RoW Asia and Pacific","WA","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"33870","RoW Asia and Pacific","WA","Lead, zinc and tin and products thereof","exio" +"33871","RoW Asia and Pacific","WA","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"33872","RoW Asia and Pacific","WA","Copper products","exio" +"33873","RoW Asia and Pacific","WA","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"33874","RoW Asia and Pacific","WA","Other non-ferrous metal products","exio" +"33875","RoW Asia and Pacific","WA","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"33876","RoW Asia and Pacific","WA","Foundry work services","exio" +"33877","RoW Asia and Pacific","WA","Fabricated metal products, except machinery and equipment","exio" +"33878","RoW Asia and Pacific","WA","Machinery and equipment n.e.c.","exio" +"33879","RoW Asia and Pacific","WA","Office machinery and computers","exio" +"33880","RoW Asia and Pacific","WA","Electrical machinery and apparatus n.e.c.","exio" +"33881","RoW Asia and Pacific","WA","Radio, television and communication equipment and apparatus","exio" +"33882","RoW Asia and Pacific","WA","Medical, precision and optical instruments, watches and clocks","exio" +"33883","RoW Asia and Pacific","WA","Motor vehicles, trailers and semi-trailers","exio" +"33884","RoW Asia and Pacific","WA","Other transport equipment","exio" +"33885","RoW Asia and Pacific","WA","Furniture; other manufactured goods n.e.c.","exio" +"33886","RoW Asia and Pacific","WA","Secondary raw materials","exio" +"33887","RoW Asia and Pacific","WA","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"33888","RoW Asia and Pacific","WA","Electricity by coal","exio" +"33889","RoW Asia and Pacific","WA","Electricity by gas","exio" +"33890","RoW Asia and Pacific","WA","Electricity by nuclear","exio" +"33891","RoW Asia and Pacific","WA","Electricity by hydro","exio" +"33892","RoW Asia and Pacific","WA","Electricity by wind","exio" +"33893","RoW Asia and Pacific","WA","Electricity by petroleum and other oil derivatives","exio" +"33894","RoW Asia and Pacific","WA","Electricity by biomass and waste","exio" +"33895","RoW Asia and Pacific","WA","Electricity by solar photovoltaic","exio" +"33896","RoW Asia and Pacific","WA","Electricity by solar thermal","exio" +"33897","RoW Asia and Pacific","WA","Electricity by tide, wave, ocean","exio" +"33898","RoW Asia and Pacific","WA","Electricity by Geothermal","exio" +"33899","RoW Asia and Pacific","WA","Electricity nec","exio" +"33900","RoW Asia and Pacific","WA","Transmission services of electricity","exio" +"33901","RoW Asia and Pacific","WA","Distribution and trade services of electricity","exio" +"33902","RoW Asia and Pacific","WA","Coke oven gas","exio" +"33903","RoW Asia and Pacific","WA","Blast Furnace Gas","exio" +"33904","RoW Asia and Pacific","WA","Oxygen Steel Furnace Gas","exio" +"33905","RoW Asia and Pacific","WA","Gas Works Gas","exio" +"33906","RoW Asia and Pacific","WA","Biogas","exio" +"33907","RoW Asia and Pacific","WA","Distribution services of gaseous fuels through mains","exio" +"33908","RoW Asia and Pacific","WA","Steam and hot water supply services","exio" +"33909","RoW Asia and Pacific","WA","Collected and purified water, distribution services of water","exio" +"33910","RoW Asia and Pacific","WA","Construction work","exio" +"33911","RoW Asia and Pacific","WA","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"33912","RoW Asia and Pacific","WA","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"33913","RoW Asia and Pacific","WA","Retail trade services of motor fuel","exio" +"33914","RoW Asia and Pacific","WA","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"33915","RoW Asia and Pacific","WA","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"33916","RoW Asia and Pacific","WA","Hotel and restaurant services","exio" +"33917","RoW Asia and Pacific","WA","Railway transportation services","exio" +"33918","RoW Asia and Pacific","WA","Other land transportation services","exio" +"33919","RoW Asia and Pacific","WA","Transportation services via pipelines","exio" +"33920","RoW Asia and Pacific","WA","Sea and coastal water transportation services","exio" +"33921","RoW Asia and Pacific","WA","Inland water transportation services","exio" +"33922","RoW Asia and Pacific","WA","Air transport services","exio" +"33923","RoW Asia and Pacific","WA","Supporting and auxiliary transport services; travel agency services","exio" +"33924","RoW Asia and Pacific","WA","Post and telecommunication services","exio" +"33925","RoW Asia and Pacific","WA","Financial intermediation services, except insurance and pension funding services","exio" +"33926","RoW Asia and Pacific","WA","Insurance and pension funding services, except compulsory social security services","exio" +"33927","RoW Asia and Pacific","WA","Services auxiliary to financial intermediation","exio" +"33928","RoW Asia and Pacific","WA","Real estate services","exio" +"33929","RoW Asia and Pacific","WA","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"33930","RoW Asia and Pacific","WA","Computer and related services","exio" +"33931","RoW Asia and Pacific","WA","Research and development services","exio" +"33932","RoW Asia and Pacific","WA","Other business services","exio" +"33933","RoW Asia and Pacific","WA","Public administration and defence services; compulsory social security services","exio" +"33934","RoW Asia and Pacific","WA","Education services","exio" +"33935","RoW Asia and Pacific","WA","Health and social work services","exio" +"33936","RoW Asia and Pacific","WA","Food waste for treatment: incineration","exio" +"33937","RoW Asia and Pacific","WA","Paper waste for treatment: incineration","exio" +"33938","RoW Asia and Pacific","WA","Plastic waste for treatment: incineration","exio" +"33939","RoW Asia and Pacific","WA","Intert/metal waste for treatment: incineration","exio" +"33940","RoW Asia and Pacific","WA","Textiles waste for treatment: incineration","exio" +"33941","RoW Asia and Pacific","WA","Wood waste for treatment: incineration","exio" +"33942","RoW Asia and Pacific","WA","Oil/hazardous waste for treatment: incineration","exio" +"33943","RoW Asia and Pacific","WA","Food waste for treatment: biogasification and land application","exio" +"33944","RoW Asia and Pacific","WA","Paper waste for treatment: biogasification and land application","exio" +"33945","RoW Asia and Pacific","WA","Sewage sludge for treatment: biogasification and land application","exio" +"33946","RoW Asia and Pacific","WA","Food waste for treatment: composting and land application","exio" +"33947","RoW Asia and Pacific","WA","Paper and wood waste for treatment: composting and land application","exio" +"33948","RoW Asia and Pacific","WA","Food waste for treatment: waste water treatment","exio" +"33949","RoW Asia and Pacific","WA","Other waste for treatment: waste water treatment","exio" +"33950","RoW Asia and Pacific","WA","Food waste for treatment: landfill","exio" +"33951","RoW Asia and Pacific","WA","Paper for treatment: landfill","exio" +"33952","RoW Asia and Pacific","WA","Plastic waste for treatment: landfill","exio" +"33953","RoW Asia and Pacific","WA","Inert/metal/hazardous waste for treatment: landfill","exio" +"33954","RoW Asia and Pacific","WA","Textiles waste for treatment: landfill","exio" +"33955","RoW Asia and Pacific","WA","Wood waste for treatment: landfill","exio" +"33956","RoW Asia and Pacific","WA","Membership organisation services n.e.c.","exio" +"33957","RoW Asia and Pacific","WA","Recreational, cultural and sporting services","exio" +"33958","RoW Asia and Pacific","WA","Other services","exio" +"33959","RoW Asia and Pacific","WA","Private households with employed persons","exio" +"33960","RoW Asia and Pacific","WA","Extra-territorial organizations and bodies","exio" +"33961","RoW America","WL","Paddy rice","exio" +"33962","RoW America","WL","Wheat","exio" +"33963","RoW America","WL","Cereal grains nec","exio" +"33964","RoW America","WL","Vegetables, fruit, nuts","exio" +"33965","RoW America","WL","Oil seeds","exio" +"33966","RoW America","WL","Sugar cane, sugar beet","exio" +"33967","RoW America","WL","Plant-based fibers","exio" +"33968","RoW America","WL","Crops nec","exio" +"33969","RoW America","WL","Cattle","exio" +"33970","RoW America","WL","Pigs","exio" +"33971","RoW America","WL","Poultry","exio" +"33972","RoW America","WL","Meat animals nec","exio" +"33973","RoW America","WL","Animal products nec","exio" +"33974","RoW America","WL","Raw milk","exio" +"33975","RoW America","WL","Wool, silk-worm cocoons","exio" +"33976","RoW America","WL","Manure (conventional treatment)","exio" +"33977","RoW America","WL","Manure (biogas treatment)","exio" +"33978","RoW America","WL","Products of forestry, logging and related services","exio" +"33979","RoW America","WL","Fish and other fishing products; services incidental of fishing","exio" +"33980","RoW America","WL","Anthracite","exio" +"33981","RoW America","WL","Coking Coal","exio" +"33982","RoW America","WL","Other Bituminous Coal","exio" +"33983","RoW America","WL","Sub-Bituminous Coal","exio" +"33984","RoW America","WL","Patent Fuel","exio" +"33985","RoW America","WL","Lignite/Brown Coal","exio" +"33986","RoW America","WL","BKB/Peat Briquettes","exio" +"33987","RoW America","WL","Peat","exio" +"33988","RoW America","WL","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"33989","RoW America","WL","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"33990","RoW America","WL","Natural Gas Liquids","exio" +"33991","RoW America","WL","Other Hydrocarbons","exio" +"33992","RoW America","WL","Uranium and thorium ores","exio" +"33993","RoW America","WL","Iron ores","exio" +"33994","RoW America","WL","Copper ores and concentrates","exio" +"33995","RoW America","WL","Nickel ores and concentrates","exio" +"33996","RoW America","WL","Aluminium ores and concentrates","exio" +"33997","RoW America","WL","Precious metal ores and concentrates","exio" +"33998","RoW America","WL","Lead, zinc and tin ores and concentrates","exio" +"33999","RoW America","WL","Other non-ferrous metal ores and concentrates","exio" +"34000","RoW America","WL","Stone","exio" +"34001","RoW America","WL","Sand and clay","exio" +"34002","RoW America","WL","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"34003","RoW America","WL","Products of meat cattle","exio" +"34004","RoW America","WL","Products of meat pigs","exio" +"34005","RoW America","WL","Products of meat poultry","exio" +"34006","RoW America","WL","Meat products nec","exio" +"34007","RoW America","WL","products of Vegetable oils and fats","exio" +"34008","RoW America","WL","Dairy products","exio" +"34009","RoW America","WL","Processed rice","exio" +"34010","RoW America","WL","Sugar","exio" +"34011","RoW America","WL","Food products nec","exio" +"34012","RoW America","WL","Beverages","exio" +"34013","RoW America","WL","Fish products","exio" +"34014","RoW America","WL","Tobacco products","exio" +"34015","RoW America","WL","Textiles","exio" +"34016","RoW America","WL","Wearing apparel; furs","exio" +"34017","RoW America","WL","Leather and leather products","exio" +"34018","RoW America","WL","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"34019","RoW America","WL","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"34020","RoW America","WL","Pulp","exio" +"34021","RoW America","WL","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"34022","RoW America","WL","Paper and paper products","exio" +"34023","RoW America","WL","Printed matter and recorded media","exio" +"34024","RoW America","WL","Coke Oven Coke","exio" +"34025","RoW America","WL","Gas Coke","exio" +"34026","RoW America","WL","Coal Tar","exio" +"34027","RoW America","WL","Motor Gasoline","exio" +"34028","RoW America","WL","Aviation Gasoline","exio" +"34029","RoW America","WL","Gasoline Type Jet Fuel","exio" +"34030","RoW America","WL","Kerosene Type Jet Fuel","exio" +"34031","RoW America","WL","Kerosene","exio" +"34032","RoW America","WL","Gas/Diesel Oil","exio" +"34033","RoW America","WL","Heavy Fuel Oil","exio" +"34034","RoW America","WL","Refinery Gas","exio" +"34035","RoW America","WL","Liquefied Petroleum Gases (LPG)","exio" +"34036","RoW America","WL","Refinery Feedstocks","exio" +"34037","RoW America","WL","Ethane","exio" +"34038","RoW America","WL","Naphtha","exio" +"34039","RoW America","WL","White Spirit & SBP","exio" +"34040","RoW America","WL","Lubricants","exio" +"34041","RoW America","WL","Bitumen","exio" +"34042","RoW America","WL","Paraffin Waxes","exio" +"34043","RoW America","WL","Petroleum Coke","exio" +"34044","RoW America","WL","Non-specified Petroleum Products","exio" +"34045","RoW America","WL","Nuclear fuel","exio" +"34046","RoW America","WL","Plastics, basic","exio" +"34047","RoW America","WL","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"34048","RoW America","WL","N-fertiliser","exio" +"34049","RoW America","WL","P- and other fertiliser","exio" +"34050","RoW America","WL","Chemicals nec","exio" +"34051","RoW America","WL","Charcoal","exio" +"34052","RoW America","WL","Additives/Blending Components","exio" +"34053","RoW America","WL","Biogasoline","exio" +"34054","RoW America","WL","Biodiesels","exio" +"34055","RoW America","WL","Other Liquid Biofuels","exio" +"34056","RoW America","WL","Rubber and plastic products","exio" +"34057","RoW America","WL","Glass and glass products","exio" +"34058","RoW America","WL","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"34059","RoW America","WL","Ceramic goods","exio" +"34060","RoW America","WL","Bricks, tiles and construction products, in baked clay","exio" +"34061","RoW America","WL","Cement, lime and plaster","exio" +"34062","RoW America","WL","Ash for treatment, Re-processing of ash into clinker","exio" +"34063","RoW America","WL","Other non-metallic mineral products","exio" +"34064","RoW America","WL","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"34065","RoW America","WL","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"34066","RoW America","WL","Precious metals","exio" +"34067","RoW America","WL","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"34068","RoW America","WL","Aluminium and aluminium products","exio" +"34069","RoW America","WL","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"34070","RoW America","WL","Lead, zinc and tin and products thereof","exio" +"34071","RoW America","WL","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"34072","RoW America","WL","Copper products","exio" +"34073","RoW America","WL","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"34074","RoW America","WL","Other non-ferrous metal products","exio" +"34075","RoW America","WL","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"34076","RoW America","WL","Foundry work services","exio" +"34077","RoW America","WL","Fabricated metal products, except machinery and equipment","exio" +"34078","RoW America","WL","Machinery and equipment n.e.c.","exio" +"34079","RoW America","WL","Office machinery and computers","exio" +"34080","RoW America","WL","Electrical machinery and apparatus n.e.c.","exio" +"34081","RoW America","WL","Radio, television and communication equipment and apparatus","exio" +"34082","RoW America","WL","Medical, precision and optical instruments, watches and clocks","exio" +"34083","RoW America","WL","Motor vehicles, trailers and semi-trailers","exio" +"34084","RoW America","WL","Other transport equipment","exio" +"34085","RoW America","WL","Furniture; other manufactured goods n.e.c.","exio" +"34086","RoW America","WL","Secondary raw materials","exio" +"34087","RoW America","WL","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"34088","RoW America","WL","Electricity by coal","exio" +"34089","RoW America","WL","Electricity by gas","exio" +"34090","RoW America","WL","Electricity by nuclear","exio" +"34091","RoW America","WL","Electricity by hydro","exio" +"34092","RoW America","WL","Electricity by wind","exio" +"34093","RoW America","WL","Electricity by petroleum and other oil derivatives","exio" +"34094","RoW America","WL","Electricity by biomass and waste","exio" +"34095","RoW America","WL","Electricity by solar photovoltaic","exio" +"34096","RoW America","WL","Electricity by solar thermal","exio" +"34097","RoW America","WL","Electricity by tide, wave, ocean","exio" +"34098","RoW America","WL","Electricity by Geothermal","exio" +"34099","RoW America","WL","Electricity nec","exio" +"34100","RoW America","WL","Transmission services of electricity","exio" +"34101","RoW America","WL","Distribution and trade services of electricity","exio" +"34102","RoW America","WL","Coke oven gas","exio" +"34103","RoW America","WL","Blast Furnace Gas","exio" +"34104","RoW America","WL","Oxygen Steel Furnace Gas","exio" +"34105","RoW America","WL","Gas Works Gas","exio" +"34106","RoW America","WL","Biogas","exio" +"34107","RoW America","WL","Distribution services of gaseous fuels through mains","exio" +"34108","RoW America","WL","Steam and hot water supply services","exio" +"34109","RoW America","WL","Collected and purified water, distribution services of water","exio" +"34110","RoW America","WL","Construction work","exio" +"34111","RoW America","WL","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"34112","RoW America","WL","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"34113","RoW America","WL","Retail trade services of motor fuel","exio" +"34114","RoW America","WL","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"34115","RoW America","WL","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"34116","RoW America","WL","Hotel and restaurant services","exio" +"34117","RoW America","WL","Railway transportation services","exio" +"34118","RoW America","WL","Other land transportation services","exio" +"34119","RoW America","WL","Transportation services via pipelines","exio" +"34120","RoW America","WL","Sea and coastal water transportation services","exio" +"34121","RoW America","WL","Inland water transportation services","exio" +"34122","RoW America","WL","Air transport services","exio" +"34123","RoW America","WL","Supporting and auxiliary transport services; travel agency services","exio" +"34124","RoW America","WL","Post and telecommunication services","exio" +"34125","RoW America","WL","Financial intermediation services, except insurance and pension funding services","exio" +"34126","RoW America","WL","Insurance and pension funding services, except compulsory social security services","exio" +"34127","RoW America","WL","Services auxiliary to financial intermediation","exio" +"34128","RoW America","WL","Real estate services","exio" +"34129","RoW America","WL","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"34130","RoW America","WL","Computer and related services","exio" +"34131","RoW America","WL","Research and development services","exio" +"34132","RoW America","WL","Other business services","exio" +"34133","RoW America","WL","Public administration and defence services; compulsory social security services","exio" +"34134","RoW America","WL","Education services","exio" +"34135","RoW America","WL","Health and social work services","exio" +"34136","RoW America","WL","Food waste for treatment: incineration","exio" +"34137","RoW America","WL","Paper waste for treatment: incineration","exio" +"34138","RoW America","WL","Plastic waste for treatment: incineration","exio" +"34139","RoW America","WL","Intert/metal waste for treatment: incineration","exio" +"34140","RoW America","WL","Textiles waste for treatment: incineration","exio" +"34141","RoW America","WL","Wood waste for treatment: incineration","exio" +"34142","RoW America","WL","Oil/hazardous waste for treatment: incineration","exio" +"34143","RoW America","WL","Food waste for treatment: biogasification and land application","exio" +"34144","RoW America","WL","Paper waste for treatment: biogasification and land application","exio" +"34145","RoW America","WL","Sewage sludge for treatment: biogasification and land application","exio" +"34146","RoW America","WL","Food waste for treatment: composting and land application","exio" +"34147","RoW America","WL","Paper and wood waste for treatment: composting and land application","exio" +"34148","RoW America","WL","Food waste for treatment: waste water treatment","exio" +"34149","RoW America","WL","Other waste for treatment: waste water treatment","exio" +"34150","RoW America","WL","Food waste for treatment: landfill","exio" +"34151","RoW America","WL","Paper for treatment: landfill","exio" +"34152","RoW America","WL","Plastic waste for treatment: landfill","exio" +"34153","RoW America","WL","Inert/metal/hazardous waste for treatment: landfill","exio" +"34154","RoW America","WL","Textiles waste for treatment: landfill","exio" +"34155","RoW America","WL","Wood waste for treatment: landfill","exio" +"34156","RoW America","WL","Membership organisation services n.e.c.","exio" +"34157","RoW America","WL","Recreational, cultural and sporting services","exio" +"34158","RoW America","WL","Other services","exio" +"34159","RoW America","WL","Private households with employed persons","exio" +"34160","RoW America","WL","Extra-territorial organizations and bodies","exio" +"34161","RoW Europe","WE","Paddy rice","exio" +"34162","RoW Europe","WE","Wheat","exio" +"34163","RoW Europe","WE","Cereal grains nec","exio" +"34164","RoW Europe","WE","Vegetables, fruit, nuts","exio" +"34165","RoW Europe","WE","Oil seeds","exio" +"34166","RoW Europe","WE","Sugar cane, sugar beet","exio" +"34167","RoW Europe","WE","Plant-based fibers","exio" +"34168","RoW Europe","WE","Crops nec","exio" +"34169","RoW Europe","WE","Cattle","exio" +"34170","RoW Europe","WE","Pigs","exio" +"34171","RoW Europe","WE","Poultry","exio" +"34172","RoW Europe","WE","Meat animals nec","exio" +"34173","RoW Europe","WE","Animal products nec","exio" +"34174","RoW Europe","WE","Raw milk","exio" +"34175","RoW Europe","WE","Wool, silk-worm cocoons","exio" +"34176","RoW Europe","WE","Manure (conventional treatment)","exio" +"34177","RoW Europe","WE","Manure (biogas treatment)","exio" +"34178","RoW Europe","WE","Products of forestry, logging and related services","exio" +"34179","RoW Europe","WE","Fish and other fishing products; services incidental of fishing","exio" +"34180","RoW Europe","WE","Anthracite","exio" +"34181","RoW Europe","WE","Coking Coal","exio" +"34182","RoW Europe","WE","Other Bituminous Coal","exio" +"34183","RoW Europe","WE","Sub-Bituminous Coal","exio" +"34184","RoW Europe","WE","Patent Fuel","exio" +"34185","RoW Europe","WE","Lignite/Brown Coal","exio" +"34186","RoW Europe","WE","BKB/Peat Briquettes","exio" +"34187","RoW Europe","WE","Peat","exio" +"34188","RoW Europe","WE","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"34189","RoW Europe","WE","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"34190","RoW Europe","WE","Natural Gas Liquids","exio" +"34191","RoW Europe","WE","Other Hydrocarbons","exio" +"34192","RoW Europe","WE","Uranium and thorium ores","exio" +"34193","RoW Europe","WE","Iron ores","exio" +"34194","RoW Europe","WE","Copper ores and concentrates","exio" +"34195","RoW Europe","WE","Nickel ores and concentrates","exio" +"34196","RoW Europe","WE","Aluminium ores and concentrates","exio" +"34197","RoW Europe","WE","Precious metal ores and concentrates","exio" +"34198","RoW Europe","WE","Lead, zinc and tin ores and concentrates","exio" +"34199","RoW Europe","WE","Other non-ferrous metal ores and concentrates","exio" +"34200","RoW Europe","WE","Stone","exio" +"34201","RoW Europe","WE","Sand and clay","exio" +"34202","RoW Europe","WE","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"34203","RoW Europe","WE","Products of meat cattle","exio" +"34204","RoW Europe","WE","Products of meat pigs","exio" +"34205","RoW Europe","WE","Products of meat poultry","exio" +"34206","RoW Europe","WE","Meat products nec","exio" +"34207","RoW Europe","WE","products of Vegetable oils and fats","exio" +"34208","RoW Europe","WE","Dairy products","exio" +"34209","RoW Europe","WE","Processed rice","exio" +"34210","RoW Europe","WE","Sugar","exio" +"34211","RoW Europe","WE","Food products nec","exio" +"34212","RoW Europe","WE","Beverages","exio" +"34213","RoW Europe","WE","Fish products","exio" +"34214","RoW Europe","WE","Tobacco products","exio" +"34215","RoW Europe","WE","Textiles","exio" +"34216","RoW Europe","WE","Wearing apparel; furs","exio" +"34217","RoW Europe","WE","Leather and leather products","exio" +"34218","RoW Europe","WE","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"34219","RoW Europe","WE","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"34220","RoW Europe","WE","Pulp","exio" +"34221","RoW Europe","WE","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"34222","RoW Europe","WE","Paper and paper products","exio" +"34223","RoW Europe","WE","Printed matter and recorded media","exio" +"34224","RoW Europe","WE","Coke Oven Coke","exio" +"34225","RoW Europe","WE","Gas Coke","exio" +"34226","RoW Europe","WE","Coal Tar","exio" +"34227","RoW Europe","WE","Motor Gasoline","exio" +"34228","RoW Europe","WE","Aviation Gasoline","exio" +"34229","RoW Europe","WE","Gasoline Type Jet Fuel","exio" +"34230","RoW Europe","WE","Kerosene Type Jet Fuel","exio" +"34231","RoW Europe","WE","Kerosene","exio" +"34232","RoW Europe","WE","Gas/Diesel Oil","exio" +"34233","RoW Europe","WE","Heavy Fuel Oil","exio" +"34234","RoW Europe","WE","Refinery Gas","exio" +"34235","RoW Europe","WE","Liquefied Petroleum Gases (LPG)","exio" +"34236","RoW Europe","WE","Refinery Feedstocks","exio" +"34237","RoW Europe","WE","Ethane","exio" +"34238","RoW Europe","WE","Naphtha","exio" +"34239","RoW Europe","WE","White Spirit & SBP","exio" +"34240","RoW Europe","WE","Lubricants","exio" +"34241","RoW Europe","WE","Bitumen","exio" +"34242","RoW Europe","WE","Paraffin Waxes","exio" +"34243","RoW Europe","WE","Petroleum Coke","exio" +"34244","RoW Europe","WE","Non-specified Petroleum Products","exio" +"34245","RoW Europe","WE","Nuclear fuel","exio" +"34246","RoW Europe","WE","Plastics, basic","exio" +"34247","RoW Europe","WE","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"34248","RoW Europe","WE","N-fertiliser","exio" +"34249","RoW Europe","WE","P- and other fertiliser","exio" +"34250","RoW Europe","WE","Chemicals nec","exio" +"34251","RoW Europe","WE","Charcoal","exio" +"34252","RoW Europe","WE","Additives/Blending Components","exio" +"34253","RoW Europe","WE","Biogasoline","exio" +"34254","RoW Europe","WE","Biodiesels","exio" +"34255","RoW Europe","WE","Other Liquid Biofuels","exio" +"34256","RoW Europe","WE","Rubber and plastic products","exio" +"34257","RoW Europe","WE","Glass and glass products","exio" +"34258","RoW Europe","WE","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"34259","RoW Europe","WE","Ceramic goods","exio" +"34260","RoW Europe","WE","Bricks, tiles and construction products, in baked clay","exio" +"34261","RoW Europe","WE","Cement, lime and plaster","exio" +"34262","RoW Europe","WE","Ash for treatment, Re-processing of ash into clinker","exio" +"34263","RoW Europe","WE","Other non-metallic mineral products","exio" +"34264","RoW Europe","WE","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"34265","RoW Europe","WE","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"34266","RoW Europe","WE","Precious metals","exio" +"34267","RoW Europe","WE","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"34268","RoW Europe","WE","Aluminium and aluminium products","exio" +"34269","RoW Europe","WE","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"34270","RoW Europe","WE","Lead, zinc and tin and products thereof","exio" +"34271","RoW Europe","WE","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"34272","RoW Europe","WE","Copper products","exio" +"34273","RoW Europe","WE","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"34274","RoW Europe","WE","Other non-ferrous metal products","exio" +"34275","RoW Europe","WE","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"34276","RoW Europe","WE","Foundry work services","exio" +"34277","RoW Europe","WE","Fabricated metal products, except machinery and equipment","exio" +"34278","RoW Europe","WE","Machinery and equipment n.e.c.","exio" +"34279","RoW Europe","WE","Office machinery and computers","exio" +"34280","RoW Europe","WE","Electrical machinery and apparatus n.e.c.","exio" +"34281","RoW Europe","WE","Radio, television and communication equipment and apparatus","exio" +"34282","RoW Europe","WE","Medical, precision and optical instruments, watches and clocks","exio" +"34283","RoW Europe","WE","Motor vehicles, trailers and semi-trailers","exio" +"34284","RoW Europe","WE","Other transport equipment","exio" +"34285","RoW Europe","WE","Furniture; other manufactured goods n.e.c.","exio" +"34286","RoW Europe","WE","Secondary raw materials","exio" +"34287","RoW Europe","WE","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"34288","RoW Europe","WE","Electricity by coal","exio" +"34289","RoW Europe","WE","Electricity by gas","exio" +"34290","RoW Europe","WE","Electricity by nuclear","exio" +"34291","RoW Europe","WE","Electricity by hydro","exio" +"34292","RoW Europe","WE","Electricity by wind","exio" +"34293","RoW Europe","WE","Electricity by petroleum and other oil derivatives","exio" +"34294","RoW Europe","WE","Electricity by biomass and waste","exio" +"34295","RoW Europe","WE","Electricity by solar photovoltaic","exio" +"34296","RoW Europe","WE","Electricity by solar thermal","exio" +"34297","RoW Europe","WE","Electricity by tide, wave, ocean","exio" +"34298","RoW Europe","WE","Electricity by Geothermal","exio" +"34299","RoW Europe","WE","Electricity nec","exio" +"34300","RoW Europe","WE","Transmission services of electricity","exio" +"34301","RoW Europe","WE","Distribution and trade services of electricity","exio" +"34302","RoW Europe","WE","Coke oven gas","exio" +"34303","RoW Europe","WE","Blast Furnace Gas","exio" +"34304","RoW Europe","WE","Oxygen Steel Furnace Gas","exio" +"34305","RoW Europe","WE","Gas Works Gas","exio" +"34306","RoW Europe","WE","Biogas","exio" +"34307","RoW Europe","WE","Distribution services of gaseous fuels through mains","exio" +"34308","RoW Europe","WE","Steam and hot water supply services","exio" +"34309","RoW Europe","WE","Collected and purified water, distribution services of water","exio" +"34310","RoW Europe","WE","Construction work","exio" +"34311","RoW Europe","WE","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"34312","RoW Europe","WE","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"34313","RoW Europe","WE","Retail trade services of motor fuel","exio" +"34314","RoW Europe","WE","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"34315","RoW Europe","WE","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"34316","RoW Europe","WE","Hotel and restaurant services","exio" +"34317","RoW Europe","WE","Railway transportation services","exio" +"34318","RoW Europe","WE","Other land transportation services","exio" +"34319","RoW Europe","WE","Transportation services via pipelines","exio" +"34320","RoW Europe","WE","Sea and coastal water transportation services","exio" +"34321","RoW Europe","WE","Inland water transportation services","exio" +"34322","RoW Europe","WE","Air transport services","exio" +"34323","RoW Europe","WE","Supporting and auxiliary transport services; travel agency services","exio" +"34324","RoW Europe","WE","Post and telecommunication services","exio" +"34325","RoW Europe","WE","Financial intermediation services, except insurance and pension funding services","exio" +"34326","RoW Europe","WE","Insurance and pension funding services, except compulsory social security services","exio" +"34327","RoW Europe","WE","Services auxiliary to financial intermediation","exio" +"34328","RoW Europe","WE","Real estate services","exio" +"34329","RoW Europe","WE","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"34330","RoW Europe","WE","Computer and related services","exio" +"34331","RoW Europe","WE","Research and development services","exio" +"34332","RoW Europe","WE","Other business services","exio" +"34333","RoW Europe","WE","Public administration and defence services; compulsory social security services","exio" +"34334","RoW Europe","WE","Education services","exio" +"34335","RoW Europe","WE","Health and social work services","exio" +"34336","RoW Europe","WE","Food waste for treatment: incineration","exio" +"34337","RoW Europe","WE","Paper waste for treatment: incineration","exio" +"34338","RoW Europe","WE","Plastic waste for treatment: incineration","exio" +"34339","RoW Europe","WE","Intert/metal waste for treatment: incineration","exio" +"34340","RoW Europe","WE","Textiles waste for treatment: incineration","exio" +"34341","RoW Europe","WE","Wood waste for treatment: incineration","exio" +"34342","RoW Europe","WE","Oil/hazardous waste for treatment: incineration","exio" +"34343","RoW Europe","WE","Food waste for treatment: biogasification and land application","exio" +"34344","RoW Europe","WE","Paper waste for treatment: biogasification and land application","exio" +"34345","RoW Europe","WE","Sewage sludge for treatment: biogasification and land application","exio" +"34346","RoW Europe","WE","Food waste for treatment: composting and land application","exio" +"34347","RoW Europe","WE","Paper and wood waste for treatment: composting and land application","exio" +"34348","RoW Europe","WE","Food waste for treatment: waste water treatment","exio" +"34349","RoW Europe","WE","Other waste for treatment: waste water treatment","exio" +"34350","RoW Europe","WE","Food waste for treatment: landfill","exio" +"34351","RoW Europe","WE","Paper for treatment: landfill","exio" +"34352","RoW Europe","WE","Plastic waste for treatment: landfill","exio" +"34353","RoW Europe","WE","Inert/metal/hazardous waste for treatment: landfill","exio" +"34354","RoW Europe","WE","Textiles waste for treatment: landfill","exio" +"34355","RoW Europe","WE","Wood waste for treatment: landfill","exio" +"34356","RoW Europe","WE","Membership organisation services n.e.c.","exio" +"34357","RoW Europe","WE","Recreational, cultural and sporting services","exio" +"34358","RoW Europe","WE","Other services","exio" +"34359","RoW Europe","WE","Private households with employed persons","exio" +"34360","RoW Europe","WE","Extra-territorial organizations and bodies","exio" +"34361","RoW Africa","WF","Paddy rice","exio" +"34362","RoW Africa","WF","Wheat","exio" +"34363","RoW Africa","WF","Cereal grains nec","exio" +"34364","RoW Africa","WF","Vegetables, fruit, nuts","exio" +"34365","RoW Africa","WF","Oil seeds","exio" +"34366","RoW Africa","WF","Sugar cane, sugar beet","exio" +"34367","RoW Africa","WF","Plant-based fibers","exio" +"34368","RoW Africa","WF","Crops nec","exio" +"34369","RoW Africa","WF","Cattle","exio" +"34370","RoW Africa","WF","Pigs","exio" +"34371","RoW Africa","WF","Poultry","exio" +"34372","RoW Africa","WF","Meat animals nec","exio" +"34373","RoW Africa","WF","Animal products nec","exio" +"34374","RoW Africa","WF","Raw milk","exio" +"34375","RoW Africa","WF","Wool, silk-worm cocoons","exio" +"34376","RoW Africa","WF","Manure (conventional treatment)","exio" +"34377","RoW Africa","WF","Manure (biogas treatment)","exio" +"34378","RoW Africa","WF","Products of forestry, logging and related services","exio" +"34379","RoW Africa","WF","Fish and other fishing products; services incidental of fishing","exio" +"34380","RoW Africa","WF","Anthracite","exio" +"34381","RoW Africa","WF","Coking Coal","exio" +"34382","RoW Africa","WF","Other Bituminous Coal","exio" +"34383","RoW Africa","WF","Sub-Bituminous Coal","exio" +"34384","RoW Africa","WF","Patent Fuel","exio" +"34385","RoW Africa","WF","Lignite/Brown Coal","exio" +"34386","RoW Africa","WF","BKB/Peat Briquettes","exio" +"34387","RoW Africa","WF","Peat","exio" +"34388","RoW Africa","WF","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"34389","RoW Africa","WF","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"34390","RoW Africa","WF","Natural Gas Liquids","exio" +"34391","RoW Africa","WF","Other Hydrocarbons","exio" +"34392","RoW Africa","WF","Uranium and thorium ores","exio" +"34393","RoW Africa","WF","Iron ores","exio" +"34394","RoW Africa","WF","Copper ores and concentrates","exio" +"34395","RoW Africa","WF","Nickel ores and concentrates","exio" +"34396","RoW Africa","WF","Aluminium ores and concentrates","exio" +"34397","RoW Africa","WF","Precious metal ores and concentrates","exio" +"34398","RoW Africa","WF","Lead, zinc and tin ores and concentrates","exio" +"34399","RoW Africa","WF","Other non-ferrous metal ores and concentrates","exio" +"34400","RoW Africa","WF","Stone","exio" +"34401","RoW Africa","WF","Sand and clay","exio" +"34402","RoW Africa","WF","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"34403","RoW Africa","WF","Products of meat cattle","exio" +"34404","RoW Africa","WF","Products of meat pigs","exio" +"34405","RoW Africa","WF","Products of meat poultry","exio" +"34406","RoW Africa","WF","Meat products nec","exio" +"34407","RoW Africa","WF","products of Vegetable oils and fats","exio" +"34408","RoW Africa","WF","Dairy products","exio" +"34409","RoW Africa","WF","Processed rice","exio" +"34410","RoW Africa","WF","Sugar","exio" +"34411","RoW Africa","WF","Food products nec","exio" +"34412","RoW Africa","WF","Beverages","exio" +"34413","RoW Africa","WF","Fish products","exio" +"34414","RoW Africa","WF","Tobacco products","exio" +"34415","RoW Africa","WF","Textiles","exio" +"34416","RoW Africa","WF","Wearing apparel; furs","exio" +"34417","RoW Africa","WF","Leather and leather products","exio" +"34418","RoW Africa","WF","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"34419","RoW Africa","WF","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"34420","RoW Africa","WF","Pulp","exio" +"34421","RoW Africa","WF","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"34422","RoW Africa","WF","Paper and paper products","exio" +"34423","RoW Africa","WF","Printed matter and recorded media","exio" +"34424","RoW Africa","WF","Coke Oven Coke","exio" +"34425","RoW Africa","WF","Gas Coke","exio" +"34426","RoW Africa","WF","Coal Tar","exio" +"34427","RoW Africa","WF","Motor Gasoline","exio" +"34428","RoW Africa","WF","Aviation Gasoline","exio" +"34429","RoW Africa","WF","Gasoline Type Jet Fuel","exio" +"34430","RoW Africa","WF","Kerosene Type Jet Fuel","exio" +"34431","RoW Africa","WF","Kerosene","exio" +"34432","RoW Africa","WF","Gas/Diesel Oil","exio" +"34433","RoW Africa","WF","Heavy Fuel Oil","exio" +"34434","RoW Africa","WF","Refinery Gas","exio" +"34435","RoW Africa","WF","Liquefied Petroleum Gases (LPG)","exio" +"34436","RoW Africa","WF","Refinery Feedstocks","exio" +"34437","RoW Africa","WF","Ethane","exio" +"34438","RoW Africa","WF","Naphtha","exio" +"34439","RoW Africa","WF","White Spirit & SBP","exio" +"34440","RoW Africa","WF","Lubricants","exio" +"34441","RoW Africa","WF","Bitumen","exio" +"34442","RoW Africa","WF","Paraffin Waxes","exio" +"34443","RoW Africa","WF","Petroleum Coke","exio" +"34444","RoW Africa","WF","Non-specified Petroleum Products","exio" +"34445","RoW Africa","WF","Nuclear fuel","exio" +"34446","RoW Africa","WF","Plastics, basic","exio" +"34447","RoW Africa","WF","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"34448","RoW Africa","WF","N-fertiliser","exio" +"34449","RoW Africa","WF","P- and other fertiliser","exio" +"34450","RoW Africa","WF","Chemicals nec","exio" +"34451","RoW Africa","WF","Charcoal","exio" +"34452","RoW Africa","WF","Additives/Blending Components","exio" +"34453","RoW Africa","WF","Biogasoline","exio" +"34454","RoW Africa","WF","Biodiesels","exio" +"34455","RoW Africa","WF","Other Liquid Biofuels","exio" +"34456","RoW Africa","WF","Rubber and plastic products","exio" +"34457","RoW Africa","WF","Glass and glass products","exio" +"34458","RoW Africa","WF","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"34459","RoW Africa","WF","Ceramic goods","exio" +"34460","RoW Africa","WF","Bricks, tiles and construction products, in baked clay","exio" +"34461","RoW Africa","WF","Cement, lime and plaster","exio" +"34462","RoW Africa","WF","Ash for treatment, Re-processing of ash into clinker","exio" +"34463","RoW Africa","WF","Other non-metallic mineral products","exio" +"34464","RoW Africa","WF","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"34465","RoW Africa","WF","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"34466","RoW Africa","WF","Precious metals","exio" +"34467","RoW Africa","WF","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"34468","RoW Africa","WF","Aluminium and aluminium products","exio" +"34469","RoW Africa","WF","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"34470","RoW Africa","WF","Lead, zinc and tin and products thereof","exio" +"34471","RoW Africa","WF","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"34472","RoW Africa","WF","Copper products","exio" +"34473","RoW Africa","WF","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"34474","RoW Africa","WF","Other non-ferrous metal products","exio" +"34475","RoW Africa","WF","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"34476","RoW Africa","WF","Foundry work services","exio" +"34477","RoW Africa","WF","Fabricated metal products, except machinery and equipment","exio" +"34478","RoW Africa","WF","Machinery and equipment n.e.c.","exio" +"34479","RoW Africa","WF","Office machinery and computers","exio" +"34480","RoW Africa","WF","Electrical machinery and apparatus n.e.c.","exio" +"34481","RoW Africa","WF","Radio, television and communication equipment and apparatus","exio" +"34482","RoW Africa","WF","Medical, precision and optical instruments, watches and clocks","exio" +"34483","RoW Africa","WF","Motor vehicles, trailers and semi-trailers","exio" +"34484","RoW Africa","WF","Other transport equipment","exio" +"34485","RoW Africa","WF","Furniture; other manufactured goods n.e.c.","exio" +"34486","RoW Africa","WF","Secondary raw materials","exio" +"34487","RoW Africa","WF","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"34488","RoW Africa","WF","Electricity by coal","exio" +"34489","RoW Africa","WF","Electricity by gas","exio" +"34490","RoW Africa","WF","Electricity by nuclear","exio" +"34491","RoW Africa","WF","Electricity by hydro","exio" +"34492","RoW Africa","WF","Electricity by wind","exio" +"34493","RoW Africa","WF","Electricity by petroleum and other oil derivatives","exio" +"34494","RoW Africa","WF","Electricity by biomass and waste","exio" +"34495","RoW Africa","WF","Electricity by solar photovoltaic","exio" +"34496","RoW Africa","WF","Electricity by solar thermal","exio" +"34497","RoW Africa","WF","Electricity by tide, wave, ocean","exio" +"34498","RoW Africa","WF","Electricity by Geothermal","exio" +"34499","RoW Africa","WF","Electricity nec","exio" +"34500","RoW Africa","WF","Transmission services of electricity","exio" +"34501","RoW Africa","WF","Distribution and trade services of electricity","exio" +"34502","RoW Africa","WF","Coke oven gas","exio" +"34503","RoW Africa","WF","Blast Furnace Gas","exio" +"34504","RoW Africa","WF","Oxygen Steel Furnace Gas","exio" +"34505","RoW Africa","WF","Gas Works Gas","exio" +"34506","RoW Africa","WF","Biogas","exio" +"34507","RoW Africa","WF","Distribution services of gaseous fuels through mains","exio" +"34508","RoW Africa","WF","Steam and hot water supply services","exio" +"34509","RoW Africa","WF","Collected and purified water, distribution services of water","exio" +"34510","RoW Africa","WF","Construction work","exio" +"34511","RoW Africa","WF","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"34512","RoW Africa","WF","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"34513","RoW Africa","WF","Retail trade services of motor fuel","exio" +"34514","RoW Africa","WF","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"34515","RoW Africa","WF","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"34516","RoW Africa","WF","Hotel and restaurant services","exio" +"34517","RoW Africa","WF","Railway transportation services","exio" +"34518","RoW Africa","WF","Other land transportation services","exio" +"34519","RoW Africa","WF","Transportation services via pipelines","exio" +"34520","RoW Africa","WF","Sea and coastal water transportation services","exio" +"34521","RoW Africa","WF","Inland water transportation services","exio" +"34522","RoW Africa","WF","Air transport services","exio" +"34523","RoW Africa","WF","Supporting and auxiliary transport services; travel agency services","exio" +"34524","RoW Africa","WF","Post and telecommunication services","exio" +"34525","RoW Africa","WF","Financial intermediation services, except insurance and pension funding services","exio" +"34526","RoW Africa","WF","Insurance and pension funding services, except compulsory social security services","exio" +"34527","RoW Africa","WF","Services auxiliary to financial intermediation","exio" +"34528","RoW Africa","WF","Real estate services","exio" +"34529","RoW Africa","WF","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"34530","RoW Africa","WF","Computer and related services","exio" +"34531","RoW Africa","WF","Research and development services","exio" +"34532","RoW Africa","WF","Other business services","exio" +"34533","RoW Africa","WF","Public administration and defence services; compulsory social security services","exio" +"34534","RoW Africa","WF","Education services","exio" +"34535","RoW Africa","WF","Health and social work services","exio" +"34536","RoW Africa","WF","Food waste for treatment: incineration","exio" +"34537","RoW Africa","WF","Paper waste for treatment: incineration","exio" +"34538","RoW Africa","WF","Plastic waste for treatment: incineration","exio" +"34539","RoW Africa","WF","Intert/metal waste for treatment: incineration","exio" +"34540","RoW Africa","WF","Textiles waste for treatment: incineration","exio" +"34541","RoW Africa","WF","Wood waste for treatment: incineration","exio" +"34542","RoW Africa","WF","Oil/hazardous waste for treatment: incineration","exio" +"34543","RoW Africa","WF","Food waste for treatment: biogasification and land application","exio" +"34544","RoW Africa","WF","Paper waste for treatment: biogasification and land application","exio" +"34545","RoW Africa","WF","Sewage sludge for treatment: biogasification and land application","exio" +"34546","RoW Africa","WF","Food waste for treatment: composting and land application","exio" +"34547","RoW Africa","WF","Paper and wood waste for treatment: composting and land application","exio" +"34548","RoW Africa","WF","Food waste for treatment: waste water treatment","exio" +"34549","RoW Africa","WF","Other waste for treatment: waste water treatment","exio" +"34550","RoW Africa","WF","Food waste for treatment: landfill","exio" +"34551","RoW Africa","WF","Paper for treatment: landfill","exio" +"34552","RoW Africa","WF","Plastic waste for treatment: landfill","exio" +"34553","RoW Africa","WF","Inert/metal/hazardous waste for treatment: landfill","exio" +"34554","RoW Africa","WF","Textiles waste for treatment: landfill","exio" +"34555","RoW Africa","WF","Wood waste for treatment: landfill","exio" +"34556","RoW Africa","WF","Membership organisation services n.e.c.","exio" +"34557","RoW Africa","WF","Recreational, cultural and sporting services","exio" +"34558","RoW Africa","WF","Other services","exio" +"34559","RoW Africa","WF","Private households with employed persons","exio" +"34560","RoW Africa","WF","Extra-territorial organizations and bodies","exio" +"34561","RoW Middle East","WM","Paddy rice","exio" +"34562","RoW Middle East","WM","Wheat","exio" +"34563","RoW Middle East","WM","Cereal grains nec","exio" +"34564","RoW Middle East","WM","Vegetables, fruit, nuts","exio" +"34565","RoW Middle East","WM","Oil seeds","exio" +"34566","RoW Middle East","WM","Sugar cane, sugar beet","exio" +"34567","RoW Middle East","WM","Plant-based fibers","exio" +"34568","RoW Middle East","WM","Crops nec","exio" +"34569","RoW Middle East","WM","Cattle","exio" +"34570","RoW Middle East","WM","Pigs","exio" +"34571","RoW Middle East","WM","Poultry","exio" +"34572","RoW Middle East","WM","Meat animals nec","exio" +"34573","RoW Middle East","WM","Animal products nec","exio" +"34574","RoW Middle East","WM","Raw milk","exio" +"34575","RoW Middle East","WM","Wool, silk-worm cocoons","exio" +"34576","RoW Middle East","WM","Manure (conventional treatment)","exio" +"34577","RoW Middle East","WM","Manure (biogas treatment)","exio" +"34578","RoW Middle East","WM","Products of forestry, logging and related services","exio" +"34579","RoW Middle East","WM","Fish and other fishing products; services incidental of fishing","exio" +"34580","RoW Middle East","WM","Anthracite","exio" +"34581","RoW Middle East","WM","Coking Coal","exio" +"34582","RoW Middle East","WM","Other Bituminous Coal","exio" +"34583","RoW Middle East","WM","Sub-Bituminous Coal","exio" +"34584","RoW Middle East","WM","Patent Fuel","exio" +"34585","RoW Middle East","WM","Lignite/Brown Coal","exio" +"34586","RoW Middle East","WM","BKB/Peat Briquettes","exio" +"34587","RoW Middle East","WM","Peat","exio" +"34588","RoW Middle East","WM","Crude petroleum and services related to crude oil extraction, excluding surveying","exio" +"34589","RoW Middle East","WM","Natural gas and services related to natural gas extraction, excluding surveying","exio" +"34590","RoW Middle East","WM","Natural Gas Liquids","exio" +"34591","RoW Middle East","WM","Other Hydrocarbons","exio" +"34592","RoW Middle East","WM","Uranium and thorium ores","exio" +"34593","RoW Middle East","WM","Iron ores","exio" +"34594","RoW Middle East","WM","Copper ores and concentrates","exio" +"34595","RoW Middle East","WM","Nickel ores and concentrates","exio" +"34596","RoW Middle East","WM","Aluminium ores and concentrates","exio" +"34597","RoW Middle East","WM","Precious metal ores and concentrates","exio" +"34598","RoW Middle East","WM","Lead, zinc and tin ores and concentrates","exio" +"34599","RoW Middle East","WM","Other non-ferrous metal ores and concentrates","exio" +"34600","RoW Middle East","WM","Stone","exio" +"34601","RoW Middle East","WM","Sand and clay","exio" +"34602","RoW Middle East","WM","Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c.","exio" +"34603","RoW Middle East","WM","Products of meat cattle","exio" +"34604","RoW Middle East","WM","Products of meat pigs","exio" +"34605","RoW Middle East","WM","Products of meat poultry","exio" +"34606","RoW Middle East","WM","Meat products nec","exio" +"34607","RoW Middle East","WM","products of Vegetable oils and fats","exio" +"34608","RoW Middle East","WM","Dairy products","exio" +"34609","RoW Middle East","WM","Processed rice","exio" +"34610","RoW Middle East","WM","Sugar","exio" +"34611","RoW Middle East","WM","Food products nec","exio" +"34612","RoW Middle East","WM","Beverages","exio" +"34613","RoW Middle East","WM","Fish products","exio" +"34614","RoW Middle East","WM","Tobacco products","exio" +"34615","RoW Middle East","WM","Textiles","exio" +"34616","RoW Middle East","WM","Wearing apparel; furs","exio" +"34617","RoW Middle East","WM","Leather and leather products","exio" +"34618","RoW Middle East","WM","Wood and products of wood and cork (except furniture); articles of straw and plaiting materials","exio" +"34619","RoW Middle East","WM","Wood material for treatment, Re-processing of secondary wood material into new wood material","exio" +"34620","RoW Middle East","WM","Pulp","exio" +"34621","RoW Middle East","WM","Secondary paper for treatment, Re-processing of secondary paper into new pulp","exio" +"34622","RoW Middle East","WM","Paper and paper products","exio" +"34623","RoW Middle East","WM","Printed matter and recorded media","exio" +"34624","RoW Middle East","WM","Coke Oven Coke","exio" +"34625","RoW Middle East","WM","Gas Coke","exio" +"34626","RoW Middle East","WM","Coal Tar","exio" +"34627","RoW Middle East","WM","Motor Gasoline","exio" +"34628","RoW Middle East","WM","Aviation Gasoline","exio" +"34629","RoW Middle East","WM","Gasoline Type Jet Fuel","exio" +"34630","RoW Middle East","WM","Kerosene Type Jet Fuel","exio" +"34631","RoW Middle East","WM","Kerosene","exio" +"34632","RoW Middle East","WM","Gas/Diesel Oil","exio" +"34633","RoW Middle East","WM","Heavy Fuel Oil","exio" +"34634","RoW Middle East","WM","Refinery Gas","exio" +"34635","RoW Middle East","WM","Liquefied Petroleum Gases (LPG)","exio" +"34636","RoW Middle East","WM","Refinery Feedstocks","exio" +"34637","RoW Middle East","WM","Ethane","exio" +"34638","RoW Middle East","WM","Naphtha","exio" +"34639","RoW Middle East","WM","White Spirit & SBP","exio" +"34640","RoW Middle East","WM","Lubricants","exio" +"34641","RoW Middle East","WM","Bitumen","exio" +"34642","RoW Middle East","WM","Paraffin Waxes","exio" +"34643","RoW Middle East","WM","Petroleum Coke","exio" +"34644","RoW Middle East","WM","Non-specified Petroleum Products","exio" +"34645","RoW Middle East","WM","Nuclear fuel","exio" +"34646","RoW Middle East","WM","Plastics, basic","exio" +"34647","RoW Middle East","WM","Secondary plastic for treatment, Re-processing of secondary plastic into new plastic","exio" +"34648","RoW Middle East","WM","N-fertiliser","exio" +"34649","RoW Middle East","WM","P- and other fertiliser","exio" +"34650","RoW Middle East","WM","Chemicals nec","exio" +"34651","RoW Middle East","WM","Charcoal","exio" +"34652","RoW Middle East","WM","Additives/Blending Components","exio" +"34653","RoW Middle East","WM","Biogasoline","exio" +"34654","RoW Middle East","WM","Biodiesels","exio" +"34655","RoW Middle East","WM","Other Liquid Biofuels","exio" +"34656","RoW Middle East","WM","Rubber and plastic products","exio" +"34657","RoW Middle East","WM","Glass and glass products","exio" +"34658","RoW Middle East","WM","Secondary glass for treatment, Re-processing of secondary glass into new glass","exio" +"34659","RoW Middle East","WM","Ceramic goods","exio" +"34660","RoW Middle East","WM","Bricks, tiles and construction products, in baked clay","exio" +"34661","RoW Middle East","WM","Cement, lime and plaster","exio" +"34662","RoW Middle East","WM","Ash for treatment, Re-processing of ash into clinker","exio" +"34663","RoW Middle East","WM","Other non-metallic mineral products","exio" +"34664","RoW Middle East","WM","Basic iron and steel and of ferro-alloys and first products thereof","exio" +"34665","RoW Middle East","WM","Secondary steel for treatment, Re-processing of secondary steel into new steel","exio" +"34666","RoW Middle East","WM","Precious metals","exio" +"34667","RoW Middle East","WM","Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals","exio" +"34668","RoW Middle East","WM","Aluminium and aluminium products","exio" +"34669","RoW Middle East","WM","Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium","exio" +"34670","RoW Middle East","WM","Lead, zinc and tin and products thereof","exio" +"34671","RoW Middle East","WM","Secondary lead for treatment, Re-processing of secondary lead into new lead","exio" +"34672","RoW Middle East","WM","Copper products","exio" +"34673","RoW Middle East","WM","Secondary copper for treatment, Re-processing of secondary copper into new copper","exio" +"34674","RoW Middle East","WM","Other non-ferrous metal products","exio" +"34675","RoW Middle East","WM","Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals","exio" +"34676","RoW Middle East","WM","Foundry work services","exio" +"34677","RoW Middle East","WM","Fabricated metal products, except machinery and equipment","exio" +"34678","RoW Middle East","WM","Machinery and equipment n.e.c.","exio" +"34679","RoW Middle East","WM","Office machinery and computers","exio" +"34680","RoW Middle East","WM","Electrical machinery and apparatus n.e.c.","exio" +"34681","RoW Middle East","WM","Radio, television and communication equipment and apparatus","exio" +"34682","RoW Middle East","WM","Medical, precision and optical instruments, watches and clocks","exio" +"34683","RoW Middle East","WM","Motor vehicles, trailers and semi-trailers","exio" +"34684","RoW Middle East","WM","Other transport equipment","exio" +"34685","RoW Middle East","WM","Furniture; other manufactured goods n.e.c.","exio" +"34686","RoW Middle East","WM","Secondary raw materials","exio" +"34687","RoW Middle East","WM","Bottles for treatment, Recycling of bottles by direct reuse","exio" +"34688","RoW Middle East","WM","Electricity by coal","exio" +"34689","RoW Middle East","WM","Electricity by gas","exio" +"34690","RoW Middle East","WM","Electricity by nuclear","exio" +"34691","RoW Middle East","WM","Electricity by hydro","exio" +"34692","RoW Middle East","WM","Electricity by wind","exio" +"34693","RoW Middle East","WM","Electricity by petroleum and other oil derivatives","exio" +"34694","RoW Middle East","WM","Electricity by biomass and waste","exio" +"34695","RoW Middle East","WM","Electricity by solar photovoltaic","exio" +"34696","RoW Middle East","WM","Electricity by solar thermal","exio" +"34697","RoW Middle East","WM","Electricity by tide, wave, ocean","exio" +"34698","RoW Middle East","WM","Electricity by Geothermal","exio" +"34699","RoW Middle East","WM","Electricity nec","exio" +"34700","RoW Middle East","WM","Transmission services of electricity","exio" +"34701","RoW Middle East","WM","Distribution and trade services of electricity","exio" +"34702","RoW Middle East","WM","Coke oven gas","exio" +"34703","RoW Middle East","WM","Blast Furnace Gas","exio" +"34704","RoW Middle East","WM","Oxygen Steel Furnace Gas","exio" +"34705","RoW Middle East","WM","Gas Works Gas","exio" +"34706","RoW Middle East","WM","Biogas","exio" +"34707","RoW Middle East","WM","Distribution services of gaseous fuels through mains","exio" +"34708","RoW Middle East","WM","Steam and hot water supply services","exio" +"34709","RoW Middle East","WM","Collected and purified water, distribution services of water","exio" +"34710","RoW Middle East","WM","Construction work","exio" +"34711","RoW Middle East","WM","Secondary construction material for treatment, Re-processing of secondary construction material into aggregates","exio" +"34712","RoW Middle East","WM","Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries","exio" +"34713","RoW Middle East","WM","Retail trade services of motor fuel","exio" +"34714","RoW Middle East","WM","Wholesale trade and commission trade services, except of motor vehicles and motorcycles","exio" +"34715","RoW Middle East","WM","Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods","exio" +"34716","RoW Middle East","WM","Hotel and restaurant services","exio" +"34717","RoW Middle East","WM","Railway transportation services","exio" +"34718","RoW Middle East","WM","Other land transportation services","exio" +"34719","RoW Middle East","WM","Transportation services via pipelines","exio" +"34720","RoW Middle East","WM","Sea and coastal water transportation services","exio" +"34721","RoW Middle East","WM","Inland water transportation services","exio" +"34722","RoW Middle East","WM","Air transport services","exio" +"34723","RoW Middle East","WM","Supporting and auxiliary transport services; travel agency services","exio" +"34724","RoW Middle East","WM","Post and telecommunication services","exio" +"34725","RoW Middle East","WM","Financial intermediation services, except insurance and pension funding services","exio" +"34726","RoW Middle East","WM","Insurance and pension funding services, except compulsory social security services","exio" +"34727","RoW Middle East","WM","Services auxiliary to financial intermediation","exio" +"34728","RoW Middle East","WM","Real estate services","exio" +"34729","RoW Middle East","WM","Renting services of machinery and equipment without operator and of personal and household goods","exio" +"34730","RoW Middle East","WM","Computer and related services","exio" +"34731","RoW Middle East","WM","Research and development services","exio" +"34732","RoW Middle East","WM","Other business services","exio" +"34733","RoW Middle East","WM","Public administration and defence services; compulsory social security services","exio" +"34734","RoW Middle East","WM","Education services","exio" +"34735","RoW Middle East","WM","Health and social work services","exio" +"34736","RoW Middle East","WM","Food waste for treatment: incineration","exio" +"34737","RoW Middle East","WM","Paper waste for treatment: incineration","exio" +"34738","RoW Middle East","WM","Plastic waste for treatment: incineration","exio" +"34739","RoW Middle East","WM","Intert/metal waste for treatment: incineration","exio" +"34740","RoW Middle East","WM","Textiles waste for treatment: incineration","exio" +"34741","RoW Middle East","WM","Wood waste for treatment: incineration","exio" +"34742","RoW Middle East","WM","Oil/hazardous waste for treatment: incineration","exio" +"34743","RoW Middle East","WM","Food waste for treatment: biogasification and land application","exio" +"34744","RoW Middle East","WM","Paper waste for treatment: biogasification and land application","exio" +"34745","RoW Middle East","WM","Sewage sludge for treatment: biogasification and land application","exio" +"34746","RoW Middle East","WM","Food waste for treatment: composting and land application","exio" +"34747","RoW Middle East","WM","Paper and wood waste for treatment: composting and land application","exio" +"34748","RoW Middle East","WM","Food waste for treatment: waste water treatment","exio" +"34749","RoW Middle East","WM","Other waste for treatment: waste water treatment","exio" +"34750","RoW Middle East","WM","Food waste for treatment: landfill","exio" +"34751","RoW Middle East","WM","Paper for treatment: landfill","exio" +"34752","RoW Middle East","WM","Plastic waste for treatment: landfill","exio" +"34753","RoW Middle East","WM","Inert/metal/hazardous waste for treatment: landfill","exio" +"34754","RoW Middle East","WM","Textiles waste for treatment: landfill","exio" +"34755","RoW Middle East","WM","Wood waste for treatment: landfill","exio" +"34756","RoW Middle East","WM","Membership organisation services n.e.c.","exio" +"34757","RoW Middle East","WM","Recreational, cultural and sporting services","exio" +"34758","RoW Middle East","WM","Other services","exio" +"34759","RoW Middle East","WM","Private households with employed persons","exio" +"34760","RoW Middle East","WM","Extra-territorial organizations and bodies","exio" +"34761","Armenia","ARM","","fabio" +"34762","Afghanistan","AFG","","fabio" +"34763","Albania","ALB","","fabio" +"34764","Algeria","DZA","","fabio" +"34765","Angola","AGO","","fabio" +"34766","Antigua and Barbuda","ATG","","fabio" +"34767","Argentina","ARG","","fabio" +"34768","Australia","AUS","","fabio" +"34769","Austria","AUT","","fabio" +"34770","Bahamas","BHS","","fabio" +"34771","Bahrain","BHR","","fabio" +"34772","Barbados","BRB","","fabio" +"34773","Belgium-Luxembourg","BLX","","fabio" +"34774","Bangladesh","BGD","","fabio" +"34775","Bolivia (Plurinational State of)","BOL","","fabio" +"34776","Botswana","BWA","","fabio" +"34777","Brazil","BRA","","fabio" +"34778","Belize","BLZ","","fabio" +"34779","Solomon Islands","SLB","","fabio" +"34780","Brunei Darussalam","BRN","","fabio" +"34781","Bulgaria","BGR","","fabio" +"34782","Myanmar","MMR","","fabio" +"34783","Burundi","BDI","","fabio" +"34784","Cameroon","CMR","","fabio" +"34785","Canada","CAN","","fabio" +"34786","Cabo Verde","CPV","","fabio" +"34787","Central African Republic","CAF","","fabio" +"34788","Sri Lanka","LKA","","fabio" +"34789","Chad","TCD","","fabio" +"34790","Chile","CHL","","fabio" +"34791","China, mainland","CHN","","fabio" +"34792","Colombia","COL","","fabio" +"34793","Congo","COG","","fabio" +"34794","Costa Rica","CRI","","fabio" +"34795","Cuba","CUB","","fabio" +"34796","Cyprus","CYP","","fabio" +"34797","Czechoslovakia","CSK","","fabio" +"34798","Azerbaijan","AZE","","fabio" +"34799","Benin","BEN","","fabio" +"34800","Denmark","DNK","","fabio" +"34801","Dominica","DMA","","fabio" +"34802","Dominican Republic","DOM","","fabio" +"34803","Belarus","BLR","","fabio" +"34804","Ecuador","ECU","","fabio" +"34805","Egypt","EGY","","fabio" +"34806","El Salvador","SLV","","fabio" +"34807","Estonia","EST","","fabio" +"34808","Fiji","FJI","","fabio" +"34809","Finland","FIN","","fabio" +"34810","France","FRA","","fabio" +"34811","French Polynesia","PYF","","fabio" +"34812","Djibouti","DJI","","fabio" +"34813","Georgia","GEO","","fabio" +"34814","Gabon","GAB","","fabio" +"34815","Gambia","GMB","","fabio" +"34816","Germany","DEU","","fabio" +"34817","Bosnia and Herzegovina","BIH","","fabio" +"34818","Ghana","GHA","","fabio" +"34819","Kiribati","KIR","","fabio" +"34820","Greece","GRC","","fabio" +"34821","Grenada","GRD","","fabio" +"34822","Guatemala","GTM","","fabio" +"34823","Guinea","GIN","","fabio" +"34824","Guyana","GUY","","fabio" +"34825","Haiti","HTI","","fabio" +"34826","Honduras","HND","","fabio" +"34827","China, Hong Kong SAR","HKG","","fabio" +"34828","Hungary","HUN","","fabio" +"34829","Croatia","HRV","","fabio" +"34830","Iceland","ISL","","fabio" +"34831","India","IND","","fabio" +"34832","Indonesia","IDN","","fabio" +"34833","Iran (Islamic Republic of)","IRN","","fabio" +"34834","Iraq","IRQ","","fabio" +"34835","Ireland","IRL","","fabio" +"34836","Israel","ISR","","fabio" +"34837","Italy","ITA","","fabio" +"34838","Côte d'Ivoire","CIV","","fabio" +"34839","Kazakhstan","KAZ","","fabio" +"34840","Jamaica","JAM","","fabio" +"34841","Japan","JPN","","fabio" +"34842","Jordan","JOR","","fabio" +"34843","Kyrgyzstan","KGZ","","fabio" +"34844","Kenya","KEN","","fabio" +"34845","Cambodia","KHM","","fabio" +"34846","Democratic People's Republic of Korea","PRK","","fabio" +"34847","Republic of Korea","KOR","","fabio" +"34848","Kuwait","KWT","","fabio" +"34849","Latvia","LVA","","fabio" +"34850","Lao People's Democratic Republic","LAO","","fabio" +"34851","Lebanon","LBN","","fabio" +"34852","Lesotho","LSO","","fabio" +"34853","Liberia","LBR","","fabio" +"34854","Libya","LBY","","fabio" +"34855","Lithuania","LTU","","fabio" +"34856","China, Macao SAR","MAC","","fabio" +"34857","Madagascar","MDG","","fabio" +"34858","Malawi","MWI","","fabio" +"34859","Malaysia","MYS","","fabio" +"34860","Maldives","MDV","","fabio" +"34861","Mali","MLI","","fabio" +"34862","Malta","MLT","","fabio" +"34863","Mauritania","MRT","","fabio" +"34864","Mauritius","MUS","","fabio" +"34865","Mexico","MEX","","fabio" +"34866","Mongolia","MNG","","fabio" +"34867","Morocco","MAR","","fabio" +"34868","Mozambique","MOZ","","fabio" +"34869","Republic of Moldova","MDA","","fabio" +"34870","Namibia","NAM","","fabio" +"34871","Nepal","NPL","","fabio" +"34872","Netherlands","NLD","","fabio" +"34873","Netherlands Antilles","ANT","","fabio" +"34874","New Caledonia","NCL","","fabio" +"34875","The former Yugoslav Republic of Macedonia","MKD","","fabio" +"34876","Vanuatu","VUT","","fabio" +"34877","New Zealand","NZL","","fabio" +"34878","Nicaragua","NIC","","fabio" +"34879","Niger","NER","","fabio" +"34880","Nigeria","NGA","","fabio" +"34881","Norway","NOR","","fabio" +"34882","Pakistan","PAK","","fabio" +"34883","Panama","PAN","","fabio" +"34884","Czech Republic","CZE","","fabio" +"34885","Papua New Guinea","PNG","","fabio" +"34886","Paraguay","PRY","","fabio" +"34887","Peru","PER","","fabio" +"34888","Philippines","PHL","","fabio" +"34889","Poland","POL","","fabio" +"34890","Portugal","PRT","","fabio" +"34891","Guinea-Bissau","GNB","","fabio" +"34892","Timor-Leste","TLS","","fabio" +"34893","Puerto Rico","PRI","","fabio" +"34894","Eritrea","ERI","","fabio" +"34895","Qatar","QAT","","fabio" +"34896","Zimbabwe","ZWE","","fabio" +"34897","Romania","ROU","","fabio" +"34898","Rwanda","RWA","","fabio" +"34899","Russian Federation","RUS","","fabio" +"34900","Serbia and Montenegro","SCG","","fabio" +"34901","Saint Kitts and Nevis","KNA","","fabio" +"34902","Saint Lucia","LCA","","fabio" +"34903","Saint Vincent and the Grenadines","VCT","","fabio" +"34904","Sao Tome and Principe","STP","","fabio" +"34905","Saudi Arabia","SAU","","fabio" +"34906","Senegal","SEN","","fabio" +"34907","Sierra Leone","SLE","","fabio" +"34908","Slovenia","SVN","","fabio" +"34909","Slovakia","SVK","","fabio" +"34910","Singapore","SGP","","fabio" +"34911","Somalia","SOM","","fabio" +"34912","South Africa","ZAF","","fabio" +"34913","Spain","ESP","","fabio" +"34914","Suriname","SUR","","fabio" +"34915","Tajikistan","TJK","","fabio" +"34916","Swaziland","SWZ","","fabio" +"34917","Sweden","SWE","","fabio" +"34918","Switzerland","CHE","","fabio" +"34919","Syrian Arab Republic","SYR","","fabio" +"34920","Turkmenistan","TKM","","fabio" +"34921","China, Taiwan Province of","TWN","","fabio" +"34922","United Republic of Tanzania","TZA","","fabio" +"34923","Thailand","THA","","fabio" +"34924","Togo","TGO","","fabio" +"34925","Trinidad and Tobago","TTO","","fabio" +"34926","Oman","OMN","","fabio" +"34927","Tunisia","TUN","","fabio" +"34928","Turkey","TUR","","fabio" +"34929","United Arab Emirates","ARE","","fabio" +"34930","Uganda","UGA","","fabio" +"34931","USSR","SUN","","fabio" +"34932","United Kingdom","GBR","","fabio" +"34933","Ukraine","UKR","","fabio" +"34934","United States of America","USA","","fabio" +"34935","Burkina Faso","BFA","","fabio" +"34936","Uruguay","URY","","fabio" +"34937","Uzbekistan","UZB","","fabio" +"34938","Venezuela (Bolivarian Republic of)","VEN","","fabio" +"34939","Viet Nam","VNM","","fabio" +"34940","Ethiopia","ETH","","fabio" +"34941","Samoa","WSM","","fabio" +"34942","Yugoslav SFR","YUG","","fabio" +"34943","Yemen","YEM","","fabio" +"34944","Democratic Republic of the Congo","COD","","fabio" +"34945","Zambia","ZMB","","fabio" +"34946","Belgium","BEL","","fabio" +"34947","Luxembourg","LUX","","fabio" +"34948","Serbia","SRB","","fabio" +"34949","Montenegro","MNE","","fabio" +"34950","Sudan","SDN","","fabio" +"34951","South Sudan","SSD","","fabio" +"34952","RoW","ROW","","fabio" +"34953","RoW Asia and Pacific","WA","","exio" +"34954","RoW America","WL","","exio" +"34955","RoW Europe","WE","","exio" +"34956","RoW Africa","WF","","exio" +"34957","RoW Middle East","WM","","exio" diff --git a/input/items_exio.csv b/input/items_exio.csv new file mode 100644 index 0000000..6ec1774 --- /dev/null +++ b/input/items_exio.csv @@ -0,0 +1,201 @@ +Code;Item +p01.a;Paddy rice +p01.b;Wheat +p01.c;Cereal grains nec +p01.d;Vegetables, fruit, nuts +p01.e;Oil seeds +p01.f;Sugar cane, sugar beet +p01.g;Plant-based fibers +p01.h;Crops nec +p01.i;Cattle +p01.j;Pigs +p01.k;Poultry +p01.l;Meat animals nec +p01.m;Animal products nec +p01.n;Raw milk +p01.o;Wool, silk-worm cocoons +p01.w.1;Manure (conventional treatment) +p01.w.2;Manure (biogas treatment) +p02;Products of forestry, logging and related services +p05;"Fish and other fishing products; services incidental of fishing" +p10.a;Anthracite +p10.b;Coking Coal +p10.c;Other Bituminous Coal +p10.d;Sub-Bituminous Coal +p10.e;Patent Fuel +p10.f;Lignite/Brown Coal +p10.g;BKB/Peat Briquettes +p10.h;Peat +p11.a;Crude petroleum and services related to crude oil extraction, excluding surveying +p11.b;Natural gas and services related to natural gas extraction, excluding surveying +p11.b.1;Natural Gas Liquids +p11.c;Other Hydrocarbons +p12;Uranium and thorium ores +p13.1;Iron ores +p13.20.11;Copper ores and concentrates +p13.20.12;Nickel ores and concentrates +p13.20.13;Aluminium ores and concentrates +p13.20.14;Precious metal ores and concentrates +p13.20.15;Lead, zinc and tin ores and concentrates +p13.20.16;Other non-ferrous metal ores and concentrates +p14.1;Stone +p14.2;Sand and clay +p14.3;Chemical and fertilizer minerals, salt and other mining and quarrying products n.e.c. +p15.a;Products of meat cattle +p15.b;Products of meat pigs +p15.c;Products of meat poultry +p15.d;Meat products nec +p15.e;products of Vegetable oils and fats +p15.f;Dairy products +p15.g;Processed rice +p15.h;Sugar +p15.i;Food products nec +p15.j;Beverages +p15.k;Fish products +p16;Tobacco products +p17;Textiles +p18;"Wearing apparel; furs" +p19;Leather and leather products +p20;"Wood and products of wood and cork (except furniture); articles of straw and plaiting materials" +p20.w;Wood material for treatment, Re-processing of secondary wood material into new wood material +p21.1;Pulp +p21.w.1;Secondary paper for treatment, Re-processing of secondary paper into new pulp +p21.2;Paper and paper products +p22;Printed matter and recorded media +p23.1.a;Coke Oven Coke +p23.1.b;Gas Coke +p23.1.c;Coal Tar +p23.20.a;Motor Gasoline +p23.20.b;Aviation Gasoline +p23.20.c;Gasoline Type Jet Fuel +p23.20.d;Kerosene Type Jet Fuel +p23.20.e;Kerosene +p23.20.f;Gas/Diesel Oil +p23.20.g;Heavy Fuel Oil +p23.20.h;Refinery Gas +p23.20.i;Liquefied Petroleum Gases (LPG) +p23.20.j;Refinery Feedstocks +p23.20.k;Ethane +p23.20.l;Naphtha +p23.20.m;White Spirit & SBP +p23.20.n;Lubricants +p23.20.o;Bitumen +p23.20.p;Paraffin Waxes +p23.20.q;Petroleum Coke +p23.20.r;Non-specified Petroleum Products +p23.3;Nuclear fuel +p24.a;Plastics, basic +p24.a.w;Secondary plastic for treatment, Re-processing of secondary plastic into new plastic +p24.b;N-fertiliser +p24.c;P- and other fertiliser +p24.d;Chemicals nec +p24.e;Charcoal +p24.f;Additives/Blending Components +p24.g;Biogasoline +p24.h;Biodiesels +p24.i;Other Liquid Biofuels +p25;Rubber and plastic products +p26.a;Glass and glass products +p26.a.w;Secondary glass for treatment, Re-processing of secondary glass into new glass +p26.b;Ceramic goods +p26.c;Bricks, tiles and construction products, in baked clay +p26.d;Cement, lime and plaster +p26.d.w;Ash for treatment, Re-processing of ash into clinker +p26.e;Other non-metallic mineral products +p27.a;Basic iron and steel and of ferro-alloys and first products thereof +p27.a.w;Secondary steel for treatment, Re-processing of secondary steel into new steel +p27.41;Precious metals +p27.41.w;Secondary preciuos metals for treatment, Re-processing of secondary preciuos metals into new preciuos metals +p27.42;Aluminium and aluminium products +p27.42.w;Secondary aluminium for treatment, Re-processing of secondary aluminium into new aluminium +p27.43;Lead, zinc and tin and products thereof +p27.43.w;Secondary lead for treatment, Re-processing of secondary lead into new lead +p27.44;Copper products +p27.44.w;Secondary copper for treatment, Re-processing of secondary copper into new copper +p27.45;Other non-ferrous metal products +p27.45.w;Secondary other non-ferrous metals for treatment, Re-processing of secondary other non-ferrous metals into new other non-ferrous metals +p27.5;Foundry work services +p28;Fabricated metal products, except machinery and equipment +p29;Machinery and equipment n.e.c. +p30;Office machinery and computers +p31;Electrical machinery and apparatus n.e.c. +p32;Radio, television and communication equipment and apparatus +p33;Medical, precision and optical instruments, watches and clocks +p34;Motor vehicles, trailers and semi-trailers +p35;Other transport equipment +p36;"Furniture; other manufactured goods n.e.c." +p37;Secondary raw materials +p37.w.1;Bottles for treatment, Recycling of bottles by direct reuse +p40.11.a;Electricity by coal +p40.11.b;Electricity by gas +p40.11.c;Electricity by nuclear +p40.11.d;Electricity by hydro +p40.11.e;Electricity by wind +p40.11.f;Electricity by petroleum and other oil derivatives +p40.11.g;Electricity by biomass and waste +p40.11.h;Electricity by solar photovoltaic +p40.11.i;Electricity by solar thermal +p40.11.j;Electricity by tide, wave, ocean +p40.11.k;Electricity by Geothermal +p40.11.l;Electricity nec +p40.12;Transmission services of electricity +p40.13;Distribution and trade services of electricity +p40.2.a;Coke oven gas +p40.2.b;Blast Furnace Gas +p40.2.c;Oxygen Steel Furnace Gas +p40.2.d;Gas Works Gas +p40.2.e;Biogas +p40.2.1;Distribution services of gaseous fuels through mains +p40.3;Steam and hot water supply services +p41;Collected and purified water, distribution services of water +p45;Construction work +p45.w;Secondary construction material for treatment, Re-processing of secondary construction material into aggregates +p50.a;Sale, maintenance, repair of motor vehicles, motor vehicles parts, motorcycles, motor cycles parts and accessoiries +p50.b;Retail trade services of motor fuel +p51;Wholesale trade and commission trade services, except of motor vehicles and motorcycles +p52;"Retail trade services, except of motor vehicles and motorcycles; repair services of personal and household goods" +p55;Hotel and restaurant services +p60.1;Railway transportation services +p60.2;Other land transportation services +p60.3;Transportation services via pipelines +p61.1;Sea and coastal water transportation services +p61.2;Inland water transportation services +p62;Air transport services +p63;"Supporting and auxiliary transport services; travel agency services" +p64;Post and telecommunication services +p65;Financial intermediation services, except insurance and pension funding services +p66;Insurance and pension funding services, except compulsory social security services +p67;Services auxiliary to financial intermediation +p70;Real estate services +p71;Renting services of machinery and equipment without operator and of personal and household goods +p72;Computer and related services +p73;Research and development services +p74;Other business services +p75;"Public administration and defence services; compulsory social security services" +p80;Education services +p85;Health and social work services +p90.1.a;Food waste for treatment: incineration +p90.1.b;Paper waste for treatment: incineration +p90.1.c;Plastic waste for treatment: incineration +p90.1.d;Intert/metal waste for treatment: incineration +p90.1.e;Textiles waste for treatment: incineration +p90.1.f;Wood waste for treatment: incineration +p90.1.g;Oil/hazardous waste for treatment: incineration +p90.2.a;Food waste for treatment: biogasification and land application +p90.2.b;Paper waste for treatment: biogasification and land application +p90.2.c;Sewage sludge for treatment: biogasification and land application +p90.3.a;Food waste for treatment: composting and land application +p90.3.b;Paper and wood waste for treatment: composting and land application +p90.4.a;Food waste for treatment: waste water treatment +p90.4.b;Other waste for treatment: waste water treatment +p90.5.a;Food waste for treatment: landfill +p90.5.b;Paper for treatment: landfill +p90.5.c;Plastic waste for treatment: landfill +p90.5.d;Inert/metal/hazardous waste for treatment: landfill +p90.5.e;Textiles waste for treatment: landfill +p90.5.f;Wood waste for treatment: landfill +p91;Membership organisation services n.e.c. +p92;Recreational, cultural and sporting services +p93;Other services +p95;Private households with employed persons +p99;Extra-territorial organizations and bodies