Use selector gadget, https://selectorgadget.com/ , the chrome extension for highlighting html and getting the tag location.
#Loading the rvest package
library('rvest')
## Warning: package 'rvest' was built under R version 3.6.3
## Loading required package: xml2
This function will take an input job title search, such as ‘data scientist’ in quotations, the city searching, i.e. “Corona” also in quotations, and the state abbreviations, such as “CA” also in quotations, then it returns a list of the job titles found, dates in ‘days ago’, and the hiring company’s name, and a table is also returned that displays the job title, dates, hiring companies, minimum hourly, maximum hourly, minimum annual salary, and maximum annual salary for the job title searched using the Indeed website.But only for the first five page listings.
getIndeedJobData5pages <- function(jobTitle, cityName,stateAbb){
url <- 'https://www.indeed.com/jobs?q=jobTitle&l=CityName%2C+stateAbb'
url2 <- 'https://www.indeed.com/jobs?q=jobTitle&l=CityName%2C+stateAbb&start=20'
url3 <- 'https://www.indeed.com/jobs?q=jobTitle&l=CityName%2C+stateAbb&start=30'
url4 <- 'https://www.indeed.com/jobs?q=jobTitle&l=CityName%2C+stateAbb&start=40'
url5 <- 'https://www.indeed.com/jobs?q=jobTitle&l=CityName%2C+stateAbb&start=50'
jobSearch <- as.character(jobTitle)
jobSearch <- gsub(' ','+',jobSearch)
city <- cityName
city <- gsub(' ','+',city)
state <- stateAbb
url <- gsub('jobTitle',jobSearch, url)
url <- gsub('CityName',city, url)
url <- gsub('stateAbb',state, url)
url2 <- gsub('jobTitle',jobSearch, url2)
url2 <- gsub('CityName',city, url2)
url2 <- gsub('stateAbb',state, url2)
url3 <- gsub('jobTitle',jobSearch, url3)
url3 <- gsub('CityName',city, url3)
url3 <- gsub('stateAbb',state, url3)
url4 <- gsub('jobTitle',jobSearch, url4)
url4 <- gsub('CityName',city, url4)
url4 <- gsub('stateAbb',state, url4)
url5 <- gsub('jobTitle',jobSearch, url5)
url5 <- gsub('CityName',city, url5)
url5 <- gsub('stateAbb',state, url5)
webpage <- read_html(url)
webpage2 <- read_html(url2)
webpage3 <- read_html(url3)
webpage4 <- read_html(url4)
webpage5 <- read_html(url5)
job_title_html <- html_nodes(webpage,'.jobtitle')
job_title <- html_text(job_title_html)
job_title_html2 <- html_nodes(webpage2,'.jobtitle')
job_title2 <- html_text(job_title_html2)
job_title_html3 <- html_nodes(webpage3,'.jobtitle')
job_title3 <- html_text(job_title_html3)
job_title_html4 <- html_nodes(webpage4,'.jobtitle')
job_title4 <- html_text(job_title_html4)
job_title_html5 <- html_nodes(webpage5,'.jobtitle')
job_title5 <- html_text(job_title_html5)
jobTitles <- as.data.frame(c(job_title,job_title2, job_title3, job_title4, job_title5))
colnames(jobTitles) <- 'jobTitle'
jobTitles$jobTitle <- as.character(paste(jobTitles$jobTitle))
jobTitles$jobTitle <- gsub('\n','',jobTitles$jobTitle)
salary_html <- html_nodes(webpage,'.salaryText')
salary <- html_text(salary_html)
salary_html2 <- html_nodes(webpage2,'.salaryText')
salary2 <- html_text(salary_html2)
salary_html3 <- html_nodes(webpage3,'.salaryText')
salary3 <- html_text(salary_html3)
salary_html4 <- html_nodes(webpage4,'.salaryText')
salary4 <- html_text(salary_html4)
salary_html5 <- html_nodes(webpage5,'.salaryText')
salary5 <- html_text(salary_html5)
salaries <- as.data.frame(c(salary,salary2, salary3, salary4, salary5))
colnames(salaries) <- 'Salary'
salaries$salary <- as.character(paste(salaries$Salary))
salaries$salary <- gsub('\n','',salaries$salary)
#annual
annual <- salaries[grep('a year', salaries$salary),]
if (length(annual$salary)>0){
annual$salary <- gsub('a year','', annual$salary)
annual$salary <- gsub(',','', annual$salary)
annual$salary <- gsub('Up to','',annual$salary)
annual$salary <- gsub('From','',annual$salary)
annual$salary <- gsub('[++]','',annual$salary,perl=TRUE)
annualSalarySplit <- strsplit(annual$salary, split='-')
minSalary <- lapply(annualSalarySplit,'[',1)
maxSalary <- lapply(annualSalarySplit,'[',2)
minSalary <- gsub('[$]','',minSalary, perl=TRUE)
minSalary <- gsub(' ','',minSalary)
maxSalary <- gsub('[$]','',maxSalary, perl=TRUE)
maxSalary <- gsub(' ','',maxSalary)
annual$minSalary <- as.numeric(paste(minSalary))
annual$maxSalary <- as.numeric(paste(maxSalary))
annual$medianMinSalary <- median(annual$minSalary,na.rm=TRUE)
annual$medianMaxSalary <- median(annual$maxSalary,na.rm=TRUE)
annual$avgMinSalary <- mean(annual$minSalary,na.rm=TRUE)
annual$avgMaxSalary <- mean(annual$maxSalary,na.rm=TRUE)
annual$minimumMinSalary <- min(annual$minSalary,na.rm=TRUE)
annual$maximumMaxSalary <- max(annual$maxSalary,na.rm=TRUE)
avgAnnualSalary <- mean(rbind(annual$avgMinSalary,annual$avgMaxSalary),na.rm=TRUE)
minAnnualSalary <- min(annual$minimumMinSalary,na.rm=TRUE)
maxAnnualSalary <- max(rbind(annual$maximumMaxSalary,annual$minimumMinSalary),na.rm=TRUE)
} else {
avgAnnualSalary <- 'NA'
minAnnualSalary <- 'NA'
maxAnnualSalary <- 'NA'
}
# hourly
hourly <- salaries[grep('an hour', salaries$salary),]
if (length(hourly$salary>0)){
hourly$salary <- gsub('an hour','', hourly$salary)
hourly$salary <- gsub(',','', hourly$salary)
hourly$salary <- gsub('From ','', hourly$salary)
hourly$salary <- gsub('Up to','',hourly$salary)
hourly$salary <- gsub('[++]','',hourly$salary, perl=TRUE)
hourlySalarySplit <- strsplit(hourly$salary, split='-')
minSalary <- lapply(hourlySalarySplit,'[',1)
maxSalary <- lapply(hourlySalarySplit,'[',2)
minSalary <- gsub('[$]','',minSalary, perl=TRUE)
minSalary <- gsub(' ','',minSalary)
maxSalary <- gsub('[$]','',maxSalary, perl=TRUE)
maxSalary <- gsub(' ','',maxSalary)
hourly$minSalary <- as.numeric(paste(minSalary))
hourly$maxSalary <- as.numeric(paste(maxSalary))
hourly$medianMinSalary <- median(hourly$minSalary,na.rm=TRUE)
hourly$medianMaxSalary <- median(hourly$maxSalary,na.rm=TRUE)
hourly$avgMinSalary <- mean(hourly$minSalary,na.rm=TRUE)
hourly$avgMaxSalary <- mean(hourly$maxSalary,na.rm=TRUE)
hourly$minimumMinSalary <- min(hourly$minSalary,na.rm=TRUE)
hourly$maximumMaxSalary <- max(hourly$maxSalary,na.rm=TRUE)
avgHourlySalary <- mean(rbind(hourly$avgMinSalary,hourly$avgMaxSalary), na.rm=TRUE)
minHourlySalary <- min(hourly$minimumMinSalary, na.rm=TRUE)
maxHourlySalary <- max(rbind(hourly$maximumMaxSalary,hourly$minimumMinSalary),
na.rm=TRUE)
} else {
avgHourlySalary <- 'NA'
minHourlySalary <- 'NA'
maxHourlySalary <- 'NA'
}
if (length(salaries$salary)>0){
salaries$salary <- gsub('a year','', salaries$salary)
salaries$salary <- gsub('an hour','', salaries$salary)
salaries$salary <- gsub('a day','', salaries$salary)
salaries$salary <- gsub('a month','', salaries$salary)
salaries$salary <- gsub(',','', salaries$salary)
salaries$salary <- gsub('From ','', salaries$salary)
salaries$salary <- gsub('Up to','',salaries$salary)
salaries$salary <- gsub('[++]','',salaries$salary, perl=TRUE)
salarysplit <- strsplit(salaries$salary, split='-')
minSalary <- lapply(salarysplit,'[',1)
maxSalary <- lapply(salarysplit,'[',2)
minSalary <- gsub('[$]','',minSalary, perl=TRUE)
minSalary <- gsub(' ','',minSalary)
maxSalary <- gsub('[$]','',maxSalary, perl=TRUE)
maxSalary <- gsub(' ','',maxSalary)
salaries$minSalary <- as.numeric(paste(minSalary))
salaries$maxSalary <- as.numeric(paste(maxSalary))
salaries$medianMinSalary <- median(salaries$minSalary,na.rm=TRUE)
salaries$medianMaxSalary <- median(rbind(salaries$minSalary,
salaries$maxSalary),na.rm=TRUE)
salaries$avgMinSalary <- mean(salaries$minSalary,na.rm=TRUE)
salaries$avgMaxSalary <- mean(rbind(salaries$minSalary,
salaries$maxSalary),na.rm=TRUE)
salaries$minimumMinSalary <- min(salaries$minSalary,na.rm=TRUE)
salaries$maximumMaxSalary <- max(rbind(salaries$maxSalary,salaries$minSalary),na.rm=TRUE)
avgSalary <- mean(cbind(salaries$avgMaxSalary,salaries$avgMinSalary),na.rm=TRUE)
minSalary <- min(salaries$minimumMinSalary,na.rm=TRUE)
maxSalary <- max(salaries$maximumMaxSalary,na.rm=TRUE)
} else {
salaries <- salaries
}
date_html <- html_nodes(webpage,'.date')
date <- html_text(date_html)
date_html2 <- html_nodes(webpage2,'.date')
date2 <- html_text(date_html2)
date_html3 <- html_nodes(webpage3,'.date')
date3 <- html_text(date_html3)
date_html4 <- html_nodes(webpage4,'.date')
date4 <- html_text(date_html4)
date_html5 <- html_nodes(webpage5,'.date')
date5 <- html_text(date_html5)
dates <- as.data.frame(c(date,date2, date3, date4, date5))
colnames(dates) <- 'date_daysAgo'
dates$date_daysAgo <- as.character(paste(dates$date_daysAgo))
dates$date_daysAgo <- gsub('\n','',dates$date_daysAgo)
dates$date_daysAgo <- gsub(' days ago','', dates$date_daysAgo)
dates$date_daysAgo <- gsub(' day ago','', dates$date_daysAgo)
dates$date_daysAgo <- gsub('[+]','', dates$date_daysAgo)
hiring_html <- html_nodes(webpage,'.sjcl')
hiring <- html_text(hiring_html)
hiring_html2 <- html_nodes(webpage2,'.sjcl')
hiring2 <- html_text(hiring_html2)
hiring_html3 <- html_nodes(webpage3,'.sjcl')
hiring3 <- html_text(hiring_html3)
hiring_html4 <- html_nodes(webpage4,'.sjcl')
hiring4 <- html_text(hiring_html4)
hiring_html5 <- html_nodes(webpage5,'.sjcl')
hiring5 <- html_text(hiring_html5)
hirings <- as.data.frame(c(hiring,hiring2, hiring3, hiring4, hiring5))
colnames(hirings) <- 'HiringAgency'
hirings$HiringAgency <- as.character(paste(hirings$HiringAgency))
hirings$HiringAgency <- gsub('\n','',hirings$HiringAgency)
MinAnnualSalary <- as.data.frame(rep(minAnnualSalary,length(jobTitles$jobTitle)))
colnames(MinAnnualSalary) <- 'MinAnnualSalary'
MaxAnnualSalary <- as.data.frame(rep(maxAnnualSalary,length(jobTitles$jobTitle)))
colnames(MaxAnnualSalary) <- 'MaxAnnualSalary'
MinHourlySalary <- as.data.frame(rep(minHourlySalary,length(jobTitles$jobTitle)))
colnames(MinHourlySalary) <- 'MinHourlySalary'
MaxHourlySalary <- as.data.frame(rep(maxHourlySalary,length(jobTitles$jobTitle)))
colnames(MaxHourlySalary) <- 'MaxHourlySalary'
cityDF <- as.data.frame(rep(cityName,length(jobTitles$jobTitle)))
colnames(cityDF) <- "city"
stateDF <- as.data.frame(rep(state,length(jobTitles$jobTitle)))
colnames(stateDF) <- 'state'
tableJobs <- cbind(cityDF,stateDF,jobTitles,hirings,dates,MinHourlySalary,
MaxHourlySalary,MinAnnualSalary,MaxAnnualSalary)
write.csv(tableJobs,paste(jobTitle,cityName,state,".csv",sep='_'),row.names = FALSE)
return(list(jobTitles, salaries, dates, hirings,annual, hourly,tableJobs))
}
getIndeedJobData5pages("data scientist", "Corona","CA")
## Warning in getIndeedJobData5pages("data scientist", "Corona", "CA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("data scientist", "Corona", "CA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Medical Data Analyst
## 2 Senior Data Analyst
## 3 Data Scientist
## 4 AI/Machine Learning Research Scientist
## 5 Data Science Assistant
## 6 Data Scientist
## 7 Data Scientist - Advisor
## 8 Data Scientist
## 9 Data Scientist
## 10 Data Scientist
## 11 Sr. Data Scientist
## 12 Data Scientist
## 13 Data Scientist
## 14 Data Scientist
## 15 Sr. Data Scientist (Tableau)
## 16 Sr. Statistical Programmer - (100% REMOTE) - Excellent Pay,...
## 17 Sr. Data Scientist
## 18 Data Analyst, Sr.
## 19 Senior Data Scientist
## 20 Senior Data Analyst
## 21 Data Engineer (SQL, Python)
## 22 Senior Data Analyst - Finance and Operations
## 23 Developer III - Data Science
## 24 Director, Data and Analytics - Behr Paint Company
## 25 Applied Computational Mathematician / Engineer
## 26 Econometrician/Statistician Software Developer
## 27 Senior Data Scientist
## 28 Lead Senior Data Scientist
## 29 Business Intelligence Engineer
## 30 Senior Financial Data Analyst
## 31 Sr. Data Analyst, Software Developer - Energy
## 32 Business Intelligence Engineer
## 33 Machine Learning Software Engineer
## 34 Associate Director, Advanced Analytics and Data Science
## 35 AI Software Engineer
## 36 Director of Development & Data Science
## 37 Data Science Architect
## 38 Product Manager - Spatial Analytics & Data Science
## 39 Product Engineer – Spatial Data Science and Statistical Anal...
## 40 Cloud Solutions Architect, Data Intelligence
## 41 Manager of Data Science
## 42 Senior AI Programmer
## 43 Sr. Leader, Automation Engineering (AI/ML)
## 44 Senior Financial Data Analyst
## 45 Senior Business/Data Analyst
## 46 Sr. Data Analyst, Software Developer - Energy
## 47 Business Intelligence Engineer
## 48 Machine Learning Software Engineer
## 49 Associate Director, Advanced Analytics and Data Science
## 50 AI Software Engineer
## 51 Director of Development & Data Science
## 52 Data Science Architect
## 53 Product Manager - Spatial Analytics & Data Science
## 54 Product Engineer – Spatial Data Science and Statistical Anal...
## 55 Cloud Solutions Architect, Data Intelligence
## 56 Manager of Data Science
## 57 Senior AI Programmer
## 58 Sr. Leader, Automation Engineering (AI/ML)
## 59 Director of Development & Data Science
## 60 Data Science Architect
## 61 Product Manager - Spatial Analytics & Data Science
## 62 Product Engineer – Spatial Data Science and Statistical Anal...
## 63 Cloud Solutions Architect, Data Intelligence
## 64 Manager of Data Science
## 65 Senior AI Programmer
## 66 Sr. Leader, Automation Engineering (AI/ML)
## 67 Sr. Manager, Supply Chain Business Intelligence and Data Sci...
## 68 AI/Machine Learning Research Scientist
## 69 Sr. Machine Learning Engineer
## 70 Data Scientist
## 71 Sr. Data Scientist - Chicago, IL
## 72 Manager of Data Science
## 73 Senior Data Analyst
## 74 Medical Data Analyst
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 2 \n$45 an hour $45 45 NA
## 3 \n$65 - $70 an hour $65 - $70 65 70
## 4 \n$118,000 - $168,000 a year $118000 - $168000 118000 168000
## 5 \n$115,000 - $140,000 a year $115000 - $140000 115000 140000
## 6 \n$65 - $70 an hour $65 - $70 65 70
## 7 \n$45 an hour $45 45 NA
## 8 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22532.5 45000 40402.5 56525.71 45
## 2 22532.5 45000 40402.5 56525.71 45
## 3 22532.5 45000 40402.5 56525.71 45
## 4 22532.5 45000 40402.5 56525.71 45
## 5 22532.5 45000 40402.5 56525.71 45
## 6 22532.5 45000 40402.5 56525.71 45
## 7 22532.5 45000 40402.5 56525.71 45
## 8 22532.5 45000 40402.5 56525.71 45
## maximumMaxSalary
## 1 168000
## 2 168000
## 3 168000
## 4 168000
## 5 168000
## 6 168000
## 7 168000
## 8 168000
##
## [[3]]
## date_daysAgo
## 1 24
## 2 12
## 3 15
## 4 30
## 5 21
## 6 1
## 7 6
## 8 26
## 9 4
## 10 26
## 11 4
## 12 30
## 13 25
## 14 30
## 15 30
## 16 22
## 17 30
## 18 30
## 19 17
## 20 30
## 21 30
## 22 10
## 23 29
## 24 30
## 25 30
## 26 11
## 27 30
## 28 30
## 29 12
## 30 30
## 31 30
## 32 12
## 33 30
## 34 30
## 35 30
## 36 30
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 12
## 48 30
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 30
## 59 30
## 60 30
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
## 66 30
## 67 30
## 68 30
## 69 30
## 70 15
## 71 30
## 72 20
## 73 12
## 74 24
##
## [[4]]
## HiringAgency
## 1 ReleasePointClaremont, CA 91711 (Towne Ranch area)•Remote work available
## 2 APR Consulting Inc4.2Rialto, CA
## 3 Insight Global4.0Santa Ana, CA 92704•Remote work available
## 4 Perceptronics Solutions, IncUnited States•Remote work available
## 5 Intelliloan4.0Costa Mesa, CA 92626•Remote work available
## 6 Acorns4.4Irvine, CA
## 7 Southern California Edison3.9Pomona, CA 91767
## 8 West Coast University3.7Irvine, CA 92617 (Research Park area)
## 9 Pacific Life3.8Aliso Viejo, CA 92656
## 10 American Career College3.9Irvine, CA 92617 (Research Park area)
## 11 Nihon Kohden America, Inc2.9Irvine, CA 92618 (Irvine Health and Science Complex area)•Remote work available
## 12 GustaineOrange, CA
## 13 Amazon.com Services LLC3.6Irvine, CA
## 14 Driveway4.1Aliso Viejo, CA
## 15 VSolvit LLC3.2Norco, CA 92860
## 16 i-Pharm ConsultingUnited States•Remote work available
## 17 Trace32.9Irvine, CA
## 18 CalOptima3.2Orange, CA
## 19 Pacific Life3.8Aliso Viejo, CA 92656
## 20 MobilitywareIrvine, CA 92602 (Lower Peters Canyon area)
## 21 Viant3.0Irvine, CA•Remote work available
## 22 Weedmaps2.8Irvine, CA
## 23 Inland Empire Health Plans3.6Rancho Cucamonga, CA 91730
## 24 Masco3.5Santa Ana, CA
## 25 GustaineOrange, CA
## 26 EViewsIrvine, CA 92612 (University Town Center area)
## 27 Southern California Edison3.9Pomona, CA 91767
## 28 The Trade Desk4.1Irvine, CA 92618 (Irvine Health and Science Complex area)
## 29 ULTIMATE STAFFING SERVICES3.8Irvine, CA
## 30 Alignment Healthcare2.8Orange, CA 92868
## 31 Anser AdvisoryPomona, CA 91766
## 32 ULTIMATE STAFFING SERVICES3.8Irvine, CA
## 33 Irvine Sensors Corporation3.8Costa Mesa, CA
## 34 AbbVie4.0Irvine, CA
## 35 2K Games3.6Foothill Ranch, CA
## 36 Black Knight Financial Services3.4Irvine, CA
## 37 Onica, a Rackspace CompanyIrvine, CA
## 38 ESRI, Inc.3.8Redlands, CA 92373
## 39 ESRI, Inc.3.8Redlands, CA 92373
## 40 Trace32.9Irvine, CA
## 41 InnoceanIrvine, CA•Remote work available
## 42 Obsidian Entertainment, Inc.Irvine, CA 92618 (Irvine Health and Science Complex area)
## 43 CoreLogic3.4Irvine, CA 92618 (Irvine Health and Science Complex area)
## 44 Alignment Healthcare2.8Orange, CA 92868
## 45 Accurate Background3.7Irvine, CA 92618 (Irvine Health and Science Complex area)
## 46 Anser AdvisoryPomona, CA 91766
## 47 ULTIMATE STAFFING SERVICES3.8Irvine, CA
## 48 Irvine Sensors Corporation3.8Costa Mesa, CA
## 49 AbbVie4.0Irvine, CA
## 50 2K Games3.6Foothill Ranch, CA
## 51 Black Knight Financial Services3.4Irvine, CA
## 52 Onica, a Rackspace CompanyIrvine, CA
## 53 ESRI, Inc.3.8Redlands, CA 92373
## 54 ESRI, Inc.3.8Redlands, CA 92373
## 55 Trace32.9Irvine, CA
## 56 InnoceanIrvine, CA•Remote work available
## 57 Obsidian Entertainment, Inc.Irvine, CA 92618 (Irvine Health and Science Complex area)
## 58 CoreLogic3.4Irvine, CA 92618 (Irvine Health and Science Complex area)
## 59 Black Knight Financial Services3.4Irvine, CA
## 60 Onica, a Rackspace CompanyIrvine, CA
## 61 ESRI, Inc.3.8Redlands, CA 92373
## 62 ESRI, Inc.3.8Redlands, CA 92373
## 63 Trace32.9Irvine, CA
## 64 InnoceanIrvine, CA•Remote work available
## 65 Obsidian Entertainment, Inc.Irvine, CA 92618 (Irvine Health and Science Complex area)
## 66 CoreLogic3.4Irvine, CA 92618 (Irvine Health and Science Complex area)
## 67 Niagara Bottling3.0Diamond Bar, CA 91765
## 68 Perceptronics Solutions, IncUnited States•Remote work available
## 69 Masimo3.5Irvine, CA 92618 (East Industrial Complex area)
## 70 Insight Global4.0Santa Ana, CA 92704•Remote work available
## 71 Biomerieux3.8United States
## 72 Niagara Bottling3.0Diamond Bar, CA 91765
## 73 APR Consulting Inc4.2Rialto, CA
## 74 ReleasePointClaremont, CA 91711 (Towne Ranch area)•Remote work available
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 4 \n$118,000 - $168,000 a year $118000 - $168000 118000 168000
## 5 \n$115,000 - $140,000 a year $115000 - $140000 115000 140000
## 8 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 80000 110000 80750 117000 45000
## 4 80000 110000 80750 117000 45000
## 5 80000 110000 80750 117000 45000
## 8 80000 110000 80750 117000 45000
## maximumMaxSalary
## 1 168000
## 4 168000
## 5 168000
## 8 168000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$45 an hour $45 45 NA 55
## 3 \n$65 - $70 an hour $65 - $70 65 70 55
## 6 \n$65 - $70 an hour $65 - $70 65 70 55
## 7 \n$45 an hour $45 45 NA 55
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 70 55 70 45 70
## 3 70 55 70 45 70
## 6 70 55 70 45 70
## 7 70 55 70 45 70
##
## [[7]]
## city state jobTitle
## 1 Corona CA Medical Data Analyst
## 2 Corona CA Senior Data Analyst
## 3 Corona CA Data Scientist
## 4 Corona CA AI/Machine Learning Research Scientist
## 5 Corona CA Data Science Assistant
## 6 Corona CA Data Scientist
## 7 Corona CA Data Scientist - Advisor
## 8 Corona CA Data Scientist
## 9 Corona CA Data Scientist
## 10 Corona CA Data Scientist
## 11 Corona CA Sr. Data Scientist
## 12 Corona CA Data Scientist
## 13 Corona CA Data Scientist
## 14 Corona CA Data Scientist
## 15 Corona CA Sr. Data Scientist (Tableau)
## 16 Corona CA Sr. Statistical Programmer - (100% REMOTE) - Excellent Pay,...
## 17 Corona CA Sr. Data Scientist
## 18 Corona CA Data Analyst, Sr.
## 19 Corona CA Senior Data Scientist
## 20 Corona CA Senior Data Analyst
## 21 Corona CA Data Engineer (SQL, Python)
## 22 Corona CA Senior Data Analyst - Finance and Operations
## 23 Corona CA Developer III - Data Science
## 24 Corona CA Director, Data and Analytics - Behr Paint Company
## 25 Corona CA Applied Computational Mathematician / Engineer
## 26 Corona CA Econometrician/Statistician Software Developer
## 27 Corona CA Senior Data Scientist
## 28 Corona CA Lead Senior Data Scientist
## 29 Corona CA Business Intelligence Engineer
## 30 Corona CA Senior Financial Data Analyst
## 31 Corona CA Sr. Data Analyst, Software Developer - Energy
## 32 Corona CA Business Intelligence Engineer
## 33 Corona CA Machine Learning Software Engineer
## 34 Corona CA Associate Director, Advanced Analytics and Data Science
## 35 Corona CA AI Software Engineer
## 36 Corona CA Director of Development & Data Science
## 37 Corona CA Data Science Architect
## 38 Corona CA Product Manager - Spatial Analytics & Data Science
## 39 Corona CA Product Engineer – Spatial Data Science and Statistical Anal...
## 40 Corona CA Cloud Solutions Architect, Data Intelligence
## 41 Corona CA Manager of Data Science
## 42 Corona CA Senior AI Programmer
## 43 Corona CA Sr. Leader, Automation Engineering (AI/ML)
## 44 Corona CA Senior Financial Data Analyst
## 45 Corona CA Senior Business/Data Analyst
## 46 Corona CA Sr. Data Analyst, Software Developer - Energy
## 47 Corona CA Business Intelligence Engineer
## 48 Corona CA Machine Learning Software Engineer
## 49 Corona CA Associate Director, Advanced Analytics and Data Science
## 50 Corona CA AI Software Engineer
## 51 Corona CA Director of Development & Data Science
## 52 Corona CA Data Science Architect
## 53 Corona CA Product Manager - Spatial Analytics & Data Science
## 54 Corona CA Product Engineer – Spatial Data Science and Statistical Anal...
## 55 Corona CA Cloud Solutions Architect, Data Intelligence
## 56 Corona CA Manager of Data Science
## 57 Corona CA Senior AI Programmer
## 58 Corona CA Sr. Leader, Automation Engineering (AI/ML)
## 59 Corona CA Director of Development & Data Science
## 60 Corona CA Data Science Architect
## 61 Corona CA Product Manager - Spatial Analytics & Data Science
## 62 Corona CA Product Engineer – Spatial Data Science and Statistical Anal...
## 63 Corona CA Cloud Solutions Architect, Data Intelligence
## 64 Corona CA Manager of Data Science
## 65 Corona CA Senior AI Programmer
## 66 Corona CA Sr. Leader, Automation Engineering (AI/ML)
## 67 Corona CA Sr. Manager, Supply Chain Business Intelligence and Data Sci...
## 68 Corona CA AI/Machine Learning Research Scientist
## 69 Corona CA Sr. Machine Learning Engineer
## 70 Corona CA Data Scientist
## 71 Corona CA Sr. Data Scientist - Chicago, IL
## 72 Corona CA Manager of Data Science
## 73 Corona CA Senior Data Analyst
## 74 Corona CA Medical Data Analyst
## HiringAgency
## 1 ReleasePointClaremont, CA 91711 (Towne Ranch area)•Remote work available
## 2 APR Consulting Inc4.2Rialto, CA
## 3 Insight Global4.0Santa Ana, CA 92704•Remote work available
## 4 Perceptronics Solutions, IncUnited States•Remote work available
## 5 Intelliloan4.0Costa Mesa, CA 92626•Remote work available
## 6 Acorns4.4Irvine, CA
## 7 Southern California Edison3.9Pomona, CA 91767
## 8 West Coast University3.7Irvine, CA 92617 (Research Park area)
## 9 Pacific Life3.8Aliso Viejo, CA 92656
## 10 American Career College3.9Irvine, CA 92617 (Research Park area)
## 11 Nihon Kohden America, Inc2.9Irvine, CA 92618 (Irvine Health and Science Complex area)•Remote work available
## 12 GustaineOrange, CA
## 13 Amazon.com Services LLC3.6Irvine, CA
## 14 Driveway4.1Aliso Viejo, CA
## 15 VSolvit LLC3.2Norco, CA 92860
## 16 i-Pharm ConsultingUnited States•Remote work available
## 17 Trace32.9Irvine, CA
## 18 CalOptima3.2Orange, CA
## 19 Pacific Life3.8Aliso Viejo, CA 92656
## 20 MobilitywareIrvine, CA 92602 (Lower Peters Canyon area)
## 21 Viant3.0Irvine, CA•Remote work available
## 22 Weedmaps2.8Irvine, CA
## 23 Inland Empire Health Plans3.6Rancho Cucamonga, CA 91730
## 24 Masco3.5Santa Ana, CA
## 25 GustaineOrange, CA
## 26 EViewsIrvine, CA 92612 (University Town Center area)
## 27 Southern California Edison3.9Pomona, CA 91767
## 28 The Trade Desk4.1Irvine, CA 92618 (Irvine Health and Science Complex area)
## 29 ULTIMATE STAFFING SERVICES3.8Irvine, CA
## 30 Alignment Healthcare2.8Orange, CA 92868
## 31 Anser AdvisoryPomona, CA 91766
## 32 ULTIMATE STAFFING SERVICES3.8Irvine, CA
## 33 Irvine Sensors Corporation3.8Costa Mesa, CA
## 34 AbbVie4.0Irvine, CA
## 35 2K Games3.6Foothill Ranch, CA
## 36 Black Knight Financial Services3.4Irvine, CA
## 37 Onica, a Rackspace CompanyIrvine, CA
## 38 ESRI, Inc.3.8Redlands, CA 92373
## 39 ESRI, Inc.3.8Redlands, CA 92373
## 40 Trace32.9Irvine, CA
## 41 InnoceanIrvine, CA•Remote work available
## 42 Obsidian Entertainment, Inc.Irvine, CA 92618 (Irvine Health and Science Complex area)
## 43 CoreLogic3.4Irvine, CA 92618 (Irvine Health and Science Complex area)
## 44 Alignment Healthcare2.8Orange, CA 92868
## 45 Accurate Background3.7Irvine, CA 92618 (Irvine Health and Science Complex area)
## 46 Anser AdvisoryPomona, CA 91766
## 47 ULTIMATE STAFFING SERVICES3.8Irvine, CA
## 48 Irvine Sensors Corporation3.8Costa Mesa, CA
## 49 AbbVie4.0Irvine, CA
## 50 2K Games3.6Foothill Ranch, CA
## 51 Black Knight Financial Services3.4Irvine, CA
## 52 Onica, a Rackspace CompanyIrvine, CA
## 53 ESRI, Inc.3.8Redlands, CA 92373
## 54 ESRI, Inc.3.8Redlands, CA 92373
## 55 Trace32.9Irvine, CA
## 56 InnoceanIrvine, CA•Remote work available
## 57 Obsidian Entertainment, Inc.Irvine, CA 92618 (Irvine Health and Science Complex area)
## 58 CoreLogic3.4Irvine, CA 92618 (Irvine Health and Science Complex area)
## 59 Black Knight Financial Services3.4Irvine, CA
## 60 Onica, a Rackspace CompanyIrvine, CA
## 61 ESRI, Inc.3.8Redlands, CA 92373
## 62 ESRI, Inc.3.8Redlands, CA 92373
## 63 Trace32.9Irvine, CA
## 64 InnoceanIrvine, CA•Remote work available
## 65 Obsidian Entertainment, Inc.Irvine, CA 92618 (Irvine Health and Science Complex area)
## 66 CoreLogic3.4Irvine, CA 92618 (Irvine Health and Science Complex area)
## 67 Niagara Bottling3.0Diamond Bar, CA 91765
## 68 Perceptronics Solutions, IncUnited States•Remote work available
## 69 Masimo3.5Irvine, CA 92618 (East Industrial Complex area)
## 70 Insight Global4.0Santa Ana, CA 92704•Remote work available
## 71 Biomerieux3.8United States
## 72 Niagara Bottling3.0Diamond Bar, CA 91765
## 73 APR Consulting Inc4.2Rialto, CA
## 74 ReleasePointClaremont, CA 91711 (Towne Ranch area)•Remote work available
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 24 45 70 45000 168000
## 2 12 45 70 45000 168000
## 3 15 45 70 45000 168000
## 4 30 45 70 45000 168000
## 5 21 45 70 45000 168000
## 6 1 45 70 45000 168000
## 7 6 45 70 45000 168000
## 8 26 45 70 45000 168000
## 9 4 45 70 45000 168000
## 10 26 45 70 45000 168000
## 11 4 45 70 45000 168000
## 12 30 45 70 45000 168000
## 13 25 45 70 45000 168000
## 14 30 45 70 45000 168000
## 15 30 45 70 45000 168000
## 16 22 45 70 45000 168000
## 17 30 45 70 45000 168000
## 18 30 45 70 45000 168000
## 19 17 45 70 45000 168000
## 20 30 45 70 45000 168000
## 21 30 45 70 45000 168000
## 22 10 45 70 45000 168000
## 23 29 45 70 45000 168000
## 24 30 45 70 45000 168000
## 25 30 45 70 45000 168000
## 26 11 45 70 45000 168000
## 27 30 45 70 45000 168000
## 28 30 45 70 45000 168000
## 29 12 45 70 45000 168000
## 30 30 45 70 45000 168000
## 31 30 45 70 45000 168000
## 32 12 45 70 45000 168000
## 33 30 45 70 45000 168000
## 34 30 45 70 45000 168000
## 35 30 45 70 45000 168000
## 36 30 45 70 45000 168000
## 37 30 45 70 45000 168000
## 38 30 45 70 45000 168000
## 39 30 45 70 45000 168000
## 40 30 45 70 45000 168000
## 41 30 45 70 45000 168000
## 42 30 45 70 45000 168000
## 43 30 45 70 45000 168000
## 44 30 45 70 45000 168000
## 45 30 45 70 45000 168000
## 46 30 45 70 45000 168000
## 47 12 45 70 45000 168000
## 48 30 45 70 45000 168000
## 49 30 45 70 45000 168000
## 50 30 45 70 45000 168000
## 51 30 45 70 45000 168000
## 52 30 45 70 45000 168000
## 53 30 45 70 45000 168000
## 54 30 45 70 45000 168000
## 55 30 45 70 45000 168000
## 56 30 45 70 45000 168000
## 57 30 45 70 45000 168000
## 58 30 45 70 45000 168000
## 59 30 45 70 45000 168000
## 60 30 45 70 45000 168000
## 61 30 45 70 45000 168000
## 62 30 45 70 45000 168000
## 63 30 45 70 45000 168000
## 64 30 45 70 45000 168000
## 65 30 45 70 45000 168000
## 66 30 45 70 45000 168000
## 67 30 45 70 45000 168000
## 68 30 45 70 45000 168000
## 69 30 45 70 45000 168000
## 70 15 45 70 45000 168000
## 71 30 45 70 45000 168000
## 72 20 45 70 45000 168000
## 73 12 45 70 45000 168000
## 74 24 45 70 45000 168000
getIndeedJobData5pages("data scientist", "Nashville","TN")
## Warning in getIndeedJobData5pages("data scientist", "Nashville", "TN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("data scientist", "Nashville", "TN"): NAs
## introduced by coercion
## Warning in max(hourly$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("data scientist", "Nashville", "TN"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Financial Data Scientist AI, NLP , quantlib
## 2 Senior Data Scientist
## 3 Data Scientist
## 4 $65/hr | Data Scientist/R/Python/NoSQL | Nashville, TN
## 5 Data Scientist II
## 6 Data Scientist (and Algorithm Developer)
## 7 Data Scientist
## 8 Data Scientist
## 9 Sr. Data Analyst
## 10 Retail Space Planning Data Scientist
## 11 Senior Data Scientist
## 12 Client Success data Scientist
## 13 Data Architect
## 14 STATISTICAL ANALYST 2*-06242020-9811
## 15 Data Scientist - Nationwide Opportunities
## 16 $65/hr | Data Scientist/R/Python/NoSQL | Nashville, TN
## 17 AI/Machine Learning Research Scientist
## 18 Data Architect
## 19 STATISTICAL ANALYST 2*-06242020-9811
## 20 Senior Data Scientist
## 21 Data Scientist - Nationwide Opportunities
## 22 Research Analyst Statistician
## 23 Statistician II, Latin American Public Opinion Project
## 24 Sr IT Data Analyst - Tech
## 25 Senior Data Science Engineer
## 26 Manager, Data Science - Labor Markets
## 27 Business Analytics Senior Manager - Customer Analytics (Stat...
## 28 Director of Data Science
## 29 Sr. Data Scientist - Chicago, IL
## 30 Data Scientist
## 31 Sr. Data Analyst
## 32 Retail Space Planning Data Scientist
## 33 Senior Data Scientist
## 34 Client Success data Scientist
## 35 Senior AI Engineer
## 36 Sr. Statistical Programmer - (100% REMOTE) - Excellent Pay,...
## 37 Data Architect
## 38 STATISTICAL ANALYST 2*-06242020-9811
## 39 Data Scientist - Nationwide Opportunities
## 40 Research Analyst Statistician
## 41 Statistician II, Latin American Public Opinion Project
## 42 Sr IT Data Analyst - Tech
## 43 Senior Data Science Engineer
## 44 Manager, Data Science - Labor Markets
## 45 Business Analytics Senior Manager - Customer Analytics (Stat...
## 46 Data Architect
## 47 STATISTICAL ANALYST 2*-06242020-9811
## 48 Data Scientist - Nationwide Opportunities
## 49 Research Analyst Statistician
## 50 Statistician II, Latin American Public Opinion Project
## 51 Sr IT Data Analyst - Tech
## 52 Senior Data Science Engineer
## 53 Manager, Data Science - Labor Markets
## 54 Business Analytics Senior Manager - Customer Analytics (Stat...
## 55 Sr. Data Scientist - Chicago, IL
## 56 $65/hr | Data Scientist/R/Python/NoSQL | Nashville, TN
## 57 Financial Data Scientist AI, NLP , quantlib
## 58 Senior Data Scientist
## 59 Data Scientist
## 60 Sr. Data Analyst
## 61 Retail Space Planning Data Scientist
## 62 Senior AI Engineer
## 63 Senior Data Scientist
## 64 Client Success data Scientist
## 65 Sr. Statistical Programmer - (100% REMOTE) - Excellent Pay,...
## 66 Data Architect
## 67 STATISTICAL ANALYST 2*-06242020-9811
## 68 Data Scientist - Nationwide Opportunities
## 69 Research Analyst Statistician
## 70 Statistician II, Latin American Public Opinion Project
## 71 Sr IT Data Analyst - Tech
## 72 Senior Data Science Engineer
## 73 Manager, Data Science - Labor Markets
## 74 Business Analytics Senior Manager - Customer Analytics (Stat...
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$75 an hour $75 75 NA
## 2 \n$30,156 a year $30156 30156 NA
## 3 \n$75 an hour $75 75 NA
## 4 \n$30,156 a year $30156 30156 NA
## 5 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## 6 \n$110,000 - $160,000 a year $110000 - $160000 110000 160000
## 7 \n$115,000 - $140,000 a year $115000 - $140000 115000 140000
## 8 \n$30,156 a year $30156 30156 NA
## 9 \n$30,156 a year $30156 30156 NA
## 10 \n$75 an hour $75 75 NA
## 11 \n$110,000 - $160,000 a year $110000 - $160000 110000 160000
## 12 \n$115,000 - $140,000 a year $115000 - $140000 115000 140000
## 13 \n$30,156 a year $30156 30156 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30156 110000 57769.62 84778.06 75
## 2 30156 110000 57769.62 84778.06 75
## 3 30156 110000 57769.62 84778.06 75
## 4 30156 110000 57769.62 84778.06 75
## 5 30156 110000 57769.62 84778.06 75
## 6 30156 110000 57769.62 84778.06 75
## 7 30156 110000 57769.62 84778.06 75
## 8 30156 110000 57769.62 84778.06 75
## 9 30156 110000 57769.62 84778.06 75
## 10 30156 110000 57769.62 84778.06 75
## 11 30156 110000 57769.62 84778.06 75
## 12 30156 110000 57769.62 84778.06 75
## 13 30156 110000 57769.62 84778.06 75
## maximumMaxSalary
## 1 175000
## 2 175000
## 3 175000
## 4 175000
## 5 175000
## 6 175000
## 7 175000
## 8 175000
## 9 175000
## 10 175000
## 11 175000
## 12 175000
## 13 175000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 20
## 3 30
## 4 18
## 5 6
## 6 30
## 7 30
## 8 30
## 9 1
## 10 30
## 11 30
## 12 30
## 13 Today
## 14 13
## 15 30
## 16 18
## 17 30
## 18 Today
## 19 13
## 20 20
## 21 30
## 22 6
## 23 1
## 24 30
## 25 30
## 26 30
## 27 19
## 28 11
## 29 30
## 30 30
## 31 1
## 32 30
## 33 30
## 34 30
## 35 8
## 36 22
## 37 Today
## 38 13
## 39 30
## 40 6
## 41 1
## 42 30
## 43 30
## 44 30
## 45 19
## 46 Today
## 47 13
## 48 30
## 49 6
## 50 1
## 51 30
## 52 30
## 53 30
## 54 19
## 55 30
## 56 18
## 57 30
## 58 20
## 59 30
## 60 1
## 61 30
## 62 8
## 63 30
## 64 30
## 65 22
## 66 Today
## 67 13
## 68 30
## 69 6
## 70 1
## 71 30
## 72 30
## 73 30
## 74 19
##
## [[4]]
## HiringAgency
## 1 Kanini Software SolutionsNashville, TN•Remote work available
## 2 PathGroup3.1Nashville, TN 37217 (Una area)•Remote work available
## 3 GEODIS3.5Brentwood, TN
## 4 Vaco3.7Brentwood, TN 37027
## 5 Amazon.com Services LLC3.6Nashville, TN
## 6 Bridgestone Americas3.7Nashville, TN 37201
## 7 Envision Healthcare SystemsNashville, TN 37215 (Green Hills area)
## 8 Asurion3.6Nashville, TN 37201
## 9 Centralized Management Services LLCNashville, TN 37205
## 10 Tractor Supply Company3.5Brentwood, TN 37027
## 11 iHeartMedia, Inc.3.7Nashville, TN 37201
## 12 TrakRef INCNashville, TN
## 13 EY4.0Nashville, TN 37201
## 14 State of Tennessee3.7Nashville, TN 37219
## 15 Amazon Web Services, Inc.3.6Nashville, TN
## 16 Vaco3.7Brentwood, TN 37027
## 17 Perceptronics Solutions, IncUnited States•Remote work available
## 18 EY4.0Nashville, TN 37201
## 19 State of Tennessee3.7Nashville, TN 37219
## 20 PathGroup3.1Nashville, TN 37217 (Una area)•Remote work available
## 21 Amazon Web Services, Inc.3.6Nashville, TN
## 22 HCA Healthcare3.7Brentwood, TN 37027
## 23 Vanderbilt University4.0Nashville, TN 37240
## 24 EviCore3.3Franklin, TN 37067 (McEwen area)
## 25 iHeartRadio3.7Nashville, TN
## 26 Amazon.com Services LLC3.6Nashville, TN
## 27 Cigna3.7Nashville, TN 37214
## 28 Clearlink Partners LLC.4.2United States•Remote work available
## 29 Biomerieux3.8United States
## 30 GEODIS3.5Brentwood, TN
## 31 Centralized Management Services LLCNashville, TN 37205
## 32 Tractor Supply Company3.5Brentwood, TN 37027
## 33 iHeartMedia, Inc.3.7Nashville, TN 37201
## 34 TrakRef INCNashville, TN
## 35 Catasys3.0United States•Remote work available
## 36 i-Pharm ConsultingUnited States•Remote work available
## 37 EY4.0Nashville, TN 37201
## 38 State of Tennessee3.7Nashville, TN 37219
## 39 Amazon Web Services, Inc.3.6Nashville, TN
## 40 HCA Healthcare3.7Brentwood, TN 37027
## 41 Vanderbilt University4.0Nashville, TN 37240
## 42 EviCore3.3Franklin, TN 37067 (McEwen area)
## 43 iHeartRadio3.7Nashville, TN
## 44 Amazon.com Services LLC3.6Nashville, TN
## 45 Cigna3.7Nashville, TN 37214
## 46 EY4.0Nashville, TN 37201
## 47 State of Tennessee3.7Nashville, TN 37219
## 48 Amazon Web Services, Inc.3.6Nashville, TN
## 49 HCA Healthcare3.7Brentwood, TN 37027
## 50 Vanderbilt University4.0Nashville, TN 37240
## 51 EviCore3.3Franklin, TN 37067 (McEwen area)
## 52 iHeartRadio3.7Nashville, TN
## 53 Amazon.com Services LLC3.6Nashville, TN
## 54 Cigna3.7Nashville, TN 37214
## 55 Biomerieux3.8United States
## 56 Vaco3.7Brentwood, TN 37027
## 57 Kanini Software SolutionsNashville, TN•Remote work available
## 58 PathGroup3.1Nashville, TN 37217 (Una area)•Remote work available
## 59 GEODIS3.5Brentwood, TN
## 60 Centralized Management Services LLCNashville, TN 37205
## 61 Tractor Supply Company3.5Brentwood, TN 37027
## 62 Catasys3.0United States•Remote work available
## 63 iHeartMedia, Inc.3.7Nashville, TN 37201
## 64 TrakRef INCNashville, TN
## 65 i-Pharm ConsultingUnited States•Remote work available
## 66 EY4.0Nashville, TN 37201
## 67 State of Tennessee3.7Nashville, TN 37219
## 68 Amazon Web Services, Inc.3.6Nashville, TN
## 69 HCA Healthcare3.7Brentwood, TN 37027
## 70 Vanderbilt University4.0Nashville, TN 37240
## 71 EviCore3.3Franklin, TN 37067 (McEwen area)
## 72 iHeartRadio3.7Nashville, TN
## 73 Amazon.com Services LLC3.6Nashville, TN
## 74 Cigna3.7Nashville, TN 37214
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$30,156 a year $30156 30156 NA
## 4 \n$30,156 a year $30156 30156 NA
## 5 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## 6 \n$110,000 - $160,000 a year $110000 - $160000 110000 160000
## 7 \n$115,000 - $140,000 a year $115000 - $140000 115000 140000
## 8 \n$30,156 a year $30156 30156 NA
## 9 \n$30,156 a year $30156 30156 NA
## 11 \n$110,000 - $160,000 a year $110000 - $160000 110000 160000
## 12 \n$115,000 - $140,000 a year $115000 - $140000 115000 140000
## 13 \n$30,156 a year $30156 30156 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 70078 160000 75078 155000 30156
## 4 70078 160000 75078 155000 30156
## 5 70078 160000 75078 155000 30156
## 6 70078 160000 75078 155000 30156
## 7 70078 160000 75078 155000 30156
## 8 70078 160000 75078 155000 30156
## 9 70078 160000 75078 155000 30156
## 11 70078 160000 75078 155000 30156
## 12 70078 160000 75078 155000 30156
## 13 70078 160000 75078 155000 30156
## maximumMaxSalary
## 2 175000
## 4 175000
## 5 175000
## 6 175000
## 7 175000
## 8 175000
## 9 175000
## 11 175000
## 12 175000
## 13 175000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 1 \n$75 an hour $75 75 NA 75 NA
## 3 \n$75 an hour $75 75 NA 75 NA
## 10 \n$75 an hour $75 75 NA 75 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 75 NaN 75 -Inf
## 3 75 NaN 75 -Inf
## 10 75 NaN 75 -Inf
##
## [[7]]
## city state
## 1 Nashville TN
## 2 Nashville TN
## 3 Nashville TN
## 4 Nashville TN
## 5 Nashville TN
## 6 Nashville TN
## 7 Nashville TN
## 8 Nashville TN
## 9 Nashville TN
## 10 Nashville TN
## 11 Nashville TN
## 12 Nashville TN
## 13 Nashville TN
## 14 Nashville TN
## 15 Nashville TN
## 16 Nashville TN
## 17 Nashville TN
## 18 Nashville TN
## 19 Nashville TN
## 20 Nashville TN
## 21 Nashville TN
## 22 Nashville TN
## 23 Nashville TN
## 24 Nashville TN
## 25 Nashville TN
## 26 Nashville TN
## 27 Nashville TN
## 28 Nashville TN
## 29 Nashville TN
## 30 Nashville TN
## 31 Nashville TN
## 32 Nashville TN
## 33 Nashville TN
## 34 Nashville TN
## 35 Nashville TN
## 36 Nashville TN
## 37 Nashville TN
## 38 Nashville TN
## 39 Nashville TN
## 40 Nashville TN
## 41 Nashville TN
## 42 Nashville TN
## 43 Nashville TN
## 44 Nashville TN
## 45 Nashville TN
## 46 Nashville TN
## 47 Nashville TN
## 48 Nashville TN
## 49 Nashville TN
## 50 Nashville TN
## 51 Nashville TN
## 52 Nashville TN
## 53 Nashville TN
## 54 Nashville TN
## 55 Nashville TN
## 56 Nashville TN
## 57 Nashville TN
## 58 Nashville TN
## 59 Nashville TN
## 60 Nashville TN
## 61 Nashville TN
## 62 Nashville TN
## 63 Nashville TN
## 64 Nashville TN
## 65 Nashville TN
## 66 Nashville TN
## 67 Nashville TN
## 68 Nashville TN
## 69 Nashville TN
## 70 Nashville TN
## 71 Nashville TN
## 72 Nashville TN
## 73 Nashville TN
## 74 Nashville TN
## jobTitle
## 1 Financial Data Scientist AI, NLP , quantlib
## 2 Senior Data Scientist
## 3 Data Scientist
## 4 $65/hr | Data Scientist/R/Python/NoSQL | Nashville, TN
## 5 Data Scientist II
## 6 Data Scientist (and Algorithm Developer)
## 7 Data Scientist
## 8 Data Scientist
## 9 Sr. Data Analyst
## 10 Retail Space Planning Data Scientist
## 11 Senior Data Scientist
## 12 Client Success data Scientist
## 13 Data Architect
## 14 STATISTICAL ANALYST 2*-06242020-9811
## 15 Data Scientist - Nationwide Opportunities
## 16 $65/hr | Data Scientist/R/Python/NoSQL | Nashville, TN
## 17 AI/Machine Learning Research Scientist
## 18 Data Architect
## 19 STATISTICAL ANALYST 2*-06242020-9811
## 20 Senior Data Scientist
## 21 Data Scientist - Nationwide Opportunities
## 22 Research Analyst Statistician
## 23 Statistician II, Latin American Public Opinion Project
## 24 Sr IT Data Analyst - Tech
## 25 Senior Data Science Engineer
## 26 Manager, Data Science - Labor Markets
## 27 Business Analytics Senior Manager - Customer Analytics (Stat...
## 28 Director of Data Science
## 29 Sr. Data Scientist - Chicago, IL
## 30 Data Scientist
## 31 Sr. Data Analyst
## 32 Retail Space Planning Data Scientist
## 33 Senior Data Scientist
## 34 Client Success data Scientist
## 35 Senior AI Engineer
## 36 Sr. Statistical Programmer - (100% REMOTE) - Excellent Pay,...
## 37 Data Architect
## 38 STATISTICAL ANALYST 2*-06242020-9811
## 39 Data Scientist - Nationwide Opportunities
## 40 Research Analyst Statistician
## 41 Statistician II, Latin American Public Opinion Project
## 42 Sr IT Data Analyst - Tech
## 43 Senior Data Science Engineer
## 44 Manager, Data Science - Labor Markets
## 45 Business Analytics Senior Manager - Customer Analytics (Stat...
## 46 Data Architect
## 47 STATISTICAL ANALYST 2*-06242020-9811
## 48 Data Scientist - Nationwide Opportunities
## 49 Research Analyst Statistician
## 50 Statistician II, Latin American Public Opinion Project
## 51 Sr IT Data Analyst - Tech
## 52 Senior Data Science Engineer
## 53 Manager, Data Science - Labor Markets
## 54 Business Analytics Senior Manager - Customer Analytics (Stat...
## 55 Sr. Data Scientist - Chicago, IL
## 56 $65/hr | Data Scientist/R/Python/NoSQL | Nashville, TN
## 57 Financial Data Scientist AI, NLP , quantlib
## 58 Senior Data Scientist
## 59 Data Scientist
## 60 Sr. Data Analyst
## 61 Retail Space Planning Data Scientist
## 62 Senior AI Engineer
## 63 Senior Data Scientist
## 64 Client Success data Scientist
## 65 Sr. Statistical Programmer - (100% REMOTE) - Excellent Pay,...
## 66 Data Architect
## 67 STATISTICAL ANALYST 2*-06242020-9811
## 68 Data Scientist - Nationwide Opportunities
## 69 Research Analyst Statistician
## 70 Statistician II, Latin American Public Opinion Project
## 71 Sr IT Data Analyst - Tech
## 72 Senior Data Science Engineer
## 73 Manager, Data Science - Labor Markets
## 74 Business Analytics Senior Manager - Customer Analytics (Stat...
## HiringAgency
## 1 Kanini Software SolutionsNashville, TN•Remote work available
## 2 PathGroup3.1Nashville, TN 37217 (Una area)•Remote work available
## 3 GEODIS3.5Brentwood, TN
## 4 Vaco3.7Brentwood, TN 37027
## 5 Amazon.com Services LLC3.6Nashville, TN
## 6 Bridgestone Americas3.7Nashville, TN 37201
## 7 Envision Healthcare SystemsNashville, TN 37215 (Green Hills area)
## 8 Asurion3.6Nashville, TN 37201
## 9 Centralized Management Services LLCNashville, TN 37205
## 10 Tractor Supply Company3.5Brentwood, TN 37027
## 11 iHeartMedia, Inc.3.7Nashville, TN 37201
## 12 TrakRef INCNashville, TN
## 13 EY4.0Nashville, TN 37201
## 14 State of Tennessee3.7Nashville, TN 37219
## 15 Amazon Web Services, Inc.3.6Nashville, TN
## 16 Vaco3.7Brentwood, TN 37027
## 17 Perceptronics Solutions, IncUnited States•Remote work available
## 18 EY4.0Nashville, TN 37201
## 19 State of Tennessee3.7Nashville, TN 37219
## 20 PathGroup3.1Nashville, TN 37217 (Una area)•Remote work available
## 21 Amazon Web Services, Inc.3.6Nashville, TN
## 22 HCA Healthcare3.7Brentwood, TN 37027
## 23 Vanderbilt University4.0Nashville, TN 37240
## 24 EviCore3.3Franklin, TN 37067 (McEwen area)
## 25 iHeartRadio3.7Nashville, TN
## 26 Amazon.com Services LLC3.6Nashville, TN
## 27 Cigna3.7Nashville, TN 37214
## 28 Clearlink Partners LLC.4.2United States•Remote work available
## 29 Biomerieux3.8United States
## 30 GEODIS3.5Brentwood, TN
## 31 Centralized Management Services LLCNashville, TN 37205
## 32 Tractor Supply Company3.5Brentwood, TN 37027
## 33 iHeartMedia, Inc.3.7Nashville, TN 37201
## 34 TrakRef INCNashville, TN
## 35 Catasys3.0United States•Remote work available
## 36 i-Pharm ConsultingUnited States•Remote work available
## 37 EY4.0Nashville, TN 37201
## 38 State of Tennessee3.7Nashville, TN 37219
## 39 Amazon Web Services, Inc.3.6Nashville, TN
## 40 HCA Healthcare3.7Brentwood, TN 37027
## 41 Vanderbilt University4.0Nashville, TN 37240
## 42 EviCore3.3Franklin, TN 37067 (McEwen area)
## 43 iHeartRadio3.7Nashville, TN
## 44 Amazon.com Services LLC3.6Nashville, TN
## 45 Cigna3.7Nashville, TN 37214
## 46 EY4.0Nashville, TN 37201
## 47 State of Tennessee3.7Nashville, TN 37219
## 48 Amazon Web Services, Inc.3.6Nashville, TN
## 49 HCA Healthcare3.7Brentwood, TN 37027
## 50 Vanderbilt University4.0Nashville, TN 37240
## 51 EviCore3.3Franklin, TN 37067 (McEwen area)
## 52 iHeartRadio3.7Nashville, TN
## 53 Amazon.com Services LLC3.6Nashville, TN
## 54 Cigna3.7Nashville, TN 37214
## 55 Biomerieux3.8United States
## 56 Vaco3.7Brentwood, TN 37027
## 57 Kanini Software SolutionsNashville, TN•Remote work available
## 58 PathGroup3.1Nashville, TN 37217 (Una area)•Remote work available
## 59 GEODIS3.5Brentwood, TN
## 60 Centralized Management Services LLCNashville, TN 37205
## 61 Tractor Supply Company3.5Brentwood, TN 37027
## 62 Catasys3.0United States•Remote work available
## 63 iHeartMedia, Inc.3.7Nashville, TN 37201
## 64 TrakRef INCNashville, TN
## 65 i-Pharm ConsultingUnited States•Remote work available
## 66 EY4.0Nashville, TN 37201
## 67 State of Tennessee3.7Nashville, TN 37219
## 68 Amazon Web Services, Inc.3.6Nashville, TN
## 69 HCA Healthcare3.7Brentwood, TN 37027
## 70 Vanderbilt University4.0Nashville, TN 37240
## 71 EviCore3.3Franklin, TN 37067 (McEwen area)
## 72 iHeartRadio3.7Nashville, TN
## 73 Amazon.com Services LLC3.6Nashville, TN
## 74 Cigna3.7Nashville, TN 37214
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 75 75 30156 175000
## 2 20 75 75 30156 175000
## 3 30 75 75 30156 175000
## 4 18 75 75 30156 175000
## 5 6 75 75 30156 175000
## 6 30 75 75 30156 175000
## 7 30 75 75 30156 175000
## 8 30 75 75 30156 175000
## 9 1 75 75 30156 175000
## 10 30 75 75 30156 175000
## 11 30 75 75 30156 175000
## 12 30 75 75 30156 175000
## 13 Today 75 75 30156 175000
## 14 13 75 75 30156 175000
## 15 30 75 75 30156 175000
## 16 18 75 75 30156 175000
## 17 30 75 75 30156 175000
## 18 Today 75 75 30156 175000
## 19 13 75 75 30156 175000
## 20 20 75 75 30156 175000
## 21 30 75 75 30156 175000
## 22 6 75 75 30156 175000
## 23 1 75 75 30156 175000
## 24 30 75 75 30156 175000
## 25 30 75 75 30156 175000
## 26 30 75 75 30156 175000
## 27 19 75 75 30156 175000
## 28 11 75 75 30156 175000
## 29 30 75 75 30156 175000
## 30 30 75 75 30156 175000
## 31 1 75 75 30156 175000
## 32 30 75 75 30156 175000
## 33 30 75 75 30156 175000
## 34 30 75 75 30156 175000
## 35 8 75 75 30156 175000
## 36 22 75 75 30156 175000
## 37 Today 75 75 30156 175000
## 38 13 75 75 30156 175000
## 39 30 75 75 30156 175000
## 40 6 75 75 30156 175000
## 41 1 75 75 30156 175000
## 42 30 75 75 30156 175000
## 43 30 75 75 30156 175000
## 44 30 75 75 30156 175000
## 45 19 75 75 30156 175000
## 46 Today 75 75 30156 175000
## 47 13 75 75 30156 175000
## 48 30 75 75 30156 175000
## 49 6 75 75 30156 175000
## 50 1 75 75 30156 175000
## 51 30 75 75 30156 175000
## 52 30 75 75 30156 175000
## 53 30 75 75 30156 175000
## 54 19 75 75 30156 175000
## 55 30 75 75 30156 175000
## 56 18 75 75 30156 175000
## 57 30 75 75 30156 175000
## 58 20 75 75 30156 175000
## 59 30 75 75 30156 175000
## 60 1 75 75 30156 175000
## 61 30 75 75 30156 175000
## 62 8 75 75 30156 175000
## 63 30 75 75 30156 175000
## 64 30 75 75 30156 175000
## 65 22 75 75 30156 175000
## 66 Today 75 75 30156 175000
## 67 13 75 75 30156 175000
## 68 30 75 75 30156 175000
## 69 6 75 75 30156 175000
## 70 1 75 75 30156 175000
## 71 30 75 75 30156 175000
## 72 30 75 75 30156 175000
## 73 30 75 75 30156 175000
## 74 19 75 75 30156 175000
getIndeedJobData5pages("data scientist", "Walnut Creek","CA")
## Warning in getIndeedJobData5pages("data scientist", "Walnut Creek", "CA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("data scientist", "Walnut Creek", "CA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("data scientist", "Walnut Creek", "CA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Data Scientist
## 2 Data Scientist -San Francisco
## 3 Senior Data Analyst - Finance & Platform Analytics
## 4 Data Scientist
## 5 Data Scientist
## 6 Data Scientist
## 7 Data Scientist
## 8 Data Scientist
## 9 Data scientist
## 10 Data Scientist – Manage and Analyze at Seal Software – a Doc...
## 11 Data Scientist
## 12 Data Scientist, Insights and Analytics
## 13 Data Scientist
## 14 Director of Data Science
## 15 Data Scientist
## 16 Principal Data Scientist (Remote Availability)
## 17 Data Engineer, Machine Learning
## 18 Senior Data Scientist
## 19 Associate Data Scientist
## 20 Sr. Data Scientist
## 21 Data Scientist
## 22 Data Scientist
## 23 Data Scientist
## 24 Data Scientist at IBM (Visa Sponsorship for Canada)
## 25 Research Data Scientist
## 26 Data Scientist, Analytics
## 27 Data Scientist, Analytics - Instagram Business Ecosystem
## 28 Data Scientist
## 29 Sr. Data Scientist - Chicago, IL
## 30 Data Scientist -San Francisco
## 31 Financial Analyst Summer Intern - Ideal for a Grad Student!
## 32 Data Scientist, Forecasting
## 33 Product Data Scientist
## 34 Bioinformatics Data Scientist
## 35 Staff Data Scientist
## 36 Data Scientist
## 37 Data Engineer
## 38 Data Analyst Intern
## 39 Data Scientist - Early Career
## 40 Data Scientist
## 41 Data Scientist, Merchandising Strategy
## 42 Data Scientist (Ph.D)
## 43 Data Scientist
## 44 Data Scientist - Product Analytics
## 45 Data Scientist
## 46 Data Scientist
## 47 Data Scientist
## 48 Sr. Data Scientist
## 49 Senior Data Scientist
## 50 Data Scientist, Product Analytics
## 51 Data Scientist
## 52 2020 PhD University Graduate - Data Scientist - Rides
## 53 Data Scientist 3 (718)
## 54 Data Science Content Writing Intern - Remote
## 55 Machine Learning Engineer/AI Engineer
## 56 Data Scientist (Computer Vision)
## 57 Data Scientist
## 58 AI Engineer / AI Scientist
## 59 Data Scientist
## 60 Data Scientist, Trust & Safety
## 61 Data Scientist, Transaction Monitoring
## 62 Data Scientist (Ph.D)
## 63 Data Scientist
## 64 Data Scientist - Product Analytics
## 65 Data Scientist
## 66 Data Scientist
## 67 Sr. Data Scientist
## 68 Senior Data Scientist
## 69 Data Scientist, Product Analytics
## 70 Data Scientist -San Francisco
## 71 Data Science Health Innovation Fellow
## 72 Data Scientist
## 73 Senior Data Scientist
## 74 Principal Data Scientist (Remote Availability)
## 75 Data Engineer, Machine Learning
## 76 Financial Analyst Summer Intern - Ideal for a Grad Student!
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$250,000 - $375,000 a year $250000 - $375000 250000 375000
## 2 \n$45 - $65 an hour $45 - $65 45 65
## 3 \n$120,000 a year $120000 120000 NA
## 4 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## 5 \n$250,000 - $375,000 a year $250000 - $375000 250000 375000
## 6 \n$150,000 - $160,000 a year $150000 - $160000 150000 160000
## 7 \n$160,000 - $180,000 a year $160000 - $180000 160000 180000
## 8 \n$65 - $75 an hour $65 - $75 65 75
## 9 \n$5,000 a month $5000 5000 NA
## 10 \n$60,000 - $75,000 a year $60000 - $75000 60000 75000
## 11 \n$16 an hour $16 16 NA
## 12 \n$60,000 - $75,000 a year $60000 - $75000 60000 75000
## 13 \n$10 - $15 an hour $10 - $15 10 15
## 14 \n$45 - $50 an hour $45 - $50 45 50
## 15 \n$60,000 - $75,000 a year $60000 - $75000 60000 75000
## 16 \n$250,000 - $375,000 a year $250000 - $375000 250000 375000
## 17 \n$160,000 - $180,000 a year $160000 - $180000 160000 180000
## 18 \n$150,000 - $160,000 a year $150000 - $160000 150000 160000
## 19 \n$5,000 a month $5000 5000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 60000 97500 96325.32 118687.8 10
## 2 60000 97500 96325.32 118687.8 10
## 3 60000 97500 96325.32 118687.8 10
## 4 60000 97500 96325.32 118687.8 10
## 5 60000 97500 96325.32 118687.8 10
## 6 60000 97500 96325.32 118687.8 10
## 7 60000 97500 96325.32 118687.8 10
## 8 60000 97500 96325.32 118687.8 10
## 9 60000 97500 96325.32 118687.8 10
## 10 60000 97500 96325.32 118687.8 10
## 11 60000 97500 96325.32 118687.8 10
## 12 60000 97500 96325.32 118687.8 10
## 13 60000 97500 96325.32 118687.8 10
## 14 60000 97500 96325.32 118687.8 10
## 15 60000 97500 96325.32 118687.8 10
## 16 60000 97500 96325.32 118687.8 10
## 17 60000 97500 96325.32 118687.8 10
## 18 60000 97500 96325.32 118687.8 10
## 19 60000 97500 96325.32 118687.8 10
## maximumMaxSalary
## 1 375000
## 2 375000
## 3 375000
## 4 375000
## 5 375000
## 6 375000
## 7 375000
## 8 375000
## 9 375000
## 10 375000
## 11 375000
## 12 375000
## 13 375000
## 14 375000
## 15 375000
## 16 375000
## 17 375000
## 18 375000
## 19 375000
##
## [[3]]
## date_daysAgo
## 1 15
## 2 7
## 3 30
## 4 30
## 5 1
## 6 30
## 7 11
## 8 6
## 9 22
## 10 13
## 11 8
## 12 30
## 13 18
## 14 11
## 15 15
## 16 30
## 17 18
## 18 17
## 19 30
## 20 21
## 21 30
## 22 30
## 23 30
## 24 7
## 25 30
## 26 24
## 27 10
## 28 30
## 29 30
## 30 7
## 31 5
## 32 30
## 33 19
## 34 8
## 35 20
## 36 30
## 37 13
## 38 30
## 39 30
## 40 30
## 41 10
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 19
## 49 5
## 50 30
## 51 30
## 52 30
## 53 20
## 54 26
## 55 Just posted
## 56 30
## 57 20
## 58 7
## 59 30
## 60 30
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
## 66 30
## 67 19
## 68 5
## 69 30
## 70 7
## 71 30
## 72 15
## 73 17
## 74 30
## 75 18
## 76 5
##
## [[4]]
## HiringAgency
## 1 Blue OwlSan Francisco, CA
## 2 Envision LLCSan Francisco, CA
## 3 Twitch4.4San Francisco, CA 94104 (Financial District area)
## 4 Global Fishing WatchOakland, CA•Remote work available
## 5 GradTests (gradtests.com)San Francisco, CA•Remote work available
## 6 Yapstone3.5Walnut Creek, CA
## 7 University of California San Francisco4.2San Francisco, CA 94143 (Haight-Ashbury area)
## 8 Ancestry3.9San Francisco, CA 94107 (South Beach area)
## 9 Avila TradingSan Francisco, CA
## 10 DocuSign3.8Walnut Creek, CA
## 11 Spin Electric Scooters3.1San Francisco, CA
## 12 Virta Health4.8San Francisco, CA 94105 (South Beach area)
## 13 MicroagilitySan Francisco Bay Area, CA
## 14 Clearlink Partners LLC.4.2United States•Remote work available
## 15 Blue OwlSan Francisco, CA
## 16 John Deere4.0San Francisco, CA 94105 (Financial District area)•Remote work available
## 17 BICP5.0San Francisco, CA•Remote work available
## 18 BICP5.0San Francisco, CA (North Waterfront area)•Remote work available
## 19 Lawrence Berkeley National Laboratory4.2San Francisco Bay Area, CA
## 20 Digital DharaPleasanton, CA•Remote work available
## 21 SentiLinkSan Francisco, CA 94103 (South of Market area)
## 22 MindstrongSan Francisco, CA•Remote work available
## 23 NotionSan Francisco, CA 94110 (Mission area)
## 24 Talent Acquisition QuébecSan Francisco Bay Area, CA
## 25 University of California San Francisco4.2San Francisco, CA 94143 (Haight-Ashbury area)
## 26 Outschool3.5San Francisco, CA 94110 (Mission area)
## 27 Facebook4.2San Francisco, CA
## 28 Duetto ResearchSan Francisco, CA 94108 (Downtown area)
## 29 Biomerieux3.8United States
## 30 Envision LLCSan Francisco, CA
## 31 MPL BrandsSausalito, CA 94965
## 32 GeliSan Francisco, CA 94105 (Financial District area)
## 33 Twitter4.1San Francisco, CA 94103 (South of Market area)
## 34 Invitae3.6San Francisco, CA 94107 (South of Market area)
## 35 Twitter4.1San Francisco, CA 94103 (South of Market area)
## 36 ProlancerSan Francisco, CA•Remote work available
## 37 Grid DynamicsSan Ramon, CA+1 location
## 38 ShowwcaseSan Francisco, CA•Remote work available
## 39 Lawrence Livermore National Laboratory4.2Livermore, CA 94550
## 40 Bond Financial TechnologiesSan Francisco, CA
## 41 Wish3.8San Francisco, CA
## 42 Pacific Data IntegratorsSan Francisco, CA
## 43 Brightidea4.5San Francisco, CA
## 44 ThirdLove4.1San Francisco, CA
## 45 Pro LancerSan Francisco, CA
## 46 AsanaSan Francisco, CA 94103 (Mission area)
## 47 AsanaSan Francisco, CA 94103 (Mission area)
## 48 Woodruff Sawyer3.3San Francisco, CA 94111 (Financial District area)
## 49 Carbon Health2.0San Francisco, CA
## 50 ScaleapiSan Francisco, CA
## 51 CipherTraceSan Francisco Bay Area, CA
## 52 Uber3.8San Francisco, CA 94103 (South of Market area)
## 53 Amyris, Inc.Emeryville, CA
## 54 Interview QuerySan Francisco, CA•Remote work available
## 55 Atlantis IT Consulting Group LLCSan Francisco, CA 94104 (Financial District area)•Remote work available
## 56 AI FactorySan Francisco, CA
## 57 ViberSan Francisco, CA
## 58 Mythic-AISan Francisco Bay Area, CA
## 59 Clever4.2San Francisco, CA 94103 (South of Market area)
## 60 Pinterest4.2San Francisco, CA 94103 (South of Market area)
## 61 Wish3.8San Francisco, CA
## 62 Pacific Data IntegratorsSan Francisco, CA
## 63 Brightidea4.5San Francisco, CA
## 64 ThirdLove4.1San Francisco, CA
## 65 Pro LancerSan Francisco, CA
## 66 AsanaSan Francisco, CA 94103 (Mission area)
## 67 Woodruff Sawyer3.3San Francisco, CA 94111 (Financial District area)
## 68 Carbon Health2.0San Francisco, CA
## 69 ScaleapiSan Francisco, CA
## 70 Envision LLCSan Francisco, CA
## 71 University of California San Francisco4.2San Francisco, CA 94143 (Haight-Ashbury area)
## 72 Blue OwlSan Francisco, CA
## 73 BICP5.0San Francisco, CA (North Waterfront area)•Remote work available
## 74 John Deere4.0San Francisco, CA 94105 (Financial District area)•Remote work available
## 75 BICP5.0San Francisco, CA•Remote work available
## 76 MPL BrandsSausalito, CA 94965
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$250,000 - $375,000 a year $250000 - $375000 250000 375000
## 3 \n$120,000 a year $120000 120000 NA
## 4 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## 5 \n$250,000 - $375,000 a year $250000 - $375000 250000 375000
## 6 \n$150,000 - $160,000 a year $150000 - $160000 150000 160000
## 7 \n$160,000 - $180,000 a year $160000 - $180000 160000 180000
## 10 \n$60,000 - $75,000 a year $60000 - $75000 60000 75000
## 12 \n$60,000 - $75,000 a year $60000 - $75000 60000 75000
## 15 \n$60,000 - $75,000 a year $60000 - $75000 60000 75000
## 16 \n$250,000 - $375,000 a year $250000 - $375000 250000 375000
## 17 \n$160,000 - $180,000 a year $160000 - $180000 160000 180000
## 18 \n$150,000 - $160,000 a year $150000 - $160000 150000 160000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 150000 175000 151666.7 200454.5 60000
## 3 150000 175000 151666.7 200454.5 60000
## 4 150000 175000 151666.7 200454.5 60000
## 5 150000 175000 151666.7 200454.5 60000
## 6 150000 175000 151666.7 200454.5 60000
## 7 150000 175000 151666.7 200454.5 60000
## 10 150000 175000 151666.7 200454.5 60000
## 12 150000 175000 151666.7 200454.5 60000
## 15 150000 175000 151666.7 200454.5 60000
## 16 150000 175000 151666.7 200454.5 60000
## 17 150000 175000 151666.7 200454.5 60000
## 18 150000 175000 151666.7 200454.5 60000
## maximumMaxSalary
## 1 375000
## 3 375000
## 4 375000
## 5 375000
## 6 375000
## 7 375000
## 10 375000
## 12 375000
## 15 375000
## 16 375000
## 17 375000
## 18 375000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$45 - $65 an hour $45 - $65 45 65 45
## 8 \n$65 - $75 an hour $65 - $75 65 75 45
## 11 \n$16 an hour $16 16 NA 45
## 13 \n$10 - $15 an hour $10 - $15 10 15 45
## 14 \n$45 - $50 an hour $45 - $50 45 50 45
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 57.5 36.2 51.25 10 75
## 8 57.5 36.2 51.25 10 75
## 11 57.5 36.2 51.25 10 75
## 13 57.5 36.2 51.25 10 75
## 14 57.5 36.2 51.25 10 75
##
## [[7]]
## city state
## 1 Walnut Creek CA
## 2 Walnut Creek CA
## 3 Walnut Creek CA
## 4 Walnut Creek CA
## 5 Walnut Creek CA
## 6 Walnut Creek CA
## 7 Walnut Creek CA
## 8 Walnut Creek CA
## 9 Walnut Creek CA
## 10 Walnut Creek CA
## 11 Walnut Creek CA
## 12 Walnut Creek CA
## 13 Walnut Creek CA
## 14 Walnut Creek CA
## 15 Walnut Creek CA
## 16 Walnut Creek CA
## 17 Walnut Creek CA
## 18 Walnut Creek CA
## 19 Walnut Creek CA
## 20 Walnut Creek CA
## 21 Walnut Creek CA
## 22 Walnut Creek CA
## 23 Walnut Creek CA
## 24 Walnut Creek CA
## 25 Walnut Creek CA
## 26 Walnut Creek CA
## 27 Walnut Creek CA
## 28 Walnut Creek CA
## 29 Walnut Creek CA
## 30 Walnut Creek CA
## 31 Walnut Creek CA
## 32 Walnut Creek CA
## 33 Walnut Creek CA
## 34 Walnut Creek CA
## 35 Walnut Creek CA
## 36 Walnut Creek CA
## 37 Walnut Creek CA
## 38 Walnut Creek CA
## 39 Walnut Creek CA
## 40 Walnut Creek CA
## 41 Walnut Creek CA
## 42 Walnut Creek CA
## 43 Walnut Creek CA
## 44 Walnut Creek CA
## 45 Walnut Creek CA
## 46 Walnut Creek CA
## 47 Walnut Creek CA
## 48 Walnut Creek CA
## 49 Walnut Creek CA
## 50 Walnut Creek CA
## 51 Walnut Creek CA
## 52 Walnut Creek CA
## 53 Walnut Creek CA
## 54 Walnut Creek CA
## 55 Walnut Creek CA
## 56 Walnut Creek CA
## 57 Walnut Creek CA
## 58 Walnut Creek CA
## 59 Walnut Creek CA
## 60 Walnut Creek CA
## 61 Walnut Creek CA
## 62 Walnut Creek CA
## 63 Walnut Creek CA
## 64 Walnut Creek CA
## 65 Walnut Creek CA
## 66 Walnut Creek CA
## 67 Walnut Creek CA
## 68 Walnut Creek CA
## 69 Walnut Creek CA
## 70 Walnut Creek CA
## 71 Walnut Creek CA
## 72 Walnut Creek CA
## 73 Walnut Creek CA
## 74 Walnut Creek CA
## 75 Walnut Creek CA
## 76 Walnut Creek CA
## jobTitle
## 1 Data Scientist
## 2 Data Scientist -San Francisco
## 3 Senior Data Analyst - Finance & Platform Analytics
## 4 Data Scientist
## 5 Data Scientist
## 6 Data Scientist
## 7 Data Scientist
## 8 Data Scientist
## 9 Data scientist
## 10 Data Scientist – Manage and Analyze at Seal Software – a Doc...
## 11 Data Scientist
## 12 Data Scientist, Insights and Analytics
## 13 Data Scientist
## 14 Director of Data Science
## 15 Data Scientist
## 16 Principal Data Scientist (Remote Availability)
## 17 Data Engineer, Machine Learning
## 18 Senior Data Scientist
## 19 Associate Data Scientist
## 20 Sr. Data Scientist
## 21 Data Scientist
## 22 Data Scientist
## 23 Data Scientist
## 24 Data Scientist at IBM (Visa Sponsorship for Canada)
## 25 Research Data Scientist
## 26 Data Scientist, Analytics
## 27 Data Scientist, Analytics - Instagram Business Ecosystem
## 28 Data Scientist
## 29 Sr. Data Scientist - Chicago, IL
## 30 Data Scientist -San Francisco
## 31 Financial Analyst Summer Intern - Ideal for a Grad Student!
## 32 Data Scientist, Forecasting
## 33 Product Data Scientist
## 34 Bioinformatics Data Scientist
## 35 Staff Data Scientist
## 36 Data Scientist
## 37 Data Engineer
## 38 Data Analyst Intern
## 39 Data Scientist - Early Career
## 40 Data Scientist
## 41 Data Scientist, Merchandising Strategy
## 42 Data Scientist (Ph.D)
## 43 Data Scientist
## 44 Data Scientist - Product Analytics
## 45 Data Scientist
## 46 Data Scientist
## 47 Data Scientist
## 48 Sr. Data Scientist
## 49 Senior Data Scientist
## 50 Data Scientist, Product Analytics
## 51 Data Scientist
## 52 2020 PhD University Graduate - Data Scientist - Rides
## 53 Data Scientist 3 (718)
## 54 Data Science Content Writing Intern - Remote
## 55 Machine Learning Engineer/AI Engineer
## 56 Data Scientist (Computer Vision)
## 57 Data Scientist
## 58 AI Engineer / AI Scientist
## 59 Data Scientist
## 60 Data Scientist, Trust & Safety
## 61 Data Scientist, Transaction Monitoring
## 62 Data Scientist (Ph.D)
## 63 Data Scientist
## 64 Data Scientist - Product Analytics
## 65 Data Scientist
## 66 Data Scientist
## 67 Sr. Data Scientist
## 68 Senior Data Scientist
## 69 Data Scientist, Product Analytics
## 70 Data Scientist -San Francisco
## 71 Data Science Health Innovation Fellow
## 72 Data Scientist
## 73 Senior Data Scientist
## 74 Principal Data Scientist (Remote Availability)
## 75 Data Engineer, Machine Learning
## 76 Financial Analyst Summer Intern - Ideal for a Grad Student!
## HiringAgency
## 1 Blue OwlSan Francisco, CA
## 2 Envision LLCSan Francisco, CA
## 3 Twitch4.4San Francisco, CA 94104 (Financial District area)
## 4 Global Fishing WatchOakland, CA•Remote work available
## 5 GradTests (gradtests.com)San Francisco, CA•Remote work available
## 6 Yapstone3.5Walnut Creek, CA
## 7 University of California San Francisco4.2San Francisco, CA 94143 (Haight-Ashbury area)
## 8 Ancestry3.9San Francisco, CA 94107 (South Beach area)
## 9 Avila TradingSan Francisco, CA
## 10 DocuSign3.8Walnut Creek, CA
## 11 Spin Electric Scooters3.1San Francisco, CA
## 12 Virta Health4.8San Francisco, CA 94105 (South Beach area)
## 13 MicroagilitySan Francisco Bay Area, CA
## 14 Clearlink Partners LLC.4.2United States•Remote work available
## 15 Blue OwlSan Francisco, CA
## 16 John Deere4.0San Francisco, CA 94105 (Financial District area)•Remote work available
## 17 BICP5.0San Francisco, CA•Remote work available
## 18 BICP5.0San Francisco, CA (North Waterfront area)•Remote work available
## 19 Lawrence Berkeley National Laboratory4.2San Francisco Bay Area, CA
## 20 Digital DharaPleasanton, CA•Remote work available
## 21 SentiLinkSan Francisco, CA 94103 (South of Market area)
## 22 MindstrongSan Francisco, CA•Remote work available
## 23 NotionSan Francisco, CA 94110 (Mission area)
## 24 Talent Acquisition QuébecSan Francisco Bay Area, CA
## 25 University of California San Francisco4.2San Francisco, CA 94143 (Haight-Ashbury area)
## 26 Outschool3.5San Francisco, CA 94110 (Mission area)
## 27 Facebook4.2San Francisco, CA
## 28 Duetto ResearchSan Francisco, CA 94108 (Downtown area)
## 29 Biomerieux3.8United States
## 30 Envision LLCSan Francisco, CA
## 31 MPL BrandsSausalito, CA 94965
## 32 GeliSan Francisco, CA 94105 (Financial District area)
## 33 Twitter4.1San Francisco, CA 94103 (South of Market area)
## 34 Invitae3.6San Francisco, CA 94107 (South of Market area)
## 35 Twitter4.1San Francisco, CA 94103 (South of Market area)
## 36 ProlancerSan Francisco, CA•Remote work available
## 37 Grid DynamicsSan Ramon, CA+1 location
## 38 ShowwcaseSan Francisco, CA•Remote work available
## 39 Lawrence Livermore National Laboratory4.2Livermore, CA 94550
## 40 Bond Financial TechnologiesSan Francisco, CA
## 41 Wish3.8San Francisco, CA
## 42 Pacific Data IntegratorsSan Francisco, CA
## 43 Brightidea4.5San Francisco, CA
## 44 ThirdLove4.1San Francisco, CA
## 45 Pro LancerSan Francisco, CA
## 46 AsanaSan Francisco, CA 94103 (Mission area)
## 47 AsanaSan Francisco, CA 94103 (Mission area)
## 48 Woodruff Sawyer3.3San Francisco, CA 94111 (Financial District area)
## 49 Carbon Health2.0San Francisco, CA
## 50 ScaleapiSan Francisco, CA
## 51 CipherTraceSan Francisco Bay Area, CA
## 52 Uber3.8San Francisco, CA 94103 (South of Market area)
## 53 Amyris, Inc.Emeryville, CA
## 54 Interview QuerySan Francisco, CA•Remote work available
## 55 Atlantis IT Consulting Group LLCSan Francisco, CA 94104 (Financial District area)•Remote work available
## 56 AI FactorySan Francisco, CA
## 57 ViberSan Francisco, CA
## 58 Mythic-AISan Francisco Bay Area, CA
## 59 Clever4.2San Francisco, CA 94103 (South of Market area)
## 60 Pinterest4.2San Francisco, CA 94103 (South of Market area)
## 61 Wish3.8San Francisco, CA
## 62 Pacific Data IntegratorsSan Francisco, CA
## 63 Brightidea4.5San Francisco, CA
## 64 ThirdLove4.1San Francisco, CA
## 65 Pro LancerSan Francisco, CA
## 66 AsanaSan Francisco, CA 94103 (Mission area)
## 67 Woodruff Sawyer3.3San Francisco, CA 94111 (Financial District area)
## 68 Carbon Health2.0San Francisco, CA
## 69 ScaleapiSan Francisco, CA
## 70 Envision LLCSan Francisco, CA
## 71 University of California San Francisco4.2San Francisco, CA 94143 (Haight-Ashbury area)
## 72 Blue OwlSan Francisco, CA
## 73 BICP5.0San Francisco, CA (North Waterfront area)•Remote work available
## 74 John Deere4.0San Francisco, CA 94105 (Financial District area)•Remote work available
## 75 BICP5.0San Francisco, CA•Remote work available
## 76 MPL BrandsSausalito, CA 94965
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 15 10 75 60000 375000
## 2 7 10 75 60000 375000
## 3 30 10 75 60000 375000
## 4 30 10 75 60000 375000
## 5 1 10 75 60000 375000
## 6 30 10 75 60000 375000
## 7 11 10 75 60000 375000
## 8 6 10 75 60000 375000
## 9 22 10 75 60000 375000
## 10 13 10 75 60000 375000
## 11 8 10 75 60000 375000
## 12 30 10 75 60000 375000
## 13 18 10 75 60000 375000
## 14 11 10 75 60000 375000
## 15 15 10 75 60000 375000
## 16 30 10 75 60000 375000
## 17 18 10 75 60000 375000
## 18 17 10 75 60000 375000
## 19 30 10 75 60000 375000
## 20 21 10 75 60000 375000
## 21 30 10 75 60000 375000
## 22 30 10 75 60000 375000
## 23 30 10 75 60000 375000
## 24 7 10 75 60000 375000
## 25 30 10 75 60000 375000
## 26 24 10 75 60000 375000
## 27 10 10 75 60000 375000
## 28 30 10 75 60000 375000
## 29 30 10 75 60000 375000
## 30 7 10 75 60000 375000
## 31 5 10 75 60000 375000
## 32 30 10 75 60000 375000
## 33 19 10 75 60000 375000
## 34 8 10 75 60000 375000
## 35 20 10 75 60000 375000
## 36 30 10 75 60000 375000
## 37 13 10 75 60000 375000
## 38 30 10 75 60000 375000
## 39 30 10 75 60000 375000
## 40 30 10 75 60000 375000
## 41 10 10 75 60000 375000
## 42 30 10 75 60000 375000
## 43 30 10 75 60000 375000
## 44 30 10 75 60000 375000
## 45 30 10 75 60000 375000
## 46 30 10 75 60000 375000
## 47 30 10 75 60000 375000
## 48 19 10 75 60000 375000
## 49 5 10 75 60000 375000
## 50 30 10 75 60000 375000
## 51 30 10 75 60000 375000
## 52 30 10 75 60000 375000
## 53 20 10 75 60000 375000
## 54 26 10 75 60000 375000
## 55 Just posted 10 75 60000 375000
## 56 30 10 75 60000 375000
## 57 20 10 75 60000 375000
## 58 7 10 75 60000 375000
## 59 30 10 75 60000 375000
## 60 30 10 75 60000 375000
## 61 30 10 75 60000 375000
## 62 30 10 75 60000 375000
## 63 30 10 75 60000 375000
## 64 30 10 75 60000 375000
## 65 30 10 75 60000 375000
## 66 30 10 75 60000 375000
## 67 19 10 75 60000 375000
## 68 5 10 75 60000 375000
## 69 30 10 75 60000 375000
## 70 7 10 75 60000 375000
## 71 30 10 75 60000 375000
## 72 15 10 75 60000 375000
## 73 17 10 75 60000 375000
## 74 30 10 75 60000 375000
## 75 18 10 75 60000 375000
## 76 5 10 75 60000 375000
getIndeedJobData5pages("data scientist", "Los Angeles","CA")
## Warning in getIndeedJobData5pages("data scientist", "Los Angeles", "CA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("data scientist", "Los Angeles", "CA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Scientist 2, Data Analytics
## 2 Director of Data Science
## 3 Remote Statistical Programmer
## 4 Data Scientist
## 5 Educational Data Scientist
## 6 Data Scientist - 200137
## 7 Real Estate Data Scientist
## 8 Data Scientist
## 9 Data Scientist
## 10 Data Scientist
## 11 Data Scientist
## 12 Data Scientist at IBM (Visa Sponsorship for Canada)
## 13 Sr. Data Scientist
## 14 Senior Data Scientist
## 15 Deloitte Consulting Commercial Intelligence Data Scientist (...
## 16 Senior Data Analyst, Data Insights
## 17 Data Scientist
## 18 Data Scientist
## 19 Data Scientist Research Programmer
## 20 Senior Data Analyst
## 21 Senior Data Scientist
## 22 Senior Data Scientist
## 23 MS Data Scientist
## 24 Head of Data Science
## 25 Principal Data Scientist - Telco, Media & Entertainment
## 26 Senior Data Scientist
## 27 Contributor | Data Engineer / Data Scientist
## 28 Principal Data Scientist
## 29 Senior Data Scientist
## 30 Principal Data Scientist
## 31 Senior Data Scientist
## 32 Data Scientist Consultant - Burbank California
## 33 Senior Data Scientist
## 34 Senior Data Analyst
## 35 Data Analyst
## 36 Lead Data Scientist
## 37 Data Scientist
## 38 Jr. Business Development Analyst Intern
## 39 Sr. Data Analyst, Consumer Applications
## 40 Data Scientist
## 41 Senior Data Scientist
## 42 Statistical Analyst
## 43 Machine Learning Engineer, 2+ Years Experience - Los Angeles
## 44 Sr. Data Analyst
## 45 Machine Learning Engineer, 2+ Years Experience - Los Angeles
## 46 Sr. Data Analyst
## 47 Senior Data Scientist
## 48 Sr. Data Analyst
## 49 Machine Learning Engineer
## 50 Senior Data Analyst
## 51 Machine Learning Engineer
## 52 Sr Performance Metrics Data Analyst
## 53 Senior Data Analyst
## 54 Statistical Analyst
## 55 Senior Data Analyst
## 56 Behavioral Data Science Manager
## 57 Senior Data Analyst, Marketing
## 58 Marketing and Business Analyst Intern
## 59 Senior Data Analyst
## 60 Jr. Business Development Analyst Intern
## 61 Sr. Data Analyst, Consumer Applications
## 62 Data Scientist
## 63 Senior Data Scientist
## 64 Statistical Analyst
## 65 Machine Learning Engineer, 2+ Years Experience - Los Angeles
## 66 Sr. Data Analyst
## 67 Senior Data Scientist
## 68 Sr. Data Analyst
## 69 Machine Learning Engineer
## 70 Sr. Manager, Supply Chain Business Intelligence and Data Sci...
## 71 Machine Learning Engineer
## 72 AI/Machine Learning Research Scientist
## 73 Educational Data Scientist
## 74 Director of Data Science
## 75 Scientist 2, Data Analytics
## 76 Manager of Data Science
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## 2 \n$120,000 a year $120000 120000 NA
## 3 \n$100,000 - $150,000 a year $100000 - $150000 100000 150000
## 4 \n$42 - $51 an hour $42 - $51 42 51
## 5 \n$70,000 - $95,000 a year $70000 - $95000 70000 95000
## 6 \n$100,000 - $150,000 a year $100000 - $150000 100000 150000
## 7 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 1e+05 120000 98577.43 110391.8 42
## 2 1e+05 120000 98577.43 110391.8 42
## 3 1e+05 120000 98577.43 110391.8 42
## 4 1e+05 120000 98577.43 110391.8 42
## 5 1e+05 120000 98577.43 110391.8 42
## 6 1e+05 120000 98577.43 110391.8 42
## 7 1e+05 120000 98577.43 110391.8 42
## maximumMaxSalary
## 1 175000
## 2 175000
## 3 175000
## 4 175000
## 5 175000
## 6 175000
## 7 175000
##
## [[3]]
## date_daysAgo
## 1 19
## 2 11
## 3 30
## 4 1
## 5 30
## 6 5
## 7 Just posted
## 8 14
## 9 30
## 10 6
## 11 17
## 12 7
## 13 8
## 14 15
## 15 Today
## 16 Today
## 17 30
## 18 30
## 19 30
## 20 14
## 21 25
## 22 30
## 23 30
## 24 1
## 25 7
## 26 30
## 27 30
## 28 30
## 29 20
## 30 30
## 31 20
## 32 30
## 33 30
## 34 28
## 35 28
## 36 22
## 37 30
## 38 30
## 39 6
## 40 30
## 41 30
## 42 30
## 43 6
## 44 13
## 45 6
## 46 13
## 47 30
## 48 30
## 49 13
## 50 8
## 51 30
## 52 30
## 53 14
## 54 30
## 55 20
## 56 6
## 57 26
## 58 30
## 59 30
## 60 30
## 61 6
## 62 30
## 63 30
## 64 30
## 65 6
## 66 13
## 67 30
## 68 30
## 69 13
## 70 30
## 71 7
## 72 30
## 73 30
## 74 11
## 75 19
## 76 20
##
## [[4]]
## HiringAgency
## 1 Areté4.0Northridge, CA
## 2 Clearlink Partners LLC.4.2United States•Remote work available
## 3 Ascent Services Group3.7Santa Monica, CA 90404•Remote work available
## 4 GradTests (gradtests.com)Los Angeles, CA•Remote work available
## 5 Expatiate CommunicationsPasadena, CA 91101 (West Central area)•Remote work available
## 6 Bridgewater Consulting Group3.8Rosemead, CA•Remote work available
## 7 Harbor Freight Tools USA, Inc.3.3Calabasas, CA
## 8 Hulu3.9Santa Monica, CA 90404 (Mid-City area)
## 9 Warner Bros. Entertainment Group4.2Burbank, CA
## 10 mPulse Mobile4.3Encino, CA 91436
## 11 Aspiration PartnersLos Angeles, CA
## 12 Talent Acquisition QuébecLos Angeles, CA
## 13 Icon Media Direct, Inc.Sherman Oaks, CA 91411•Remote work available
## 14 City of Hope3.8Irwindale, CA
## 15 Deloitte4.0Los Angeles, CA 90013 (Downtown area)•Remote work available
## 16 Hulu3.9Santa Monica, CA 90404 (Mid-City area)
## 17 BlackLine3.8Woodland Hills, CA 91367
## 18 ClicktripzManhattan Beach, CA
## 19 RAND Corporation3.9Los Angeles, CA
## 20 SteadyLos Angeles, CA 90079
## 21 Netflix3.9Los Angeles, CA 90028 (Hollywood area)
## 22 true[x]Los Angeles, CA 90049 (Brentwood area)
## 23 Allscripts Healthcare, LLC3.6Whittier, CA 90606
## 24 TikTok3.9Los Angeles, CA 90232 (Palms area)
## 25 DatabricksLos Angeles, CA
## 26 Operating Company ACTIVISION PUBLISHING, INC3.8Woodland Hills, CA
## 27 Hyperloop Transportation Technologies4.3Los Angeles, CA 90230 (Westchester area)
## 28 Operating Company ACTIVISION PUBLISHING, INC3.8Santa Monica, CA
## 29 SteadyLos Angeles, CA 90079
## 30 Operating Company ACTIVISION PUBLISHING, INC3.8Santa Monica, CA
## 31 SteadyLos Angeles, CA 90079
## 32 Capgemini3.8Burbank, CA 91505 (Media area)
## 33 Jam City2.9Culver City, CA
## 34 TutorMe4.6Los Angeles, CA
## 35 Internet BrandsLos Angeles, CA
## 36 RAPP3.5Los Angeles, CA
## 37 Starz4.2Santa Monica, CA 90404 (Mid-City area)
## 38 Noxsolutions.comLos Angeles, CA
## 39 System14.5Venice, CA
## 40 Amazon Web Services, Inc.3.6Santa Monica, CA+1 location
## 41 TikTok3.9Los Angeles, CA 90232 (Palms area)
## 42 California FAIR Plan AssociationLos Angeles, CA 90010 (Koreatown area)
## 43 Snapchat3.5Los Angeles, CA 90291 (Venice area)
## 44 Mylife3.4Los Angeles, CA 90025 (Sawtelle area)
## 45 Snapchat3.5Los Angeles, CA 90291 (Venice area)
## 46 Mylife3.4Los Angeles, CA 90025 (Sawtelle area)
## 47 Twentieth Century Fox4.1Los Angeles, CA
## 48 Dollar Shave Club3.7Marina del Rey, CA 90292•Remote work available
## 49 The Trevor Project4.5Los Angeles, CA 90069
## 50 TikTok3.9Culver City, CA
## 51 Pro LancerLos Angeles, CA
## 52 Bank of Hope2.9Los Angeles, CA
## 53 Steady PlatformPlaya Vista, CA
## 54 Insight Research & TradingBeverly Hills, CA
## 55 Fox Corporation4.0Los Angeles, CA 90036
## 56 mPulse Mobile4.3Encino, CA 91436
## 57 DaveLos Angeles, CA 90019 (Mid City area)
## 58 Noxsolutions.comLos Angeles, CA
## 59 DISQOGlendale, CA
## 60 Noxsolutions.comLos Angeles, CA
## 61 System14.5Venice, CA
## 62 Amazon Web Services, Inc.3.6Santa Monica, CA+1 location
## 63 TikTok3.9Los Angeles, CA 90232 (Palms area)
## 64 California FAIR Plan AssociationLos Angeles, CA 90010 (Koreatown area)
## 65 Snapchat3.5Los Angeles, CA 90291 (Venice area)
## 66 Mylife3.4Los Angeles, CA 90025 (Sawtelle area)
## 67 Twentieth Century Fox4.1Los Angeles, CA
## 68 Dollar Shave Club3.7Marina del Rey, CA 90292•Remote work available
## 69 The Trevor Project4.5Los Angeles, CA 90069
## 70 Niagara Bottling3.0Diamond Bar, CA 91765
## 71 MORI Associates, Inc.United States
## 72 Perceptronics Solutions, IncUnited States•Remote work available
## 73 Expatiate CommunicationsPasadena, CA 91101 (West Central area)•Remote work available
## 74 Clearlink Partners LLC.4.2United States•Remote work available
## 75 Areté4.0Northridge, CA
## 76 Niagara Bottling3.0Diamond Bar, CA 91765
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## 2 \n$120,000 a year $120000 120000 NA
## 3 \n$100,000 - $150,000 a year $100000 - $150000 100000 150000
## 5 \n$70,000 - $95,000 a year $70000 - $95000 70000 95000
## 6 \n$100,000 - $150,000 a year $100000 - $150000 100000 150000
## 7 \n$150,000 - $175,000 a year $150000 - $175000 150000 175000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 110000 150000 115000 149000 70000
## 2 110000 150000 115000 149000 70000
## 3 110000 150000 115000 149000 70000
## 5 110000 150000 115000 149000 70000
## 6 110000 150000 115000 149000 70000
## 7 110000 150000 115000 149000 70000
## maximumMaxSalary
## 1 175000
## 2 175000
## 3 175000
## 5 175000
## 6 175000
## 7 175000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 4 \n$42 - $51 an hour $42 - $51 42 51 42
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 4 51 42 51 42 51
##
## [[7]]
## city state
## 1 Los Angeles CA
## 2 Los Angeles CA
## 3 Los Angeles CA
## 4 Los Angeles CA
## 5 Los Angeles CA
## 6 Los Angeles CA
## 7 Los Angeles CA
## 8 Los Angeles CA
## 9 Los Angeles CA
## 10 Los Angeles CA
## 11 Los Angeles CA
## 12 Los Angeles CA
## 13 Los Angeles CA
## 14 Los Angeles CA
## 15 Los Angeles CA
## 16 Los Angeles CA
## 17 Los Angeles CA
## 18 Los Angeles CA
## 19 Los Angeles CA
## 20 Los Angeles CA
## 21 Los Angeles CA
## 22 Los Angeles CA
## 23 Los Angeles CA
## 24 Los Angeles CA
## 25 Los Angeles CA
## 26 Los Angeles CA
## 27 Los Angeles CA
## 28 Los Angeles CA
## 29 Los Angeles CA
## 30 Los Angeles CA
## 31 Los Angeles CA
## 32 Los Angeles CA
## 33 Los Angeles CA
## 34 Los Angeles CA
## 35 Los Angeles CA
## 36 Los Angeles CA
## 37 Los Angeles CA
## 38 Los Angeles CA
## 39 Los Angeles CA
## 40 Los Angeles CA
## 41 Los Angeles CA
## 42 Los Angeles CA
## 43 Los Angeles CA
## 44 Los Angeles CA
## 45 Los Angeles CA
## 46 Los Angeles CA
## 47 Los Angeles CA
## 48 Los Angeles CA
## 49 Los Angeles CA
## 50 Los Angeles CA
## 51 Los Angeles CA
## 52 Los Angeles CA
## 53 Los Angeles CA
## 54 Los Angeles CA
## 55 Los Angeles CA
## 56 Los Angeles CA
## 57 Los Angeles CA
## 58 Los Angeles CA
## 59 Los Angeles CA
## 60 Los Angeles CA
## 61 Los Angeles CA
## 62 Los Angeles CA
## 63 Los Angeles CA
## 64 Los Angeles CA
## 65 Los Angeles CA
## 66 Los Angeles CA
## 67 Los Angeles CA
## 68 Los Angeles CA
## 69 Los Angeles CA
## 70 Los Angeles CA
## 71 Los Angeles CA
## 72 Los Angeles CA
## 73 Los Angeles CA
## 74 Los Angeles CA
## 75 Los Angeles CA
## 76 Los Angeles CA
## jobTitle
## 1 Scientist 2, Data Analytics
## 2 Director of Data Science
## 3 Remote Statistical Programmer
## 4 Data Scientist
## 5 Educational Data Scientist
## 6 Data Scientist - 200137
## 7 Real Estate Data Scientist
## 8 Data Scientist
## 9 Data Scientist
## 10 Data Scientist
## 11 Data Scientist
## 12 Data Scientist at IBM (Visa Sponsorship for Canada)
## 13 Sr. Data Scientist
## 14 Senior Data Scientist
## 15 Deloitte Consulting Commercial Intelligence Data Scientist (...
## 16 Senior Data Analyst, Data Insights
## 17 Data Scientist
## 18 Data Scientist
## 19 Data Scientist Research Programmer
## 20 Senior Data Analyst
## 21 Senior Data Scientist
## 22 Senior Data Scientist
## 23 MS Data Scientist
## 24 Head of Data Science
## 25 Principal Data Scientist - Telco, Media & Entertainment
## 26 Senior Data Scientist
## 27 Contributor | Data Engineer / Data Scientist
## 28 Principal Data Scientist
## 29 Senior Data Scientist
## 30 Principal Data Scientist
## 31 Senior Data Scientist
## 32 Data Scientist Consultant - Burbank California
## 33 Senior Data Scientist
## 34 Senior Data Analyst
## 35 Data Analyst
## 36 Lead Data Scientist
## 37 Data Scientist
## 38 Jr. Business Development Analyst Intern
## 39 Sr. Data Analyst, Consumer Applications
## 40 Data Scientist
## 41 Senior Data Scientist
## 42 Statistical Analyst
## 43 Machine Learning Engineer, 2+ Years Experience - Los Angeles
## 44 Sr. Data Analyst
## 45 Machine Learning Engineer, 2+ Years Experience - Los Angeles
## 46 Sr. Data Analyst
## 47 Senior Data Scientist
## 48 Sr. Data Analyst
## 49 Machine Learning Engineer
## 50 Senior Data Analyst
## 51 Machine Learning Engineer
## 52 Sr Performance Metrics Data Analyst
## 53 Senior Data Analyst
## 54 Statistical Analyst
## 55 Senior Data Analyst
## 56 Behavioral Data Science Manager
## 57 Senior Data Analyst, Marketing
## 58 Marketing and Business Analyst Intern
## 59 Senior Data Analyst
## 60 Jr. Business Development Analyst Intern
## 61 Sr. Data Analyst, Consumer Applications
## 62 Data Scientist
## 63 Senior Data Scientist
## 64 Statistical Analyst
## 65 Machine Learning Engineer, 2+ Years Experience - Los Angeles
## 66 Sr. Data Analyst
## 67 Senior Data Scientist
## 68 Sr. Data Analyst
## 69 Machine Learning Engineer
## 70 Sr. Manager, Supply Chain Business Intelligence and Data Sci...
## 71 Machine Learning Engineer
## 72 AI/Machine Learning Research Scientist
## 73 Educational Data Scientist
## 74 Director of Data Science
## 75 Scientist 2, Data Analytics
## 76 Manager of Data Science
## HiringAgency
## 1 Areté4.0Northridge, CA
## 2 Clearlink Partners LLC.4.2United States•Remote work available
## 3 Ascent Services Group3.7Santa Monica, CA 90404•Remote work available
## 4 GradTests (gradtests.com)Los Angeles, CA•Remote work available
## 5 Expatiate CommunicationsPasadena, CA 91101 (West Central area)•Remote work available
## 6 Bridgewater Consulting Group3.8Rosemead, CA•Remote work available
## 7 Harbor Freight Tools USA, Inc.3.3Calabasas, CA
## 8 Hulu3.9Santa Monica, CA 90404 (Mid-City area)
## 9 Warner Bros. Entertainment Group4.2Burbank, CA
## 10 mPulse Mobile4.3Encino, CA 91436
## 11 Aspiration PartnersLos Angeles, CA
## 12 Talent Acquisition QuébecLos Angeles, CA
## 13 Icon Media Direct, Inc.Sherman Oaks, CA 91411•Remote work available
## 14 City of Hope3.8Irwindale, CA
## 15 Deloitte4.0Los Angeles, CA 90013 (Downtown area)•Remote work available
## 16 Hulu3.9Santa Monica, CA 90404 (Mid-City area)
## 17 BlackLine3.8Woodland Hills, CA 91367
## 18 ClicktripzManhattan Beach, CA
## 19 RAND Corporation3.9Los Angeles, CA
## 20 SteadyLos Angeles, CA 90079
## 21 Netflix3.9Los Angeles, CA 90028 (Hollywood area)
## 22 true[x]Los Angeles, CA 90049 (Brentwood area)
## 23 Allscripts Healthcare, LLC3.6Whittier, CA 90606
## 24 TikTok3.9Los Angeles, CA 90232 (Palms area)
## 25 DatabricksLos Angeles, CA
## 26 Operating Company ACTIVISION PUBLISHING, INC3.8Woodland Hills, CA
## 27 Hyperloop Transportation Technologies4.3Los Angeles, CA 90230 (Westchester area)
## 28 Operating Company ACTIVISION PUBLISHING, INC3.8Santa Monica, CA
## 29 SteadyLos Angeles, CA 90079
## 30 Operating Company ACTIVISION PUBLISHING, INC3.8Santa Monica, CA
## 31 SteadyLos Angeles, CA 90079
## 32 Capgemini3.8Burbank, CA 91505 (Media area)
## 33 Jam City2.9Culver City, CA
## 34 TutorMe4.6Los Angeles, CA
## 35 Internet BrandsLos Angeles, CA
## 36 RAPP3.5Los Angeles, CA
## 37 Starz4.2Santa Monica, CA 90404 (Mid-City area)
## 38 Noxsolutions.comLos Angeles, CA
## 39 System14.5Venice, CA
## 40 Amazon Web Services, Inc.3.6Santa Monica, CA+1 location
## 41 TikTok3.9Los Angeles, CA 90232 (Palms area)
## 42 California FAIR Plan AssociationLos Angeles, CA 90010 (Koreatown area)
## 43 Snapchat3.5Los Angeles, CA 90291 (Venice area)
## 44 Mylife3.4Los Angeles, CA 90025 (Sawtelle area)
## 45 Snapchat3.5Los Angeles, CA 90291 (Venice area)
## 46 Mylife3.4Los Angeles, CA 90025 (Sawtelle area)
## 47 Twentieth Century Fox4.1Los Angeles, CA
## 48 Dollar Shave Club3.7Marina del Rey, CA 90292•Remote work available
## 49 The Trevor Project4.5Los Angeles, CA 90069
## 50 TikTok3.9Culver City, CA
## 51 Pro LancerLos Angeles, CA
## 52 Bank of Hope2.9Los Angeles, CA
## 53 Steady PlatformPlaya Vista, CA
## 54 Insight Research & TradingBeverly Hills, CA
## 55 Fox Corporation4.0Los Angeles, CA 90036
## 56 mPulse Mobile4.3Encino, CA 91436
## 57 DaveLos Angeles, CA 90019 (Mid City area)
## 58 Noxsolutions.comLos Angeles, CA
## 59 DISQOGlendale, CA
## 60 Noxsolutions.comLos Angeles, CA
## 61 System14.5Venice, CA
## 62 Amazon Web Services, Inc.3.6Santa Monica, CA+1 location
## 63 TikTok3.9Los Angeles, CA 90232 (Palms area)
## 64 California FAIR Plan AssociationLos Angeles, CA 90010 (Koreatown area)
## 65 Snapchat3.5Los Angeles, CA 90291 (Venice area)
## 66 Mylife3.4Los Angeles, CA 90025 (Sawtelle area)
## 67 Twentieth Century Fox4.1Los Angeles, CA
## 68 Dollar Shave Club3.7Marina del Rey, CA 90292•Remote work available
## 69 The Trevor Project4.5Los Angeles, CA 90069
## 70 Niagara Bottling3.0Diamond Bar, CA 91765
## 71 MORI Associates, Inc.United States
## 72 Perceptronics Solutions, IncUnited States•Remote work available
## 73 Expatiate CommunicationsPasadena, CA 91101 (West Central area)•Remote work available
## 74 Clearlink Partners LLC.4.2United States•Remote work available
## 75 Areté4.0Northridge, CA
## 76 Niagara Bottling3.0Diamond Bar, CA 91765
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 19 42 51 70000 175000
## 2 11 42 51 70000 175000
## 3 30 42 51 70000 175000
## 4 1 42 51 70000 175000
## 5 30 42 51 70000 175000
## 6 5 42 51 70000 175000
## 7 Just posted 42 51 70000 175000
## 8 14 42 51 70000 175000
## 9 30 42 51 70000 175000
## 10 6 42 51 70000 175000
## 11 17 42 51 70000 175000
## 12 7 42 51 70000 175000
## 13 8 42 51 70000 175000
## 14 15 42 51 70000 175000
## 15 Today 42 51 70000 175000
## 16 Today 42 51 70000 175000
## 17 30 42 51 70000 175000
## 18 30 42 51 70000 175000
## 19 30 42 51 70000 175000
## 20 14 42 51 70000 175000
## 21 25 42 51 70000 175000
## 22 30 42 51 70000 175000
## 23 30 42 51 70000 175000
## 24 1 42 51 70000 175000
## 25 7 42 51 70000 175000
## 26 30 42 51 70000 175000
## 27 30 42 51 70000 175000
## 28 30 42 51 70000 175000
## 29 20 42 51 70000 175000
## 30 30 42 51 70000 175000
## 31 20 42 51 70000 175000
## 32 30 42 51 70000 175000
## 33 30 42 51 70000 175000
## 34 28 42 51 70000 175000
## 35 28 42 51 70000 175000
## 36 22 42 51 70000 175000
## 37 30 42 51 70000 175000
## 38 30 42 51 70000 175000
## 39 6 42 51 70000 175000
## 40 30 42 51 70000 175000
## 41 30 42 51 70000 175000
## 42 30 42 51 70000 175000
## 43 6 42 51 70000 175000
## 44 13 42 51 70000 175000
## 45 6 42 51 70000 175000
## 46 13 42 51 70000 175000
## 47 30 42 51 70000 175000
## 48 30 42 51 70000 175000
## 49 13 42 51 70000 175000
## 50 8 42 51 70000 175000
## 51 30 42 51 70000 175000
## 52 30 42 51 70000 175000
## 53 14 42 51 70000 175000
## 54 30 42 51 70000 175000
## 55 20 42 51 70000 175000
## 56 6 42 51 70000 175000
## 57 26 42 51 70000 175000
## 58 30 42 51 70000 175000
## 59 30 42 51 70000 175000
## 60 30 42 51 70000 175000
## 61 6 42 51 70000 175000
## 62 30 42 51 70000 175000
## 63 30 42 51 70000 175000
## 64 30 42 51 70000 175000
## 65 6 42 51 70000 175000
## 66 13 42 51 70000 175000
## 67 30 42 51 70000 175000
## 68 30 42 51 70000 175000
## 69 13 42 51 70000 175000
## 70 30 42 51 70000 175000
## 71 7 42 51 70000 175000
## 72 30 42 51 70000 175000
## 73 30 42 51 70000 175000
## 74 11 42 51 70000 175000
## 75 19 42 51 70000 175000
## 76 20 42 51 70000 175000
Alabama
getIndeedJobData5pages("massage therapist", "birmingham","AL")
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Total Body Stretch Provider
## 3 Licensed Massage Therapist
## 4 Massage Therapist - Independent Contractor
## 5 Massage Therapist
## 6 Licensed Massage Therapist
## 7 Massage Therapist - Full Time
## 8 Total Body Stretch Provider
## 9 Licensed Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Massage Therapist - Full Time
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Total Body Stretch Provider
## 17 Licensed Massage Therapist
## 18 Massage Therapist - Independent Contractor
## 19 Massage Therapist
## 20 Licensed Massage Therapist
## 21 Massage Therapist - Full Time
## 22 Total Body Stretch Provider
## 23 Licensed Massage Therapist
## 24 Massage Therapist - Independent Contractor
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Massage Therapist - Full Time
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapist - Full Time
## 34 Total Body Stretch Provider
## 35 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 2 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$14 - $56 an hour $14 - $56 14 56
## 5 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 6 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$14 - $56 an hour $14 - $56 14 56
## 9 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 10 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$14 - $56 an hour $14 - $56 14 56
## 13 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 14 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 15 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 16 \n$14 - $56 an hour $14 - $56 14 56
## 17 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 18 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 19 \n$14 - $56 an hour $14 - $56 14 56
## 20 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 8500 12000 10503.5 16008.75 14
## 2 8500 12000 10503.5 16008.75 14
## 3 8500 12000 10503.5 16008.75 14
## 4 8500 12000 10503.5 16008.75 14
## 5 8500 12000 10503.5 16008.75 14
## 6 8500 12000 10503.5 16008.75 14
## 7 8500 12000 10503.5 16008.75 14
## 8 8500 12000 10503.5 16008.75 14
## 9 8500 12000 10503.5 16008.75 14
## 10 8500 12000 10503.5 16008.75 14
## 11 8500 12000 10503.5 16008.75 14
## 12 8500 12000 10503.5 16008.75 14
## 13 8500 12000 10503.5 16008.75 14
## 14 8500 12000 10503.5 16008.75 14
## 15 8500 12000 10503.5 16008.75 14
## 16 8500 12000 10503.5 16008.75 14
## 17 8500 12000 10503.5 16008.75 14
## 18 8500 12000 10503.5 16008.75 14
## 19 8500 12000 10503.5 16008.75 14
## 20 8500 12000 10503.5 16008.75 14
## maximumMaxSalary
## 1 50000
## 2 50000
## 3 50000
## 4 50000
## 5 50000
## 6 50000
## 7 50000
## 8 50000
## 9 50000
## 10 50000
## 11 50000
## 12 50000
## 13 50000
## 14 50000
## 15 50000
## 16 50000
## 17 50000
## 18 50000
## 19 50000
## 20 50000
##
## [[3]]
## date_daysAgo
## 1 2
## 2 Just posted
## 3 30
## 4 17
## 5 22
## 6 19
## 7 30
## 8 Just posted
## 9 30
## 10 17
## 11 22
## 12 19
## 13 30
## 14 2
## 15 2
## 16 Just posted
## 17 30
## 18 17
## 19 22
## 20 19
## 21 30
## 22 Just posted
## 23 30
## 24 17
## 25 22
## 26 19
## 27 30
## 28 2
## 29 30
## 30 17
## 31 22
## 32 19
## 33 30
## 34 Just posted
## 35 2
##
## [[4]]
## HiringAgency
## 1 Escape Day Spa3.7Homewood, AL 35209
## 2 Massage Envy Greystone3.3Birmingham, AL 35242
## 3 Massage Envy Greystone3.3Birmingham, AL 35242
## 4 Indo-Pak Massage TherapyBirmingham, AL•Remote work available
## 5 Life Time3.6Vestavia Hills, AL 35243
## 6 Nova Essence MedispaBirmingham, AL 35244
## 7 Massage Envy3.2Mountain Brook, AL 35243+1 location
## 8 Massage Envy Greystone3.3Birmingham, AL 35242
## 9 Massage Envy Greystone3.3Birmingham, AL 35242
## 10 Indo-Pak Massage TherapyBirmingham, AL•Remote work available
## 11 Life Time3.6Vestavia Hills, AL 35243
## 12 Nova Essence MedispaBirmingham, AL 35244
## 13 Massage Envy3.2Mountain Brook, AL 35243+1 location
## 14 Escape Day Spa3.7Homewood, AL 35209
## 15 Escape Day Spa3.7Homewood, AL 35209
## 16 Massage Envy Greystone3.3Birmingham, AL 35242
## 17 Massage Envy Greystone3.3Birmingham, AL 35242
## 18 Indo-Pak Massage TherapyBirmingham, AL•Remote work available
## 19 Life Time3.6Vestavia Hills, AL 35243
## 20 Nova Essence MedispaBirmingham, AL 35244
## 21 Massage Envy3.2Mountain Brook, AL 35243+1 location
## 22 Massage Envy Greystone3.3Birmingham, AL 35242
## 23 Massage Envy Greystone3.3Birmingham, AL 35242
## 24 Indo-Pak Massage TherapyBirmingham, AL•Remote work available
## 25 Life Time3.6Vestavia Hills, AL 35243
## 26 Nova Essence MedispaBirmingham, AL 35244
## 27 Massage Envy3.2Mountain Brook, AL 35243+1 location
## 28 Escape Day Spa3.7Homewood, AL 35209
## 29 Massage Envy Greystone3.3Birmingham, AL 35242
## 30 Indo-Pak Massage TherapyBirmingham, AL•Remote work available
## 31 Life Time3.6Vestavia Hills, AL 35243
## 32 Nova Essence MedispaBirmingham, AL 35244
## 33 Massage Envy3.2Mountain Brook, AL 35243+1 location
## 34 Massage Envy Greystone3.3Birmingham, AL 35242
## 35 Escape Day Spa3.7Homewood, AL 35209
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 2 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 5 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 6 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 9 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 10 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 13 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## 14 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 17 \n$25,000 - $50,000 a year $25000 - $50000 25000 50000
## 20 \n$12,000 - $24,000 a year $12000 - $24000 12000 24000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 18500 37000 18500 37000 12000
## 2 18500 37000 18500 37000 12000
## 5 18500 37000 18500 37000 12000
## 6 18500 37000 18500 37000 12000
## 9 18500 37000 18500 37000 12000
## 10 18500 37000 18500 37000 12000
## 13 18500 37000 18500 37000 12000
## 14 18500 37000 18500 37000 12000
## 17 18500 37000 18500 37000 12000
## 20 18500 37000 18500 37000 12000
## maximumMaxSalary
## 1 50000
## 2 50000
## 5 50000
## 6 50000
## 9 50000
## 10 50000
## 13 50000
## 14 50000
## 17 50000
## 20 50000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 4 \n$14 - $56 an hour $14 - $56 14 56 14
## 8 \n$14 - $56 an hour $14 - $56 14 56 14
## 12 \n$14 - $56 an hour $14 - $56 14 56 14
## 16 \n$14 - $56 an hour $14 - $56 14 56 14
## 19 \n$14 - $56 an hour $14 - $56 14 56 14
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 4 56 14 56 14 56
## 8 56 14 56 14 56
## 12 56 14 56 14 56
## 16 56 14 56 14 56
## 19 56 14 56 14 56
##
## [[7]]
## city state jobTitle
## 1 birmingham AL Massage Therapist
## 2 birmingham AL Total Body Stretch Provider
## 3 birmingham AL Licensed Massage Therapist
## 4 birmingham AL Massage Therapist - Independent Contractor
## 5 birmingham AL Massage Therapist
## 6 birmingham AL Licensed Massage Therapist
## 7 birmingham AL Massage Therapist - Full Time
## 8 birmingham AL Total Body Stretch Provider
## 9 birmingham AL Licensed Massage Therapist
## 10 birmingham AL Massage Therapist - Independent Contractor
## 11 birmingham AL Massage Therapist
## 12 birmingham AL Licensed Massage Therapist
## 13 birmingham AL Massage Therapist - Full Time
## 14 birmingham AL Massage Therapist
## 15 birmingham AL Massage Therapist
## 16 birmingham AL Total Body Stretch Provider
## 17 birmingham AL Licensed Massage Therapist
## 18 birmingham AL Massage Therapist - Independent Contractor
## 19 birmingham AL Massage Therapist
## 20 birmingham AL Licensed Massage Therapist
## 21 birmingham AL Massage Therapist - Full Time
## 22 birmingham AL Total Body Stretch Provider
## 23 birmingham AL Licensed Massage Therapist
## 24 birmingham AL Massage Therapist - Independent Contractor
## 25 birmingham AL Massage Therapist
## 26 birmingham AL Licensed Massage Therapist
## 27 birmingham AL Massage Therapist - Full Time
## 28 birmingham AL Massage Therapist
## 29 birmingham AL Licensed Massage Therapist
## 30 birmingham AL Massage Therapist - Independent Contractor
## 31 birmingham AL Massage Therapist
## 32 birmingham AL Licensed Massage Therapist
## 33 birmingham AL Massage Therapist - Full Time
## 34 birmingham AL Total Body Stretch Provider
## 35 birmingham AL Massage Therapist
## HiringAgency date_daysAgo
## 1 Escape Day Spa3.7Homewood, AL 35209 2
## 2 Massage Envy Greystone3.3Birmingham, AL 35242 Just posted
## 3 Massage Envy Greystone3.3Birmingham, AL 35242 30
## 4 Indo-Pak Massage TherapyBirmingham, AL•Remote work available 17
## 5 Life Time3.6Vestavia Hills, AL 35243 22
## 6 Nova Essence MedispaBirmingham, AL 35244 19
## 7 Massage Envy3.2Mountain Brook, AL 35243+1 location 30
## 8 Massage Envy Greystone3.3Birmingham, AL 35242 Just posted
## 9 Massage Envy Greystone3.3Birmingham, AL 35242 30
## 10 Indo-Pak Massage TherapyBirmingham, AL•Remote work available 17
## 11 Life Time3.6Vestavia Hills, AL 35243 22
## 12 Nova Essence MedispaBirmingham, AL 35244 19
## 13 Massage Envy3.2Mountain Brook, AL 35243+1 location 30
## 14 Escape Day Spa3.7Homewood, AL 35209 2
## 15 Escape Day Spa3.7Homewood, AL 35209 2
## 16 Massage Envy Greystone3.3Birmingham, AL 35242 Just posted
## 17 Massage Envy Greystone3.3Birmingham, AL 35242 30
## 18 Indo-Pak Massage TherapyBirmingham, AL•Remote work available 17
## 19 Life Time3.6Vestavia Hills, AL 35243 22
## 20 Nova Essence MedispaBirmingham, AL 35244 19
## 21 Massage Envy3.2Mountain Brook, AL 35243+1 location 30
## 22 Massage Envy Greystone3.3Birmingham, AL 35242 Just posted
## 23 Massage Envy Greystone3.3Birmingham, AL 35242 30
## 24 Indo-Pak Massage TherapyBirmingham, AL•Remote work available 17
## 25 Life Time3.6Vestavia Hills, AL 35243 22
## 26 Nova Essence MedispaBirmingham, AL 35244 19
## 27 Massage Envy3.2Mountain Brook, AL 35243+1 location 30
## 28 Escape Day Spa3.7Homewood, AL 35209 2
## 29 Massage Envy Greystone3.3Birmingham, AL 35242 30
## 30 Indo-Pak Massage TherapyBirmingham, AL•Remote work available 17
## 31 Life Time3.6Vestavia Hills, AL 35243 22
## 32 Nova Essence MedispaBirmingham, AL 35244 19
## 33 Massage Envy3.2Mountain Brook, AL 35243+1 location 30
## 34 Massage Envy Greystone3.3Birmingham, AL 35242 Just posted
## 35 Escape Day Spa3.7Homewood, AL 35209 2
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 14 56 12000 50000
## 2 14 56 12000 50000
## 3 14 56 12000 50000
## 4 14 56 12000 50000
## 5 14 56 12000 50000
## 6 14 56 12000 50000
## 7 14 56 12000 50000
## 8 14 56 12000 50000
## 9 14 56 12000 50000
## 10 14 56 12000 50000
## 11 14 56 12000 50000
## 12 14 56 12000 50000
## 13 14 56 12000 50000
## 14 14 56 12000 50000
## 15 14 56 12000 50000
## 16 14 56 12000 50000
## 17 14 56 12000 50000
## 18 14 56 12000 50000
## 19 14 56 12000 50000
## 20 14 56 12000 50000
## 21 14 56 12000 50000
## 22 14 56 12000 50000
## 23 14 56 12000 50000
## 24 14 56 12000 50000
## 25 14 56 12000 50000
## 26 14 56 12000 50000
## 27 14 56 12000 50000
## 28 14 56 12000 50000
## 29 14 56 12000 50000
## 30 14 56 12000 50000
## 31 14 56 12000 50000
## 32 14 56 12000 50000
## 33 14 56 12000 50000
## 34 14 56 12000 50000
## 35 14 56 12000 50000
Birmingham has 14-56 hourly rates as a massage therapist.
getIndeedJobData5pages("massage therapist", "huntsville","AL")
## Warning in getIndeedJobData5pages("massage therapist", "huntsville", "AL"): NAs
## introduced by coercion
## Warning in max(hourly$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "huntsville", "AL"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 1 \nFrom $20 an hour $20 20 NA 20 20
## 2 \nFrom $20 an hour $20 20 NA 20 20
## 3 \nFrom $20 an hour $20 20 NA 20 20
## 4 \nFrom $20 an hour $20 20 NA 20 20
## 5 \nFrom $20 an hour $20 20 NA 20 20
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 20 20 20 20
## 2 20 20 20 20
## 3 20 20 20 20
## 4 20 20 20 20
## 5 20 20 20 20
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 30
## 4 30
## 5 30
## 6 30
## 7 30
## 8 30
## 9 30
## 10 30
## 11 30
## 12 30
## 13 30
## 14 30
## 15 30
##
## [[4]]
## HiringAgency
## 1 Hand and Stone3.0Huntsville, AL 35801
## 2 Massage Envy3.2Huntsville, AL 35802+1 location
## 3 Muse Day Spa & SalonDecatur, AL 35603
## 4 Hand and Stone3.0Huntsville, AL 35801
## 5 Massage Envy3.2Huntsville, AL 35802+1 location
## 6 Muse Day Spa & SalonDecatur, AL 35603
## 7 Hand and Stone3.0Huntsville, AL 35801
## 8 Massage Envy3.2Huntsville, AL 35802+1 location
## 9 Muse Day Spa & SalonDecatur, AL 35603
## 10 Hand and Stone3.0Huntsville, AL 35801
## 11 Massage Envy3.2Huntsville, AL 35802+1 location
## 12 Muse Day Spa & SalonDecatur, AL 35603
## 13 Hand and Stone3.0Huntsville, AL 35801
## 14 Massage Envy3.2Huntsville, AL 35802+1 location
## 15 Muse Day Spa & SalonDecatur, AL 35603
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 1 \nFrom $20 an hour $20 20 NA 20 NA
## 2 \nFrom $20 an hour $20 20 NA 20 NA
## 3 \nFrom $20 an hour $20 20 NA 20 NA
## 4 \nFrom $20 an hour $20 20 NA 20 NA
## 5 \nFrom $20 an hour $20 20 NA 20 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 20 NaN 20 -Inf
## 2 20 NaN 20 -Inf
## 3 20 NaN 20 -Inf
## 4 20 NaN 20 -Inf
## 5 20 NaN 20 -Inf
##
## [[7]]
## city state jobTitle
## 1 huntsville AL Licensed Massage Therapist
## 2 huntsville AL Massage Therapist
## 3 huntsville AL Licensed Massage Therapist
## 4 huntsville AL Licensed Massage Therapist
## 5 huntsville AL Massage Therapist
## 6 huntsville AL Licensed Massage Therapist
## 7 huntsville AL Licensed Massage Therapist
## 8 huntsville AL Massage Therapist
## 9 huntsville AL Licensed Massage Therapist
## 10 huntsville AL Licensed Massage Therapist
## 11 huntsville AL Massage Therapist
## 12 huntsville AL Licensed Massage Therapist
## 13 huntsville AL Licensed Massage Therapist
## 14 huntsville AL Massage Therapist
## 15 huntsville AL Licensed Massage Therapist
## HiringAgency date_daysAgo MinHourlySalary
## 1 Hand and Stone3.0Huntsville, AL 35801 30 20
## 2 Massage Envy3.2Huntsville, AL 35802+1 location 30 20
## 3 Muse Day Spa & SalonDecatur, AL 35603 30 20
## 4 Hand and Stone3.0Huntsville, AL 35801 30 20
## 5 Massage Envy3.2Huntsville, AL 35802+1 location 30 20
## 6 Muse Day Spa & SalonDecatur, AL 35603 30 20
## 7 Hand and Stone3.0Huntsville, AL 35801 30 20
## 8 Massage Envy3.2Huntsville, AL 35802+1 location 30 20
## 9 Muse Day Spa & SalonDecatur, AL 35603 30 20
## 10 Hand and Stone3.0Huntsville, AL 35801 30 20
## 11 Massage Envy3.2Huntsville, AL 35802+1 location 30 20
## 12 Muse Day Spa & SalonDecatur, AL 35603 30 20
## 13 Hand and Stone3.0Huntsville, AL 35801 30 20
## 14 Massage Envy3.2Huntsville, AL 35802+1 location 30 20
## 15 Muse Day Spa & SalonDecatur, AL 35603 30 20
## MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 20 NA NA
## 2 20 NA NA
## 3 20 NA NA
## 4 20 NA NA
## 5 20 NA NA
## 6 20 NA NA
## 7 20 NA NA
## 8 20 NA NA
## 9 20 NA NA
## 10 20 NA NA
## 11 20 NA NA
## 12 20 NA NA
## 13 20 NA NA
## 14 20 NA NA
## 15 20 NA NA
Huntsville didn’t have any usable data on hourly or salary info.
getIndeedJobData5pages("massage therapist", "montgomery","AL")
## [[1]]
## jobTitle
## 1 Massage Therapist - On Call
## 2 Massage Therapist - On Call
## 3 Massage Therapist
## 4 Massage Therapist - On Call
## 5 Massage Therapist - On Call
## 6 Massage Therapist
## 7 Massage Therapist - On Call
## 8 Massage Therapist - On Call
## 9 Massage Therapist
## 10 Massage Therapist - On Call
## 11 Massage Therapist - On Call
## 12 Massage Therapist
## 13 Massage Therapist - On Call
## 14 Massage Therapist - On Call
## 15 Massage Therapist
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 Just posted
## 2 Today
## 3 30
## 4 Just posted
## 5 Today
## 6 30
## 7 Just posted
## 8 Today
## 9 30
## 10 Just posted
## 11 Today
## 12 30
## 13 Just posted
## 14 Today
## 15 30
##
## [[4]]
## HiringAgency
## 1 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL
## 2 PCH Hotels & Resorts3.4Montgomery, AL
## 3 Massage Envy3.2Montgomery, AL 36117
## 4 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL
## 5 PCH Hotels & Resorts3.4Montgomery, AL
## 6 Massage Envy3.2Montgomery, AL 36117
## 7 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL
## 8 PCH Hotels & Resorts3.4Montgomery, AL
## 9 Massage Envy3.2Montgomery, AL 36117
## 10 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL
## 11 PCH Hotels & Resorts3.4Montgomery, AL
## 12 Massage Envy3.2Montgomery, AL 36117
## 13 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL
## 14 PCH Hotels & Resorts3.4Montgomery, AL
## 15 Massage Envy3.2Montgomery, AL 36117
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 montgomery AL Massage Therapist - On Call
## 2 montgomery AL Massage Therapist - On Call
## 3 montgomery AL Massage Therapist
## 4 montgomery AL Massage Therapist - On Call
## 5 montgomery AL Massage Therapist - On Call
## 6 montgomery AL Massage Therapist
## 7 montgomery AL Massage Therapist - On Call
## 8 montgomery AL Massage Therapist - On Call
## 9 montgomery AL Massage Therapist
## 10 montgomery AL Massage Therapist - On Call
## 11 montgomery AL Massage Therapist - On Call
## 12 montgomery AL Massage Therapist
## 13 montgomery AL Massage Therapist - On Call
## 14 montgomery AL Massage Therapist - On Call
## 15 montgomery AL Massage Therapist
## HiringAgency date_daysAgo
## 1 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL Just posted
## 2 PCH Hotels & Resorts3.4Montgomery, AL Today
## 3 Massage Envy3.2Montgomery, AL 36117 30
## 4 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL Just posted
## 5 PCH Hotels & Resorts3.4Montgomery, AL Today
## 6 Massage Envy3.2Montgomery, AL 36117 30
## 7 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL Just posted
## 8 PCH Hotels & Resorts3.4Montgomery, AL Today
## 9 Massage Envy3.2Montgomery, AL 36117 30
## 10 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL Just posted
## 11 PCH Hotels & Resorts3.4Montgomery, AL Today
## 12 Massage Envy3.2Montgomery, AL 36117 30
## 13 Renaissance Montgomery Hotel & Spa4.0Montgomery, AL Just posted
## 14 PCH Hotels & Resorts3.4Montgomery, AL Today
## 15 Massage Envy3.2Montgomery, AL 36117 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
## 6 NA NA NA NA
## 7 NA NA NA NA
## 8 NA NA NA NA
## 9 NA NA NA NA
## 10 NA NA NA NA
## 11 NA NA NA NA
## 12 NA NA NA NA
## 13 NA NA NA NA
## 14 NA NA NA NA
## 15 NA NA NA NA
Alabama has a median salary of the 3 cities shown above. This is between the limited posted salaries
AL_medianPay <- median(c(14,20,56))
AL_jobListings <- median(c(20,15,5))
AL_medianPay
## [1] 20
AL_jobListings
## [1] 15
Alaska Anchorage, Juneau, Fairbanks
getIndeedJobData5pages("massage therapist","anchorage","AK")
## Warning in getIndeedJobData5pages("massage therapist", "anchorage", "AK"): NAs
## introduced by coercion
## Warning in max(hourly$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "anchorage", "AK"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapy Receptionist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapy Receptionist
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapy Receptionist
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Massage Therapy Receptionist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapy Receptionist
## 27 Licensed Massage Therapist
## 28 Massage Therapist
## 29 Massage Therapist
## 30 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$15 an hour $15 15 NA
## 2 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 3 \n$15 an hour $15 15 NA
## 4 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 5 \n$15 an hour $15 15 NA
## 6 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 7 \n$15 an hour $15 15 NA
## 8 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 9 \n$15 an hour $15 15 NA
## 10 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 20007.5 40000 20007.5 30005 15
## 2 20007.5 40000 20007.5 30005 15
## 3 20007.5 40000 20007.5 30005 15
## 4 20007.5 40000 20007.5 30005 15
## 5 20007.5 40000 20007.5 30005 15
## 6 20007.5 40000 20007.5 30005 15
## 7 20007.5 40000 20007.5 30005 15
## 8 20007.5 40000 20007.5 30005 15
## 9 20007.5 40000 20007.5 30005 15
## 10 20007.5 40000 20007.5 30005 15
## maximumMaxSalary
## 1 50000
## 2 50000
## 3 50000
## 4 50000
## 5 50000
## 6 50000
## 7 50000
## 8 50000
## 9 50000
## 10 50000
##
## [[3]]
## date_daysAgo
## 1 8
## 2 30
## 3 30
## 4 30
## 5 30
## 6 30
## 7 8
## 8 30
## 9 30
## 10 30
## 11 30
## 12 30
## 13 30
## 14 30
## 15 30
## 16 30
## 17 30
## 18 8
## 19 8
## 20 30
## 21 30
## 22 30
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 30
## 29 30
## 30 8
##
## [[4]]
## HiringAgency
## 1 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 2 Southcentral Foundation4.2Anchorage, AK
## 3 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 4 LMR Technical GroupElmendorf AFB, AK
## 5 The Alaska Club3.3Anchorage, AK
## 6 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 7 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 8 Southcentral Foundation4.2Anchorage, AK
## 9 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 10 LMR Technical GroupElmendorf AFB, AK
## 11 The Alaska Club3.3Anchorage, AK
## 12 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 13 LMR Technical GroupElmendorf AFB, AK
## 14 Southcentral Foundation4.2Anchorage, AK
## 15 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 16 The Alaska Club3.3Anchorage, AK
## 17 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 18 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 19 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 20 Southcentral Foundation4.2Anchorage, AK
## 21 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 22 LMR Technical GroupElmendorf AFB, AK
## 23 The Alaska Club3.3Anchorage, AK
## 24 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 25 Southcentral Foundation4.2Anchorage, AK
## 26 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 27 The Alaska Club3.3Anchorage, AK
## 28 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 29 LMR Technical GroupElmendorf AFB, AK
## 30 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 4 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 6 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 8 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 10 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 40000 50000 40000 50000 40000
## 4 40000 50000 40000 50000 40000
## 6 40000 50000 40000 50000 40000
## 8 40000 50000 40000 50000 40000
## 10 40000 50000 40000 50000 40000
## maximumMaxSalary
## 2 50000
## 4 50000
## 6 50000
## 8 50000
## 10 50000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 1 \n$15 an hour $15 15 NA 15 NA
## 3 \n$15 an hour $15 15 NA 15 NA
## 5 \n$15 an hour $15 15 NA 15 NA
## 7 \n$15 an hour $15 15 NA 15 NA
## 9 \n$15 an hour $15 15 NA 15 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 15 NaN 15 -Inf
## 3 15 NaN 15 -Inf
## 5 15 NaN 15 -Inf
## 7 15 NaN 15 -Inf
## 9 15 NaN 15 -Inf
##
## [[7]]
## city state jobTitle
## 1 anchorage AK Massage Therapist
## 2 anchorage AK Massage Therapist
## 3 anchorage AK Massage Therapy Receptionist
## 4 anchorage AK Massage Therapist
## 5 anchorage AK Licensed Massage Therapist
## 6 anchorage AK Massage Therapist
## 7 anchorage AK Massage Therapist
## 8 anchorage AK Massage Therapist
## 9 anchorage AK Massage Therapy Receptionist
## 10 anchorage AK Massage Therapist
## 11 anchorage AK Licensed Massage Therapist
## 12 anchorage AK Massage Therapist
## 13 anchorage AK Massage Therapist
## 14 anchorage AK Massage Therapist
## 15 anchorage AK Massage Therapy Receptionist
## 16 anchorage AK Licensed Massage Therapist
## 17 anchorage AK Massage Therapist
## 18 anchorage AK Massage Therapist
## 19 anchorage AK Massage Therapist
## 20 anchorage AK Massage Therapist
## 21 anchorage AK Massage Therapy Receptionist
## 22 anchorage AK Massage Therapist
## 23 anchorage AK Licensed Massage Therapist
## 24 anchorage AK Massage Therapist
## 25 anchorage AK Massage Therapist
## 26 anchorage AK Massage Therapy Receptionist
## 27 anchorage AK Licensed Massage Therapist
## 28 anchorage AK Massage Therapist
## 29 anchorage AK Massage Therapist
## 30 anchorage AK Massage Therapist
## HiringAgency
## 1 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 2 Southcentral Foundation4.2Anchorage, AK
## 3 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 4 LMR Technical GroupElmendorf AFB, AK
## 5 The Alaska Club3.3Anchorage, AK
## 6 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 7 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 8 Southcentral Foundation4.2Anchorage, AK
## 9 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 10 LMR Technical GroupElmendorf AFB, AK
## 11 The Alaska Club3.3Anchorage, AK
## 12 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 13 LMR Technical GroupElmendorf AFB, AK
## 14 Southcentral Foundation4.2Anchorage, AK
## 15 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 16 The Alaska Club3.3Anchorage, AK
## 17 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 18 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 19 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## 20 Southcentral Foundation4.2Anchorage, AK
## 21 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 22 LMR Technical GroupElmendorf AFB, AK
## 23 The Alaska Club3.3Anchorage, AK
## 24 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 25 Southcentral Foundation4.2Anchorage, AK
## 26 Alaska Career College3.6Anchorage, AK 99507 (Tudor Area area)
## 27 The Alaska Club3.3Anchorage, AK
## 28 Massage Envy3.2Anchorage, AK 99515 (Taku-Campbell area)
## 29 LMR Technical GroupElmendorf AFB, AK
## 30 Preferred Pain & Injury CenterAnchorage, AK 99518 (Taku-Campbell area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 8 15 15 40000 50000
## 2 30 15 15 40000 50000
## 3 30 15 15 40000 50000
## 4 30 15 15 40000 50000
## 5 30 15 15 40000 50000
## 6 30 15 15 40000 50000
## 7 8 15 15 40000 50000
## 8 30 15 15 40000 50000
## 9 30 15 15 40000 50000
## 10 30 15 15 40000 50000
## 11 30 15 15 40000 50000
## 12 30 15 15 40000 50000
## 13 30 15 15 40000 50000
## 14 30 15 15 40000 50000
## 15 30 15 15 40000 50000
## 16 30 15 15 40000 50000
## 17 30 15 15 40000 50000
## 18 8 15 15 40000 50000
## 19 8 15 15 40000 50000
## 20 30 15 15 40000 50000
## 21 30 15 15 40000 50000
## 22 30 15 15 40000 50000
## 23 30 15 15 40000 50000
## 24 30 15 15 40000 50000
## 25 30 15 15 40000 50000
## 26 30 15 15 40000 50000
## 27 30 15 15 40000 50000
## 28 30 15 15 40000 50000
## 29 30 15 15 40000 50000
## 30 8 15 15 40000 50000
getIndeedJobData5pages("massage therapist","fairbanks","AK")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 17
## 2 17
## 3 17
## 4 17
## 5 17
##
## [[4]]
## HiringAgency
## 1 The Alaska Club3.3Fairbanks, AK
## 2 The Alaska Club3.3Fairbanks, AK
## 3 The Alaska Club3.3Fairbanks, AK
## 4 The Alaska Club3.3Fairbanks, AK
## 5 The Alaska Club3.3Fairbanks, AK
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle HiringAgency
## 1 fairbanks AK Licensed Massage Therapist The Alaska Club3.3Fairbanks, AK
## 2 fairbanks AK Licensed Massage Therapist The Alaska Club3.3Fairbanks, AK
## 3 fairbanks AK Licensed Massage Therapist The Alaska Club3.3Fairbanks, AK
## 4 fairbanks AK Licensed Massage Therapist The Alaska Club3.3Fairbanks, AK
## 5 fairbanks AK Licensed Massage Therapist The Alaska Club3.3Fairbanks, AK
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 17 NA NA NA NA
## 2 17 NA NA NA NA
## 3 17 NA NA NA NA
## 4 17 NA NA NA NA
## 5 17 NA NA NA NA
getIndeedJobData5pages("massage therapist","juneau","AK")
## [[1]]
## [1] jobTitle
## <0 rows> (or 0-length row.names)
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## [1] date_daysAgo
## <0 rows> (or 0-length row.names)
##
## [[4]]
## [1] HiringAgency
## <0 rows> (or 0-length row.names)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## [1] city state jobTitle HiringAgency
## [5] date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary
## [9] MaxAnnualSalary
## <0 rows> (or 0-length row.names)
The median pay is $15/hourly or $40,000-50,000/anually and number of listings is 15 and 5 with none for the third most populated town in AK.
Arizona Phoenix, Tucson, Mesa
getIndeedJobData5pages("massage therapist","phoenix","AZ")
## Warning in getIndeedJobData5pages("massage therapist", "phoenix", "AZ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "phoenix", "AZ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "phoenix", "AZ"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Experienced Massage Therapist LMT
## 3 Licensed Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Massage Therapist
## 9 Massage Therapist/ NMT - Independent Contractor Ahwatukee
## 10 Chiropractic Assistant/ Massage therapist
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist (LMT) - Free Healthcare Benefits...
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist (LMT)Great hours!
## 23 Massage Therapist Job at Elements Massage Scottsdale
## 24 Massage Therapist
## 25 Massage Therapist
## 26 Life Spa Massage Therapist
## 27 Licensed Massage Therapist
## 28 Event Licensed Massage Therapist (Part Time)
## 29 Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist(LMT) - week/weekend shifts
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Experienced Massage Therapist LMT
## 39 Massage Therapist - Independent Contractor
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist (LMT) (Full Time)
## 42 Massage Therapist
## 43 Massage Therapist- Full or Part Time (Scottsdale, AZ)
## 44 Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist (LMT)
## 50 Massage Therapist - Independent Contractor
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Massage Therapist - Full-Time
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist- $18-$20 per service hour
## 56 Massage Therapist- FT
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist (LMT)
## 59 Massage Therapist Tempe Location
## 60 Licensed Massage Therapist (LMT)
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist FT
## 63 Massage Therapist
## 64 Massage Therapist- PT
## 65 Salon Massage Therapist
## 66 Massage Therapist - Independent Contractor
## 67 Lmt/LMT Assistant Trainee for Small Studio in Old Town!
## 68 Massage Therapist - Part-Time
## 69 Elements Massage Chandler West: Wellness Membership Advisor
## 70 Licensed Massage Therapist (LMT)
## 71 Licensed Massage Therapist PT
## 72 Licensed Massage Therapist
## 73 part time IV therapist
## 74 Massage Therapist Fulton Ranch/Ocotillo Location
## 75 Massage Therapist Chandler Crossroads Location
## 76 Licensed Massage Therapist (LMT)
## 77 Massage Therapist San Tan Village
## 78 Licensed Massage Therapist, Independent Contractor
## 79 Largest Hand and Stone in AZ Needs Licensed Massage Therapis...
## 80 LMT / Colon Hydrotherapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25 an hour $25 25 NA
## 2 \n$20 - $26 an hour $20 - $26 20 26
## 3 \n$23 - $26 an hour $23 - $26 23 26
## 4 \n$28 an hour $28 28 NA
## 5 \n$40,000 - $72,000 a year $40000 - $72000 40000 72000
## 6 \n$22 - $24 an hour $22 - $24 22 24
## 7 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 8 \n$30 an hour $30 30 NA
## 9 \n$30 - $80 an hour $30 - $80 30 80
## 10 \n$50 an hour $50 50 NA
## 11 \n$21 an hour $21 21 NA
## 12 \n$62,000 a year ++ $62000 62000 NA
## 13 \n$18 - $20 an hour $18 - $20 18 20
## 14 \n$45,000 - $65,000 a year $45000 - $65000 45000 65000
## 15 \n$28 an hour $28 28 NA
## 16 \n$30 an hour $30 30 NA
## 17 \n$50,000 - $65,000 a year $50000 - $65000 50000 65000
## 18 \n$25 - $35 an hour $25 - $35 25 35
## 19 \n$62,000 a year $62000 62000 NA
## 20 \n$20 - $25 an hour $20 - $25 20 25
## 21 \n$27 - $32 an hour $27 - $32 27 32
## 22 \n$19 - $20 an hour $19 - $20 19 20
## 23 \n$15 - $25 an hour $15 - $25 15 25
## 24 \n$25 - $30 an hour $25 - $30 25 30
## 25 \nUp to $25 an hour $25 25 NA
## 26 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 27 \n$23 - $26 an hour $23 - $26 23 26
## 28 \n$45,000 - $65,000 a year $45000 - $65000 45000 65000
## 29 \n$18 - $20 an hour $18 - $20 18 20
## 30 \n$40,000 - $72,000 a year $40000 - $72000 40000 72000
## 31 \n$20 - $26 an hour $20 - $26 20 26
## 32 \n$25 - $30 an hour $25 - $30 25 30
## 33 \nUp to $25 an hour $25 25 NA
## 34 \n$19 - $22 an hour $19 - $22 19 22
## 35 \nUp to $50,000 a year ++ $50000 50000 NA
## 36 \n$18 - $35 an hour $18 - $35 18 35
## 37 \n$30 - $45 an hour $30 - $45 30 45
## 38 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 39 \n$25 an hour $25 25 NA
## 40 \n$50,000 - $65,000 a year $50000 - $65000 50000 65000
## 41 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 42 \n$16 - $18 an hour ++ $16 - $18 16 18
## 43 \n$24 - $40 an hour $24 - $40 24 40
## 44 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 45 \n$17 - $47 an hour $17 - $47 17 47
## 46 \n$1,000 - $2,000 a week $1000 - $2000 a week 1000 NA
## 47 \nFrom $50,000 a year $50000 50000 NA
## 48 \n$16 - $24 an hour $16 - $24 16 24
## 49 \n$16 - $18 an hour ++ $16 - $18 16 18
## 50 \n$35 - $45 an hour $35 - $45 35 45
## 51 \n$17 - $47 an hour $17 - $47 17 47
## 52 \nFrom $50,000 a year $50000 50000 NA
## 53 \n$1,000 - $2,000 a week $1000 - $2000 a week 1000 NA
## 54 \n$40 an hour $40 40 NA
## 55 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 56 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 57 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 58 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 59 \n$25 - $30 an hour $25 - $30 25 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 28 30 15794.75 18517.06 15
## 2 28 30 15794.75 18517.06 15
## 3 28 30 15794.75 18517.06 15
## 4 28 30 15794.75 18517.06 15
## 5 28 30 15794.75 18517.06 15
## 6 28 30 15794.75 18517.06 15
## 7 28 30 15794.75 18517.06 15
## 8 28 30 15794.75 18517.06 15
## 9 28 30 15794.75 18517.06 15
## 10 28 30 15794.75 18517.06 15
## 11 28 30 15794.75 18517.06 15
## 12 28 30 15794.75 18517.06 15
## 13 28 30 15794.75 18517.06 15
## 14 28 30 15794.75 18517.06 15
## 15 28 30 15794.75 18517.06 15
## 16 28 30 15794.75 18517.06 15
## 17 28 30 15794.75 18517.06 15
## 18 28 30 15794.75 18517.06 15
## 19 28 30 15794.75 18517.06 15
## 20 28 30 15794.75 18517.06 15
## 21 28 30 15794.75 18517.06 15
## 22 28 30 15794.75 18517.06 15
## 23 28 30 15794.75 18517.06 15
## 24 28 30 15794.75 18517.06 15
## 25 28 30 15794.75 18517.06 15
## 26 28 30 15794.75 18517.06 15
## 27 28 30 15794.75 18517.06 15
## 28 28 30 15794.75 18517.06 15
## 29 28 30 15794.75 18517.06 15
## 30 28 30 15794.75 18517.06 15
## 31 28 30 15794.75 18517.06 15
## 32 28 30 15794.75 18517.06 15
## 33 28 30 15794.75 18517.06 15
## 34 28 30 15794.75 18517.06 15
## 35 28 30 15794.75 18517.06 15
## 36 28 30 15794.75 18517.06 15
## 37 28 30 15794.75 18517.06 15
## 38 28 30 15794.75 18517.06 15
## 39 28 30 15794.75 18517.06 15
## 40 28 30 15794.75 18517.06 15
## 41 28 30 15794.75 18517.06 15
## 42 28 30 15794.75 18517.06 15
## 43 28 30 15794.75 18517.06 15
## 44 28 30 15794.75 18517.06 15
## 45 28 30 15794.75 18517.06 15
## 46 28 30 15794.75 18517.06 15
## 47 28 30 15794.75 18517.06 15
## 48 28 30 15794.75 18517.06 15
## 49 28 30 15794.75 18517.06 15
## 50 28 30 15794.75 18517.06 15
## 51 28 30 15794.75 18517.06 15
## 52 28 30 15794.75 18517.06 15
## 53 28 30 15794.75 18517.06 15
## 54 28 30 15794.75 18517.06 15
## 55 28 30 15794.75 18517.06 15
## 56 28 30 15794.75 18517.06 15
## 57 28 30 15794.75 18517.06 15
## 58 28 30 15794.75 18517.06 15
## 59 28 30 15794.75 18517.06 15
## maximumMaxSalary
## 1 72000
## 2 72000
## 3 72000
## 4 72000
## 5 72000
## 6 72000
## 7 72000
## 8 72000
## 9 72000
## 10 72000
## 11 72000
## 12 72000
## 13 72000
## 14 72000
## 15 72000
## 16 72000
## 17 72000
## 18 72000
## 19 72000
## 20 72000
## 21 72000
## 22 72000
## 23 72000
## 24 72000
## 25 72000
## 26 72000
## 27 72000
## 28 72000
## 29 72000
## 30 72000
## 31 72000
## 32 72000
## 33 72000
## 34 72000
## 35 72000
## 36 72000
## 37 72000
## 38 72000
## 39 72000
## 40 72000
## 41 72000
## 42 72000
## 43 72000
## 44 72000
## 45 72000
## 46 72000
## 47 72000
## 48 72000
## 49 72000
## 50 72000
## 51 72000
## 52 72000
## 53 72000
## 54 72000
## 55 72000
## 56 72000
## 57 72000
## 58 72000
## 59 72000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 13
## 3 Just posted
## 4 30
## 5 29
## 6 13
## 7 30
## 8 18
## 9 4
## 10 3
## 11 17
## 12 27
## 13 30
## 14 30
## 15 5
## 16 6
## 17 30
## 18 11
## 19 30
## 20 30
## 21 12
## 22 21
## 23 28
## 24 19
## 25 10
## 26 30
## 27 15
## 28 30
## 29 13
## 30 19
## 31 9
## 32 24
## 33 30
## 34 Just posted
## 35 30
## 36 6
## 37 29
## 38 13
## 39 19
## 40 9
## 41 30
## 42 7
## 43 30
## 44 27
## 45 9
## 46 30
## 47 30
## 48 30
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 11
## 55 30
## 56 30
## 57 24
## 58 30
## 59 30
## 60 5
## 61 27
## 62 30
## 63 19
## 64 30
## 65 30
## 66 10
## 67 17
## 68 30
## 69 30
## 70 5
## 71 30
## 72 27
## 73 30
## 74 30
## 75 30
## 76 30
## 77 30
## 78 10
## 79 30
## 80 28
##
## [[4]]
## HiringAgency
## 1 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 2 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 3 Keystone Body TherapiesChandler, AZ 85224
## 4 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 5 Elements Massage3.6Peoria, AZ 85382
## 6 Davis ChiropracticMesa, AZ 85212
## 7 Hand & Stone Massage and Facial Spa3.0Ahwatukee, AZ
## 8 Friendship Village Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 9 Sports & Family Care ClinicPhoenix, AZ 85048 (Ahwatukee Foothills area)
## 10 Advanced Holistic Health CtrChandler, AZ 85226
## 11 Friendship Village of Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 12 Life Time3.6Tempe, AZ 85284+2 locations
## 13 Babymoon Inn4.0Phoenix, AZ 85012 (Alhambra area)
## 14 Elements3.6Scottsdale, AZ 85260 (North Scottsdale area)+8 locations
## 15 Redirect Health3.3Glendale, AZ 85306
## 16 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 17 Hand & Stone Massage and Facial Spa3.0Peoria, AZ 85382
## 18 Wellness Clinic4.0Phoenix, AZ+6 locations
## 19 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 20 The Scottsdale Plaza Resort3.4Scottsdale, AZ 85253
## 21 Maaly TeamScottsdale, AZ 85260 (North Scottsdale area)
## 22 Greenway Cotton ChiropracticSurprise, AZ 85388
## 23 Elements3.6Scottsdale, AZ 85254 (North Scottsdale area)
## 24 AZ MEDPhoenix, AZ 85035 (Maryvale area)+1 location
## 25 Wellness Clinic4.0Scottsdale, AZ
## 26 Life Time3.6Phoenix, AZ 85054 (Desert View area)
## 27 Resilience Massage and WellnessMesa, AZ 85213 (Northgrove area)
## 28 LifeQuest Physical Medicine and RehabChandler, AZ 85225 (The Provinces area)
## 29 Absolute Pain ReliefChandler, AZ 85225
## 30 Lundgren ChiropracticChandler, AZ 85225
## 31 Massage Envy3.2Phoenix, AZ+8 locations
## 32 Soothe3.7Phoenix, AZ
## 33 Hand and Stone Massage and Facial Spa - Phoenix3.0Phoenix, AZ 85032 (Paradise Valley area)
## 34 Keystone Body TherapiesChandler, AZ 85224
## 35 Hand & Stone Massage and Facial Spa3.0Peoria, AZ 85382
## 36 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 37 Elements Massage3.6Peoria, AZ 85382
## 38 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 39 Lundgren ChiropracticChandler, AZ 85225
## 40 Massage Envy3.2Phoenix, AZ+8 locations
## 41 LifeQuest Physical Medicine and RehabChandler, AZ 85225 (The Provinces area)
## 42 Fuchsia Spa2.8Phoenix, AZ 85048 (Ahwatukee Foothills area)+1 location
## 43 The NOW, LLCScottsdale, AZ 85251 (South Scottsdale area)
## 44 Fuchsia Spa-High StreetPhoenix, AZ 85054 (Desert View area)
## 45 Mary Lynn's Massage and Day SpaParadise Valley, AZ 85253
## 46 Encore Massage LLCPhoenix, AZ
## 47 Elements3.6Tempe, AZ 85282 (Cyprus Southwest area)
## 48 Hand & Stone - Phoenix AZ3.0Phoenix, AZ 85032 (Paradise Valley area)
## 49 Hand & Stone Massage and Facial Spa3.0Ahwatukee, AZ
## 50 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 51 Maaly ManagementScottsdale, AZ 85260 (North Scottsdale area)+1 location
## 52 Massage Envy3.2Scottsdale, AZ 85260 (North Scottsdale area)+5 locations
## 53 Life Time3.6Goodyear, AZ 85395
## 54 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 55 Phoenix Wellness Companies IncorporatedGlendale, AZ 85302+1 location
## 56 Massage Envy3.2Phoenix, AZ 85016 (Camelback East area)+1 location
## 57 Soothe3.7Phoenix, AZ
## 58 Touch of Tranquility MassageGilbert, AZ 85295 (Spectrum area)
## 59 Massage Envy3.2Tempe, AZ 85284+2 locations
## 60 Best Estie Day SpaMesa, AZ 85204 (West Central area)
## 61 Massage Haven3.7Scottsdale, AZ 85255 (North Scottsdale area)
## 62 Massage Envy3.2Avondale, AZ 85392
## 63 MassageLuXe3.0Chandler, AZ 85249
## 64 Massage Envy3.2Phoenix, AZ 85016 (Camelback East area)+2 locations
## 65 JCPenney3.7Mesa, AZ 85206 (Southeast area)
## 66 Green leaf body and foot massageGilbert, AZ
## 67 Old Town MassageScottsdale, AZ 85251 (South Scottsdale area)
## 68 Life Time3.6Goodyear, AZ 85395
## 69 Elements3.6Chandler, AZ 85226
## 70 Best Estie Day SpaMesa, AZ 85204 (West Central area)
## 71 Massage Envy3.2Avondale, AZ 85392
## 72 Massage Haven3.7Scottsdale, AZ 85255 (North Scottsdale area)
## 73 Shakti Massage Therapy LLCScottsdale, AZ 85254 (Paradise Valley area)
## 74 Massage Envy3.2Chandler, AZ 85248
## 75 Massage Envy3.2Chandler, AZ 85286
## 76 Maaly ManagementMesa, AZ 85215 (Summit area)
## 77 Massage Envy3.2Gilbert, AZ 85295
## 78 Sun Health3.8Surprise, AZ 85374
## 79 Hand and Stone3.0Peoria, AZ 85383
## 80 Chambers Clinic LLCScottsdale, AZ 85255 (North Scottsdale area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 5 \n$40,000 - $72,000 a year $40000 - $72000 40000 72000
## 7 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 12 \n$62,000 a year ++ $62000 62000 NA
## 14 \n$45,000 - $65,000 a year $45000 - $65000 45000 65000
## 17 \n$50,000 - $65,000 a year $50000 - $65000 50000 65000
## 19 \n$62,000 a year $62000 62000 NA
## 26 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 28 \n$45,000 - $65,000 a year $45000 - $65000 45000 65000
## 30 \n$40,000 - $72,000 a year $40000 - $72000 40000 72000
## 35 \nUp to $50,000 a year ++ $50000 50000 NA
## 38 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 40 \n$50,000 - $65,000 a year $50000 - $65000 50000 65000
## 41 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 44 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 47 \nFrom $50,000 a year $50000 50000 NA
## 52 \nFrom $50,000 a year $50000 50000 NA
## 55 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 56 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 57 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 58 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 5 45000 60000 46450 61266.67 35000
## 7 45000 60000 46450 61266.67 35000
## 12 45000 60000 46450 61266.67 35000
## 14 45000 60000 46450 61266.67 35000
## 17 45000 60000 46450 61266.67 35000
## 19 45000 60000 46450 61266.67 35000
## 26 45000 60000 46450 61266.67 35000
## 28 45000 60000 46450 61266.67 35000
## 30 45000 60000 46450 61266.67 35000
## 35 45000 60000 46450 61266.67 35000
## 38 45000 60000 46450 61266.67 35000
## 40 45000 60000 46450 61266.67 35000
## 41 45000 60000 46450 61266.67 35000
## 44 45000 60000 46450 61266.67 35000
## 47 45000 60000 46450 61266.67 35000
## 52 45000 60000 46450 61266.67 35000
## 55 45000 60000 46450 61266.67 35000
## 56 45000 60000 46450 61266.67 35000
## 57 45000 60000 46450 61266.67 35000
## 58 45000 60000 46450 61266.67 35000
## maximumMaxSalary
## 5 72000
## 7 72000
## 12 72000
## 14 72000
## 17 72000
## 19 72000
## 26 72000
## 28 72000
## 30 72000
## 35 72000
## 38 72000
## 40 72000
## 41 72000
## 44 72000
## 47 72000
## 52 72000
## 55 72000
## 56 72000
## 57 72000
## 58 72000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$25 an hour $25 25 NA 24
## 2 \n$20 - $26 an hour $20 - $26 20 26 24
## 3 \n$23 - $26 an hour $23 - $26 23 26 24
## 4 \n$28 an hour $28 28 NA 24
## 6 \n$22 - $24 an hour $22 - $24 22 24 24
## 8 \n$30 an hour $30 30 NA 24
## 9 \n$30 - $80 an hour $30 - $80 30 80 24
## 10 \n$50 an hour $50 50 NA 24
## 11 \n$21 an hour $21 21 NA 24
## 13 \n$18 - $20 an hour $18 - $20 18 20 24
## 15 \n$28 an hour $28 28 NA 24
## 16 \n$30 an hour $30 30 NA 24
## 18 \n$25 - $35 an hour $25 - $35 25 35 24
## 20 \n$20 - $25 an hour $20 - $25 20 25 24
## 21 \n$27 - $32 an hour $27 - $32 27 32 24
## 22 \n$19 - $20 an hour $19 - $20 19 20 24
## 23 \n$15 - $25 an hour $15 - $25 15 25 24
## 24 \n$25 - $30 an hour $25 - $30 25 30 24
## 25 \nUp to $25 an hour $25 25 NA 24
## 27 \n$23 - $26 an hour $23 - $26 23 26 24
## 29 \n$18 - $20 an hour $18 - $20 18 20 24
## 31 \n$20 - $26 an hour $20 - $26 20 26 24
## 32 \n$25 - $30 an hour $25 - $30 25 30 24
## 33 \nUp to $25 an hour $25 25 NA 24
## 34 \n$19 - $22 an hour $19 - $22 19 22 24
## 36 \n$18 - $35 an hour $18 - $35 18 35 24
## 37 \n$30 - $45 an hour $30 - $45 30 45 24
## 39 \n$25 an hour $25 25 NA 24
## 42 \n$16 - $18 an hour ++ $16 - $18 16 18 24
## 43 \n$24 - $40 an hour $24 - $40 24 40 24
## 45 \n$17 - $47 an hour $17 - $47 17 47 24
## 48 \n$16 - $24 an hour $16 - $24 16 24 24
## 49 \n$16 - $18 an hour ++ $16 - $18 16 18 24
## 50 \n$35 - $45 an hour $35 - $45 35 45 24
## 51 \n$17 - $47 an hour $17 - $47 17 47 24
## 54 \n$40 an hour $40 40 NA 24
## 59 \n$25 - $30 an hour $25 - $30 25 30 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 26 24.05405 31.38462 15 80
## 2 26 24.05405 31.38462 15 80
## 3 26 24.05405 31.38462 15 80
## 4 26 24.05405 31.38462 15 80
## 6 26 24.05405 31.38462 15 80
## 8 26 24.05405 31.38462 15 80
## 9 26 24.05405 31.38462 15 80
## 10 26 24.05405 31.38462 15 80
## 11 26 24.05405 31.38462 15 80
## 13 26 24.05405 31.38462 15 80
## 15 26 24.05405 31.38462 15 80
## 16 26 24.05405 31.38462 15 80
## 18 26 24.05405 31.38462 15 80
## 20 26 24.05405 31.38462 15 80
## 21 26 24.05405 31.38462 15 80
## 22 26 24.05405 31.38462 15 80
## 23 26 24.05405 31.38462 15 80
## 24 26 24.05405 31.38462 15 80
## 25 26 24.05405 31.38462 15 80
## 27 26 24.05405 31.38462 15 80
## 29 26 24.05405 31.38462 15 80
## 31 26 24.05405 31.38462 15 80
## 32 26 24.05405 31.38462 15 80
## 33 26 24.05405 31.38462 15 80
## 34 26 24.05405 31.38462 15 80
## 36 26 24.05405 31.38462 15 80
## 37 26 24.05405 31.38462 15 80
## 39 26 24.05405 31.38462 15 80
## 42 26 24.05405 31.38462 15 80
## 43 26 24.05405 31.38462 15 80
## 45 26 24.05405 31.38462 15 80
## 48 26 24.05405 31.38462 15 80
## 49 26 24.05405 31.38462 15 80
## 50 26 24.05405 31.38462 15 80
## 51 26 24.05405 31.38462 15 80
## 54 26 24.05405 31.38462 15 80
## 59 26 24.05405 31.38462 15 80
##
## [[7]]
## city state
## 1 phoenix AZ
## 2 phoenix AZ
## 3 phoenix AZ
## 4 phoenix AZ
## 5 phoenix AZ
## 6 phoenix AZ
## 7 phoenix AZ
## 8 phoenix AZ
## 9 phoenix AZ
## 10 phoenix AZ
## 11 phoenix AZ
## 12 phoenix AZ
## 13 phoenix AZ
## 14 phoenix AZ
## 15 phoenix AZ
## 16 phoenix AZ
## 17 phoenix AZ
## 18 phoenix AZ
## 19 phoenix AZ
## 20 phoenix AZ
## 21 phoenix AZ
## 22 phoenix AZ
## 23 phoenix AZ
## 24 phoenix AZ
## 25 phoenix AZ
## 26 phoenix AZ
## 27 phoenix AZ
## 28 phoenix AZ
## 29 phoenix AZ
## 30 phoenix AZ
## 31 phoenix AZ
## 32 phoenix AZ
## 33 phoenix AZ
## 34 phoenix AZ
## 35 phoenix AZ
## 36 phoenix AZ
## 37 phoenix AZ
## 38 phoenix AZ
## 39 phoenix AZ
## 40 phoenix AZ
## 41 phoenix AZ
## 42 phoenix AZ
## 43 phoenix AZ
## 44 phoenix AZ
## 45 phoenix AZ
## 46 phoenix AZ
## 47 phoenix AZ
## 48 phoenix AZ
## 49 phoenix AZ
## 50 phoenix AZ
## 51 phoenix AZ
## 52 phoenix AZ
## 53 phoenix AZ
## 54 phoenix AZ
## 55 phoenix AZ
## 56 phoenix AZ
## 57 phoenix AZ
## 58 phoenix AZ
## 59 phoenix AZ
## 60 phoenix AZ
## 61 phoenix AZ
## 62 phoenix AZ
## 63 phoenix AZ
## 64 phoenix AZ
## 65 phoenix AZ
## 66 phoenix AZ
## 67 phoenix AZ
## 68 phoenix AZ
## 69 phoenix AZ
## 70 phoenix AZ
## 71 phoenix AZ
## 72 phoenix AZ
## 73 phoenix AZ
## 74 phoenix AZ
## 75 phoenix AZ
## 76 phoenix AZ
## 77 phoenix AZ
## 78 phoenix AZ
## 79 phoenix AZ
## 80 phoenix AZ
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Experienced Massage Therapist LMT
## 3 Licensed Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Massage Therapist
## 9 Massage Therapist/ NMT - Independent Contractor Ahwatukee
## 10 Chiropractic Assistant/ Massage therapist
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist (LMT) - Free Healthcare Benefits...
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist (LMT)Great hours!
## 23 Massage Therapist Job at Elements Massage Scottsdale
## 24 Massage Therapist
## 25 Massage Therapist
## 26 Life Spa Massage Therapist
## 27 Licensed Massage Therapist
## 28 Event Licensed Massage Therapist (Part Time)
## 29 Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist(LMT) - week/weekend shifts
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Experienced Massage Therapist LMT
## 39 Massage Therapist - Independent Contractor
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist (LMT) (Full Time)
## 42 Massage Therapist
## 43 Massage Therapist- Full or Part Time (Scottsdale, AZ)
## 44 Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist (LMT)
## 50 Massage Therapist - Independent Contractor
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Massage Therapist - Full-Time
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist- $18-$20 per service hour
## 56 Massage Therapist- FT
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist (LMT)
## 59 Massage Therapist Tempe Location
## 60 Licensed Massage Therapist (LMT)
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist FT
## 63 Massage Therapist
## 64 Massage Therapist- PT
## 65 Salon Massage Therapist
## 66 Massage Therapist - Independent Contractor
## 67 Lmt/LMT Assistant Trainee for Small Studio in Old Town!
## 68 Massage Therapist - Part-Time
## 69 Elements Massage Chandler West: Wellness Membership Advisor
## 70 Licensed Massage Therapist (LMT)
## 71 Licensed Massage Therapist PT
## 72 Licensed Massage Therapist
## 73 part time IV therapist
## 74 Massage Therapist Fulton Ranch/Ocotillo Location
## 75 Massage Therapist Chandler Crossroads Location
## 76 Licensed Massage Therapist (LMT)
## 77 Massage Therapist San Tan Village
## 78 Licensed Massage Therapist, Independent Contractor
## 79 Largest Hand and Stone in AZ Needs Licensed Massage Therapis...
## 80 LMT / Colon Hydrotherapist
## HiringAgency
## 1 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 2 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 3 Keystone Body TherapiesChandler, AZ 85224
## 4 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 5 Elements Massage3.6Peoria, AZ 85382
## 6 Davis ChiropracticMesa, AZ 85212
## 7 Hand & Stone Massage and Facial Spa3.0Ahwatukee, AZ
## 8 Friendship Village Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 9 Sports & Family Care ClinicPhoenix, AZ 85048 (Ahwatukee Foothills area)
## 10 Advanced Holistic Health CtrChandler, AZ 85226
## 11 Friendship Village of Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 12 Life Time3.6Tempe, AZ 85284+2 locations
## 13 Babymoon Inn4.0Phoenix, AZ 85012 (Alhambra area)
## 14 Elements3.6Scottsdale, AZ 85260 (North Scottsdale area)+8 locations
## 15 Redirect Health3.3Glendale, AZ 85306
## 16 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 17 Hand & Stone Massage and Facial Spa3.0Peoria, AZ 85382
## 18 Wellness Clinic4.0Phoenix, AZ+6 locations
## 19 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 20 The Scottsdale Plaza Resort3.4Scottsdale, AZ 85253
## 21 Maaly TeamScottsdale, AZ 85260 (North Scottsdale area)
## 22 Greenway Cotton ChiropracticSurprise, AZ 85388
## 23 Elements3.6Scottsdale, AZ 85254 (North Scottsdale area)
## 24 AZ MEDPhoenix, AZ 85035 (Maryvale area)+1 location
## 25 Wellness Clinic4.0Scottsdale, AZ
## 26 Life Time3.6Phoenix, AZ 85054 (Desert View area)
## 27 Resilience Massage and WellnessMesa, AZ 85213 (Northgrove area)
## 28 LifeQuest Physical Medicine and RehabChandler, AZ 85225 (The Provinces area)
## 29 Absolute Pain ReliefChandler, AZ 85225
## 30 Lundgren ChiropracticChandler, AZ 85225
## 31 Massage Envy3.2Phoenix, AZ+8 locations
## 32 Soothe3.7Phoenix, AZ
## 33 Hand and Stone Massage and Facial Spa - Phoenix3.0Phoenix, AZ 85032 (Paradise Valley area)
## 34 Keystone Body TherapiesChandler, AZ 85224
## 35 Hand & Stone Massage and Facial Spa3.0Peoria, AZ 85382
## 36 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 37 Elements Massage3.6Peoria, AZ 85382
## 38 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 39 Lundgren ChiropracticChandler, AZ 85225
## 40 Massage Envy3.2Phoenix, AZ+8 locations
## 41 LifeQuest Physical Medicine and RehabChandler, AZ 85225 (The Provinces area)
## 42 Fuchsia Spa2.8Phoenix, AZ 85048 (Ahwatukee Foothills area)+1 location
## 43 The NOW, LLCScottsdale, AZ 85251 (South Scottsdale area)
## 44 Fuchsia Spa-High StreetPhoenix, AZ 85054 (Desert View area)
## 45 Mary Lynn's Massage and Day SpaParadise Valley, AZ 85253
## 46 Encore Massage LLCPhoenix, AZ
## 47 Elements3.6Tempe, AZ 85282 (Cyprus Southwest area)
## 48 Hand & Stone - Phoenix AZ3.0Phoenix, AZ 85032 (Paradise Valley area)
## 49 Hand & Stone Massage and Facial Spa3.0Ahwatukee, AZ
## 50 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 51 Maaly ManagementScottsdale, AZ 85260 (North Scottsdale area)+1 location
## 52 Massage Envy3.2Scottsdale, AZ 85260 (North Scottsdale area)+5 locations
## 53 Life Time3.6Goodyear, AZ 85395
## 54 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 55 Phoenix Wellness Companies IncorporatedGlendale, AZ 85302+1 location
## 56 Massage Envy3.2Phoenix, AZ 85016 (Camelback East area)+1 location
## 57 Soothe3.7Phoenix, AZ
## 58 Touch of Tranquility MassageGilbert, AZ 85295 (Spectrum area)
## 59 Massage Envy3.2Tempe, AZ 85284+2 locations
## 60 Best Estie Day SpaMesa, AZ 85204 (West Central area)
## 61 Massage Haven3.7Scottsdale, AZ 85255 (North Scottsdale area)
## 62 Massage Envy3.2Avondale, AZ 85392
## 63 MassageLuXe3.0Chandler, AZ 85249
## 64 Massage Envy3.2Phoenix, AZ 85016 (Camelback East area)+2 locations
## 65 JCPenney3.7Mesa, AZ 85206 (Southeast area)
## 66 Green leaf body and foot massageGilbert, AZ
## 67 Old Town MassageScottsdale, AZ 85251 (South Scottsdale area)
## 68 Life Time3.6Goodyear, AZ 85395
## 69 Elements3.6Chandler, AZ 85226
## 70 Best Estie Day SpaMesa, AZ 85204 (West Central area)
## 71 Massage Envy3.2Avondale, AZ 85392
## 72 Massage Haven3.7Scottsdale, AZ 85255 (North Scottsdale area)
## 73 Shakti Massage Therapy LLCScottsdale, AZ 85254 (Paradise Valley area)
## 74 Massage Envy3.2Chandler, AZ 85248
## 75 Massage Envy3.2Chandler, AZ 85286
## 76 Maaly ManagementMesa, AZ 85215 (Summit area)
## 77 Massage Envy3.2Gilbert, AZ 85295
## 78 Sun Health3.8Surprise, AZ 85374
## 79 Hand and Stone3.0Peoria, AZ 85383
## 80 Chambers Clinic LLCScottsdale, AZ 85255 (North Scottsdale area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 15 80 35000 72000
## 2 13 15 80 35000 72000
## 3 Just posted 15 80 35000 72000
## 4 30 15 80 35000 72000
## 5 29 15 80 35000 72000
## 6 13 15 80 35000 72000
## 7 30 15 80 35000 72000
## 8 18 15 80 35000 72000
## 9 4 15 80 35000 72000
## 10 3 15 80 35000 72000
## 11 17 15 80 35000 72000
## 12 27 15 80 35000 72000
## 13 30 15 80 35000 72000
## 14 30 15 80 35000 72000
## 15 5 15 80 35000 72000
## 16 6 15 80 35000 72000
## 17 30 15 80 35000 72000
## 18 11 15 80 35000 72000
## 19 30 15 80 35000 72000
## 20 30 15 80 35000 72000
## 21 12 15 80 35000 72000
## 22 21 15 80 35000 72000
## 23 28 15 80 35000 72000
## 24 19 15 80 35000 72000
## 25 10 15 80 35000 72000
## 26 30 15 80 35000 72000
## 27 15 15 80 35000 72000
## 28 30 15 80 35000 72000
## 29 13 15 80 35000 72000
## 30 19 15 80 35000 72000
## 31 9 15 80 35000 72000
## 32 24 15 80 35000 72000
## 33 30 15 80 35000 72000
## 34 Just posted 15 80 35000 72000
## 35 30 15 80 35000 72000
## 36 6 15 80 35000 72000
## 37 29 15 80 35000 72000
## 38 13 15 80 35000 72000
## 39 19 15 80 35000 72000
## 40 9 15 80 35000 72000
## 41 30 15 80 35000 72000
## 42 7 15 80 35000 72000
## 43 30 15 80 35000 72000
## 44 27 15 80 35000 72000
## 45 9 15 80 35000 72000
## 46 30 15 80 35000 72000
## 47 30 15 80 35000 72000
## 48 30 15 80 35000 72000
## 49 30 15 80 35000 72000
## 50 30 15 80 35000 72000
## 51 30 15 80 35000 72000
## 52 30 15 80 35000 72000
## 53 30 15 80 35000 72000
## 54 11 15 80 35000 72000
## 55 30 15 80 35000 72000
## 56 30 15 80 35000 72000
## 57 24 15 80 35000 72000
## 58 30 15 80 35000 72000
## 59 30 15 80 35000 72000
## 60 5 15 80 35000 72000
## 61 27 15 80 35000 72000
## 62 30 15 80 35000 72000
## 63 19 15 80 35000 72000
## 64 30 15 80 35000 72000
## 65 30 15 80 35000 72000
## 66 10 15 80 35000 72000
## 67 17 15 80 35000 72000
## 68 30 15 80 35000 72000
## 69 30 15 80 35000 72000
## 70 5 15 80 35000 72000
## 71 30 15 80 35000 72000
## 72 27 15 80 35000 72000
## 73 30 15 80 35000 72000
## 74 30 15 80 35000 72000
## 75 30 15 80 35000 72000
## 76 30 15 80 35000 72000
## 77 30 15 80 35000 72000
## 78 10 15 80 35000 72000
## 79 30 15 80 35000 72000
## 80 28 15 80 35000 72000
Phoenix has 80 listings and a range of 12-80 USD an hour and 35k-72k salary.
getIndeedJobData5pages("massage therapist","Tucson", "AZ")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist (Part- Time
## 7 Looking For an Amazing Massage Therapist
## 8 Mobile Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Licensed Massage Therapist, Independent Contractor
## 13 Licensed Massage Therapist
## 14 Massage Therapist Tucson, Wilmot & Broadway Location
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist, Independent Contractor
## 21 Massage Therapist Tucson, Wilmot & Broadway Location
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist (Full or Part time)
## 24 Massage Therapist Tucson Foothills Location
## 25 Massage Therapist Tucson/Old Spanish Trail Location
## 26 Licensed Massage Therapist (LMT)
## 27 Massage Therapist - Independent Contractor
## 28 Massage Therapist (Part- Time
## 29 Looking For an Amazing Massage Therapist
## 30 Mobile Massage Therapist
## 31 Massage Therapist
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist (LMT)
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist, Independent Contractor
## 36 Massage Therapist Tucson, Wilmot & Broadway Location
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist (Full or Part time)
## 39 Massage Therapist Tucson Foothills Location
## 40 Massage Therapist Tucson/Old Spanish Trail Location
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist - Independent Contractor
## 43 Massage Therapist (Part- Time
## 44 Looking For an Amazing Massage Therapist
## 45 Mobile Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist (LMT)
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist, Independent Contractor
## 51 Massage Therapist Tucson, Wilmot & Broadway Location
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist (Full or Part time)
## 54 Massage Therapist Tucson Foothills Location
## 55 Massage Therapist Tucson/Old Spanish Trail Location
## 56 Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist, Independent Contractor
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist (LMT)
## 61 Massage Therapist Tucson, Wilmot & Broadway Location
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist (Full or Part time)
## 64 Massage Therapist Tucson Foothills Location
## 65 Massage Therapist Tucson/Old Spanish Trail Location
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25 - $31 an hour $25 - $31 25 31
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$22 - $35 an hour $22 - $35 22 35
## 4 \n$45 - $70 an hour $45 - $70 45 70
## 5 \n$19 - $30 an hour $19 - $30 19 30
## 6 \n$19 - $25 an hour $19 - $25 19 25
## 7 \n$45 - $60 an hour $45 - $60 45 60
## 8 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 9 \n$20 - $24 an hour $20 - $24 20 24
## 10 \n$20 - $24 an hour $20 - $24 20 24
## 11 \n$19 - $25 an hour $19 - $25 19 25
## 12 \n$45 - $60 an hour $45 - $60 45 60
## 13 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 14 \n$20 - $24 an hour $20 - $24 20 24
## 15 \n$15 - $21 an hour $15 - $21 15 21
## 16 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 17 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 18 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 19 \n$22 - $35 an hour $22 - $35 22 35
## 20 \n$45 - $70 an hour $45 - $70 45 70
## 21 \n$20 - $24 an hour $20 - $24 20 24
## 22 \n$19 - $25 an hour $19 - $25 19 25
## 23 \n$45 - $60 an hour $45 - $60 45 60
## 24 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 25 \n$20 - $24 an hour $20 - $24 20 24
## 26 \n$15 - $21 an hour $15 - $21 15 21
## 27 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 28 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 29 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 30 \n$22 - $35 an hour $22 - $35 22 35
## 31 \n$45 - $70 an hour $45 - $70 45 70
## 32 \n$20 - $24 an hour $20 - $24 20 24
## 33 \n$19 - $25 an hour $19 - $25 19 25
## 34 \n$45 - $60 an hour $45 - $60 45 60
## 35 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 36 \n$20 - $24 an hour $20 - $24 20 24
## 37 \n$15 - $21 an hour $15 - $21 15 21
## 38 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 39 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 40 \n$20 - $24 an hour $20 - $24 20 24
## 41 \n$45 - $60 an hour $45 - $60 45 60
## 42 \n$19 - $25 an hour $19 - $25 19 25
## 43 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 44 \n$20 - $24 an hour $20 - $24 20 24
## 45 \n$15 - $21 an hour $15 - $21 15 21
## 46 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 47 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 45 12783.09 14392.62 15
## 2 45 45 12783.09 14392.62 15
## 3 45 45 12783.09 14392.62 15
## 4 45 45 12783.09 14392.62 15
## 5 45 45 12783.09 14392.62 15
## 6 45 45 12783.09 14392.62 15
## 7 45 45 12783.09 14392.62 15
## 8 45 45 12783.09 14392.62 15
## 9 45 45 12783.09 14392.62 15
## 10 45 45 12783.09 14392.62 15
## 11 45 45 12783.09 14392.62 15
## 12 45 45 12783.09 14392.62 15
## 13 45 45 12783.09 14392.62 15
## 14 45 45 12783.09 14392.62 15
## 15 45 45 12783.09 14392.62 15
## 16 45 45 12783.09 14392.62 15
## 17 45 45 12783.09 14392.62 15
## 18 45 45 12783.09 14392.62 15
## 19 45 45 12783.09 14392.62 15
## 20 45 45 12783.09 14392.62 15
## 21 45 45 12783.09 14392.62 15
## 22 45 45 12783.09 14392.62 15
## 23 45 45 12783.09 14392.62 15
## 24 45 45 12783.09 14392.62 15
## 25 45 45 12783.09 14392.62 15
## 26 45 45 12783.09 14392.62 15
## 27 45 45 12783.09 14392.62 15
## 28 45 45 12783.09 14392.62 15
## 29 45 45 12783.09 14392.62 15
## 30 45 45 12783.09 14392.62 15
## 31 45 45 12783.09 14392.62 15
## 32 45 45 12783.09 14392.62 15
## 33 45 45 12783.09 14392.62 15
## 34 45 45 12783.09 14392.62 15
## 35 45 45 12783.09 14392.62 15
## 36 45 45 12783.09 14392.62 15
## 37 45 45 12783.09 14392.62 15
## 38 45 45 12783.09 14392.62 15
## 39 45 45 12783.09 14392.62 15
## 40 45 45 12783.09 14392.62 15
## 41 45 45 12783.09 14392.62 15
## 42 45 45 12783.09 14392.62 15
## 43 45 45 12783.09 14392.62 15
## 44 45 45 12783.09 14392.62 15
## 45 45 45 12783.09 14392.62 15
## 46 45 45 12783.09 14392.62 15
## 47 45 45 12783.09 14392.62 15
## maximumMaxSalary
## 1 55000
## 2 55000
## 3 55000
## 4 55000
## 5 55000
## 6 55000
## 7 55000
## 8 55000
## 9 55000
## 10 55000
## 11 55000
## 12 55000
## 13 55000
## 14 55000
## 15 55000
## 16 55000
## 17 55000
## 18 55000
## 19 55000
## 20 55000
## 21 55000
## 22 55000
## 23 55000
## 24 55000
## 25 55000
## 26 55000
## 27 55000
## 28 55000
## 29 55000
## 30 55000
## 31 55000
## 32 55000
## 33 55000
## 34 55000
## 35 55000
## 36 55000
## 37 55000
## 38 55000
## 39 55000
## 40 55000
## 41 55000
## 42 55000
## 43 55000
## 44 55000
## 45 55000
## 46 55000
## 47 55000
##
## [[3]]
## date_daysAgo
## 1 6
## 2 17
## 3 24
## 4 10
## 5 30
## 6 21
## 7 15
## 8 30
## 9 13
## 10 9
## 11 30
## 12 14
## 13 6
## 14 30
## 15 28
## 16 13
## 17 27
## 18 30
## 19 6
## 20 14
## 21 30
## 22 28
## 23 30
## 24 30
## 25 30
## 26 10
## 27 30
## 28 21
## 29 15
## 30 30
## 31 13
## 32 27
## 33 30
## 34 6
## 35 14
## 36 30
## 37 28
## 38 30
## 39 30
## 40 30
## 41 10
## 42 30
## 43 21
## 44 15
## 45 30
## 46 13
## 47 27
## 48 30
## 49 6
## 50 14
## 51 30
## 52 28
## 53 30
## 54 30
## 55 30
## 56 13
## 57 27
## 58 14
## 59 6
## 60 30
## 61 30
## 62 28
## 63 30
## 64 30
## 65 30
##
## [[4]]
## HiringAgency
## 1 Oro Valley Health and Wellness Chiropractic PCOro Valley, AZ 85737
## 2 Hacienda Del Sol Guest Ranch Resort2.7Tucson, AZ 85718
## 3 Performance Sports TherapyTucson, AZ 85710
## 4 Wellness Clinic4.0Tucson, AZ
## 5 Indo-Pak Massage TherapyTucson, AZ•Remote work available
## 6 Omni Hotels & Resorts3.8Tucson, AZ 85742 (Casas Adobes area)
## 7 MEND Therapeutic Massage and Restorative SkincareCatalina, AZ 85739 (El Conquistador area)
## 8 Indo-Pak Massage TherapyTucson, AZ
## 9 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 10 RUBS MASSAGE STUDIO3.1Tucson, AZ 85704 (Casas Adobes area)+1 location
## 11 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 12 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 13 Massage Envy3.2Wilmot, AZ+2 locations
## 14 Massage Envy3.2Tucson, AZ 85710+1 location
## 15 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 16 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 17 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 18 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 19 Massage Envy3.2Wilmot, AZ+2 locations
## 20 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 21 Massage Envy3.2Tucson, AZ 85710+1 location
## 22 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 23 Fuchsia La EncantadaTucson, AZ 85718
## 24 Massage Envy3.2Tucson, AZ 85718
## 25 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
## 26 Wellness Clinic4.0Tucson, AZ
## 27 Indo-Pak Massage TherapyTucson, AZ•Remote work available
## 28 Omni Hotels & Resorts3.8Tucson, AZ 85742 (Casas Adobes area)
## 29 MEND Therapeutic Massage and Restorative SkincareCatalina, AZ 85739 (El Conquistador area)
## 30 Indo-Pak Massage TherapyTucson, AZ
## 31 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 32 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 33 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 34 Massage Envy3.2Wilmot, AZ+2 locations
## 35 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 36 Massage Envy3.2Tucson, AZ 85710+1 location
## 37 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 38 Fuchsia La EncantadaTucson, AZ 85718
## 39 Massage Envy3.2Tucson, AZ 85718
## 40 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
## 41 Wellness Clinic4.0Tucson, AZ
## 42 Indo-Pak Massage TherapyTucson, AZ•Remote work available
## 43 Omni Hotels & Resorts3.8Tucson, AZ 85742 (Casas Adobes area)
## 44 MEND Therapeutic Massage and Restorative SkincareCatalina, AZ 85739 (El Conquistador area)
## 45 Indo-Pak Massage TherapyTucson, AZ
## 46 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 47 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 48 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 49 Massage Envy3.2Wilmot, AZ+2 locations
## 50 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 51 Massage Envy3.2Tucson, AZ 85710+1 location
## 52 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 53 Fuchsia La EncantadaTucson, AZ 85718
## 54 Massage Envy3.2Tucson, AZ 85718
## 55 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
## 56 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 57 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 58 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 59 Massage Envy3.2Wilmot, AZ+2 locations
## 60 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 61 Massage Envy3.2Tucson, AZ 85710+1 location
## 62 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 63 Fuchsia La EncantadaTucson, AZ 85718
## 64 Massage Envy3.2Tucson, AZ 85718
## 65 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 8 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 13 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 16 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 17 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 24 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 27 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 28 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 35 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 38 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 39 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 43 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 46 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 47 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 8 45000 55000 45000 55000 45000
## 13 45000 55000 45000 55000 45000
## 16 45000 55000 45000 55000 45000
## 17 45000 55000 45000 55000 45000
## 24 45000 55000 45000 55000 45000
## 27 45000 55000 45000 55000 45000
## 28 45000 55000 45000 55000 45000
## 35 45000 55000 45000 55000 45000
## 38 45000 55000 45000 55000 45000
## 39 45000 55000 45000 55000 45000
## 43 45000 55000 45000 55000 45000
## 46 45000 55000 45000 55000 45000
## 47 45000 55000 45000 55000 45000
## maximumMaxSalary
## 8 55000
## 13 55000
## 16 55000
## 17 55000
## 24 55000
## 27 55000
## 28 55000
## 35 55000
## 38 55000
## 39 55000
## 43 55000
## 46 55000
## 47 55000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$25 - $31 an hour $25 - $31 25 31 20
## 3 \n$22 - $35 an hour $22 - $35 22 35 20
## 4 \n$45 - $70 an hour $45 - $70 45 70 20
## 5 \n$19 - $30 an hour $19 - $30 19 30 20
## 6 \n$19 - $25 an hour $19 - $25 19 25 20
## 7 \n$45 - $60 an hour $45 - $60 45 60 20
## 9 \n$20 - $24 an hour $20 - $24 20 24 20
## 10 \n$20 - $24 an hour $20 - $24 20 24 20
## 11 \n$19 - $25 an hour $19 - $25 19 25 20
## 12 \n$45 - $60 an hour $45 - $60 45 60 20
## 14 \n$20 - $24 an hour $20 - $24 20 24 20
## 15 \n$15 - $21 an hour $15 - $21 15 21 20
## 19 \n$22 - $35 an hour $22 - $35 22 35 20
## 20 \n$45 - $70 an hour $45 - $70 45 70 20
## 21 \n$20 - $24 an hour $20 - $24 20 24 20
## 22 \n$19 - $25 an hour $19 - $25 19 25 20
## 23 \n$45 - $60 an hour $45 - $60 45 60 20
## 25 \n$20 - $24 an hour $20 - $24 20 24 20
## 26 \n$15 - $21 an hour $15 - $21 15 21 20
## 30 \n$22 - $35 an hour $22 - $35 22 35 20
## 31 \n$45 - $70 an hour $45 - $70 45 70 20
## 32 \n$20 - $24 an hour $20 - $24 20 24 20
## 33 \n$19 - $25 an hour $19 - $25 19 25 20
## 34 \n$45 - $60 an hour $45 - $60 45 60 20
## 36 \n$20 - $24 an hour $20 - $24 20 24 20
## 37 \n$15 - $21 an hour $15 - $21 15 21 20
## 40 \n$20 - $24 an hour $20 - $24 20 24 20
## 41 \n$45 - $60 an hour $45 - $60 45 60 20
## 42 \n$19 - $25 an hour $19 - $25 19 25 20
## 44 \n$20 - $24 an hour $20 - $24 20 24 20
## 45 \n$15 - $21 an hour $15 - $21 15 21 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 25 25.96774 35.51613 15 70
## 3 25 25.96774 35.51613 15 70
## 4 25 25.96774 35.51613 15 70
## 5 25 25.96774 35.51613 15 70
## 6 25 25.96774 35.51613 15 70
## 7 25 25.96774 35.51613 15 70
## 9 25 25.96774 35.51613 15 70
## 10 25 25.96774 35.51613 15 70
## 11 25 25.96774 35.51613 15 70
## 12 25 25.96774 35.51613 15 70
## 14 25 25.96774 35.51613 15 70
## 15 25 25.96774 35.51613 15 70
## 19 25 25.96774 35.51613 15 70
## 20 25 25.96774 35.51613 15 70
## 21 25 25.96774 35.51613 15 70
## 22 25 25.96774 35.51613 15 70
## 23 25 25.96774 35.51613 15 70
## 25 25 25.96774 35.51613 15 70
## 26 25 25.96774 35.51613 15 70
## 30 25 25.96774 35.51613 15 70
## 31 25 25.96774 35.51613 15 70
## 32 25 25.96774 35.51613 15 70
## 33 25 25.96774 35.51613 15 70
## 34 25 25.96774 35.51613 15 70
## 36 25 25.96774 35.51613 15 70
## 37 25 25.96774 35.51613 15 70
## 40 25 25.96774 35.51613 15 70
## 41 25 25.96774 35.51613 15 70
## 42 25 25.96774 35.51613 15 70
## 44 25 25.96774 35.51613 15 70
## 45 25 25.96774 35.51613 15 70
##
## [[7]]
## city state jobTitle
## 1 Tucson AZ Licensed Massage Therapist
## 2 Tucson AZ Massage Therapist
## 3 Tucson AZ Licensed Massage Therapist
## 4 Tucson AZ Licensed Massage Therapist (LMT)
## 5 Tucson AZ Massage Therapist - Independent Contractor
## 6 Tucson AZ Massage Therapist (Part- Time
## 7 Tucson AZ Looking For an Amazing Massage Therapist
## 8 Tucson AZ Mobile Massage Therapist
## 9 Tucson AZ Massage Therapist
## 10 Tucson AZ Licensed Massage Therapist
## 11 Tucson AZ Licensed Massage Therapist (LMT)
## 12 Tucson AZ Licensed Massage Therapist, Independent Contractor
## 13 Tucson AZ Licensed Massage Therapist
## 14 Tucson AZ Massage Therapist Tucson, Wilmot & Broadway Location
## 15 Tucson AZ Licensed Massage Therapist
## 16 Tucson AZ Massage Therapist
## 17 Tucson AZ Licensed Massage Therapist
## 18 Tucson AZ Licensed Massage Therapist (LMT)
## 19 Tucson AZ Licensed Massage Therapist
## 20 Tucson AZ Licensed Massage Therapist, Independent Contractor
## 21 Tucson AZ Massage Therapist Tucson, Wilmot & Broadway Location
## 22 Tucson AZ Licensed Massage Therapist
## 23 Tucson AZ Licensed Massage Therapist (Full or Part time)
## 24 Tucson AZ Massage Therapist Tucson Foothills Location
## 25 Tucson AZ Massage Therapist Tucson/Old Spanish Trail Location
## 26 Tucson AZ Licensed Massage Therapist (LMT)
## 27 Tucson AZ Massage Therapist - Independent Contractor
## 28 Tucson AZ Massage Therapist (Part- Time
## 29 Tucson AZ Looking For an Amazing Massage Therapist
## 30 Tucson AZ Mobile Massage Therapist
## 31 Tucson AZ Massage Therapist
## 32 Tucson AZ Licensed Massage Therapist
## 33 Tucson AZ Licensed Massage Therapist (LMT)
## 34 Tucson AZ Licensed Massage Therapist
## 35 Tucson AZ Licensed Massage Therapist, Independent Contractor
## 36 Tucson AZ Massage Therapist Tucson, Wilmot & Broadway Location
## 37 Tucson AZ Licensed Massage Therapist
## 38 Tucson AZ Licensed Massage Therapist (Full or Part time)
## 39 Tucson AZ Massage Therapist Tucson Foothills Location
## 40 Tucson AZ Massage Therapist Tucson/Old Spanish Trail Location
## 41 Tucson AZ Licensed Massage Therapist (LMT)
## 42 Tucson AZ Massage Therapist - Independent Contractor
## 43 Tucson AZ Massage Therapist (Part- Time
## 44 Tucson AZ Looking For an Amazing Massage Therapist
## 45 Tucson AZ Mobile Massage Therapist
## 46 Tucson AZ Massage Therapist
## 47 Tucson AZ Licensed Massage Therapist
## 48 Tucson AZ Licensed Massage Therapist (LMT)
## 49 Tucson AZ Licensed Massage Therapist
## 50 Tucson AZ Licensed Massage Therapist, Independent Contractor
## 51 Tucson AZ Massage Therapist Tucson, Wilmot & Broadway Location
## 52 Tucson AZ Licensed Massage Therapist
## 53 Tucson AZ Licensed Massage Therapist (Full or Part time)
## 54 Tucson AZ Massage Therapist Tucson Foothills Location
## 55 Tucson AZ Massage Therapist Tucson/Old Spanish Trail Location
## 56 Tucson AZ Massage Therapist
## 57 Tucson AZ Licensed Massage Therapist
## 58 Tucson AZ Licensed Massage Therapist, Independent Contractor
## 59 Tucson AZ Licensed Massage Therapist
## 60 Tucson AZ Licensed Massage Therapist (LMT)
## 61 Tucson AZ Massage Therapist Tucson, Wilmot & Broadway Location
## 62 Tucson AZ Licensed Massage Therapist
## 63 Tucson AZ Licensed Massage Therapist (Full or Part time)
## 64 Tucson AZ Massage Therapist Tucson Foothills Location
## 65 Tucson AZ Massage Therapist Tucson/Old Spanish Trail Location
## HiringAgency
## 1 Oro Valley Health and Wellness Chiropractic PCOro Valley, AZ 85737
## 2 Hacienda Del Sol Guest Ranch Resort2.7Tucson, AZ 85718
## 3 Performance Sports TherapyTucson, AZ 85710
## 4 Wellness Clinic4.0Tucson, AZ
## 5 Indo-Pak Massage TherapyTucson, AZ•Remote work available
## 6 Omni Hotels & Resorts3.8Tucson, AZ 85742 (Casas Adobes area)
## 7 MEND Therapeutic Massage and Restorative SkincareCatalina, AZ 85739 (El Conquistador area)
## 8 Indo-Pak Massage TherapyTucson, AZ
## 9 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 10 RUBS MASSAGE STUDIO3.1Tucson, AZ 85704 (Casas Adobes area)+1 location
## 11 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 12 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 13 Massage Envy3.2Wilmot, AZ+2 locations
## 14 Massage Envy3.2Tucson, AZ 85710+1 location
## 15 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 16 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 17 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 18 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 19 Massage Envy3.2Wilmot, AZ+2 locations
## 20 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 21 Massage Envy3.2Tucson, AZ 85710+1 location
## 22 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 23 Fuchsia La EncantadaTucson, AZ 85718
## 24 Massage Envy3.2Tucson, AZ 85718
## 25 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
## 26 Wellness Clinic4.0Tucson, AZ
## 27 Indo-Pak Massage TherapyTucson, AZ•Remote work available
## 28 Omni Hotels & Resorts3.8Tucson, AZ 85742 (Casas Adobes area)
## 29 MEND Therapeutic Massage and Restorative SkincareCatalina, AZ 85739 (El Conquistador area)
## 30 Indo-Pak Massage TherapyTucson, AZ
## 31 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 32 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 33 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 34 Massage Envy3.2Wilmot, AZ+2 locations
## 35 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 36 Massage Envy3.2Tucson, AZ 85710+1 location
## 37 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 38 Fuchsia La EncantadaTucson, AZ 85718
## 39 Massage Envy3.2Tucson, AZ 85718
## 40 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
## 41 Wellness Clinic4.0Tucson, AZ
## 42 Indo-Pak Massage TherapyTucson, AZ•Remote work available
## 43 Omni Hotels & Resorts3.8Tucson, AZ 85742 (Casas Adobes area)
## 44 MEND Therapeutic Massage and Restorative SkincareCatalina, AZ 85739 (El Conquistador area)
## 45 Indo-Pak Massage TherapyTucson, AZ
## 46 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 47 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 48 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 49 Massage Envy3.2Wilmot, AZ+2 locations
## 50 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 51 Massage Envy3.2Tucson, AZ 85710+1 location
## 52 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 53 Fuchsia La EncantadaTucson, AZ 85718
## 54 Massage Envy3.2Tucson, AZ 85718
## 55 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
## 56 WTS International3.3Tucson, AZ 85704 (Casas Adobes area)
## 57 Rubs Massage StudioOro Valley, AZ 85737+1 location
## 58 The Right Touch Massage TherapyTucson, AZ 85716 (La Madera area)
## 59 Massage Envy3.2Wilmot, AZ+2 locations
## 60 RUBS MASSAGE STUDIO at Wrightstown & PantanoTucson, AZ 85715
## 61 Massage Envy3.2Tucson, AZ 85710+1 location
## 62 Precision ChiropracticTucson, AZ 85704 (Casas Adobes area)
## 63 Fuchsia La EncantadaTucson, AZ 85718
## 64 Massage Envy3.2Tucson, AZ 85718
## 65 Massage Envy3.2Tucson, AZ 85748 (Harrison East-South area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 15 70 45000 55000
## 2 17 15 70 45000 55000
## 3 24 15 70 45000 55000
## 4 10 15 70 45000 55000
## 5 30 15 70 45000 55000
## 6 21 15 70 45000 55000
## 7 15 15 70 45000 55000
## 8 30 15 70 45000 55000
## 9 13 15 70 45000 55000
## 10 9 15 70 45000 55000
## 11 30 15 70 45000 55000
## 12 14 15 70 45000 55000
## 13 6 15 70 45000 55000
## 14 30 15 70 45000 55000
## 15 28 15 70 45000 55000
## 16 13 15 70 45000 55000
## 17 27 15 70 45000 55000
## 18 30 15 70 45000 55000
## 19 6 15 70 45000 55000
## 20 14 15 70 45000 55000
## 21 30 15 70 45000 55000
## 22 28 15 70 45000 55000
## 23 30 15 70 45000 55000
## 24 30 15 70 45000 55000
## 25 30 15 70 45000 55000
## 26 10 15 70 45000 55000
## 27 30 15 70 45000 55000
## 28 21 15 70 45000 55000
## 29 15 15 70 45000 55000
## 30 30 15 70 45000 55000
## 31 13 15 70 45000 55000
## 32 27 15 70 45000 55000
## 33 30 15 70 45000 55000
## 34 6 15 70 45000 55000
## 35 14 15 70 45000 55000
## 36 30 15 70 45000 55000
## 37 28 15 70 45000 55000
## 38 30 15 70 45000 55000
## 39 30 15 70 45000 55000
## 40 30 15 70 45000 55000
## 41 10 15 70 45000 55000
## 42 30 15 70 45000 55000
## 43 21 15 70 45000 55000
## 44 15 15 70 45000 55000
## 45 30 15 70 45000 55000
## 46 13 15 70 45000 55000
## 47 27 15 70 45000 55000
## 48 30 15 70 45000 55000
## 49 6 15 70 45000 55000
## 50 14 15 70 45000 55000
## 51 30 15 70 45000 55000
## 52 28 15 70 45000 55000
## 53 30 15 70 45000 55000
## 54 30 15 70 45000 55000
## 55 30 15 70 45000 55000
## 56 13 15 70 45000 55000
## 57 27 15 70 45000 55000
## 58 14 15 70 45000 55000
## 59 6 15 70 45000 55000
## 60 30 15 70 45000 55000
## 61 30 15 70 45000 55000
## 62 28 15 70 45000 55000
## 63 30 15 70 45000 55000
## 64 30 15 70 45000 55000
## 65 30 15 70 45000 55000
There are 65 listings with an hourly pay of 15-70 and a salary of 45k-55k in Tucson.
getIndeedJobData5pages("massage therapist","mesa","AZ")
## Warning in getIndeedJobData5pages("massage therapist", "mesa", "AZ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "mesa", "AZ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "mesa", "AZ"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Chiropractic Assistant/ Massage therapist
## 15 Nail Technicians, Massage Therapists and Registered Nurse In...
## 16 Experienced Massage Therapist LMT
## 17 Massage Therapist - Independent Contractor
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist - Independent Contractor
## 21 Massage Therapist
## 22 Experienced Massage Therapist LMT
## 23 Licensed Massage Therapist
## 24 Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist Job at Elements Massage Scottsdale
## 29 Massage Therapist
## 30 Massage Therapist
## 31 Massage Therapist
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Stretch Practitioner
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Life Spa Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 Salon Massage Therapist
## 41 Massage Therapist
## 42 Massage Therapist
## 43 Licensed Massage Therapist
## 44 Elements Massage Chandler West: Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage therapist
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Massage Therapist Gilbert Location
## 50 Massage Therapist - Independent Contractor
## 51 Event Licensed Massage Therapist (Part Time)
## 52 Salon Massage Therapist
## 53 Massage Therapist
## 54 Licensed Massage Therapist
## 55 Elements Massage Chandler West: Massage Therapist
## 56 Licensed Massage Therapist
## 57 Massage therapist
## 58 Massage Therapist
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Experienced Massage Therapist LMT
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Massage Therapist - Independent Contractor
## 67 Massage Therapist
## 68 Licensed Massage Therapist
## 69 Licensed Massage Therapist- $18-$20 per service hour
## 70 Massage Therapist- PT
## 71 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $30 an hour $20 - $30 20.00 30
## 2 \n$28 an hour $28 28.00 NA
## 3 \n$23 - $26 an hour $23 - $26 23.00 26
## 4 \n$40,000 - $72,000 a year $40000 - $72000 40000.00 72000
## 5 \n$22 - $24 an hour $22 - $24 22.00 24
## 6 \n$18 - $20 an hour $18 - $20 18.00 20
## 7 \n$30 an hour $30 30.00 NA
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 9 \n$50 an hour $50 50.00 NA
## 10 \n$27 - $32 an hour $27 - $32 27.00 32
## 11 \n$62,000 a year $62000 62000.00 NA
## 12 \n$17 - $24 an hour $17 - $24 17.00 24
## 13 \n$20 - $26 an hour $20 - $26 20.00 26
## 14 \n$25 an hour $25 25.00 NA
## 15 \n$40,000 - $72,000 a year $40000 - $72000 40000.00 72000
## 16 \n$22 - $24 an hour $22 - $24 22.00 24
## 17 \n$25 an hour $25 25.00 NA
## 18 \n$28 an hour $28 28.00 NA
## 19 \n$20 - $26 an hour $20 - $26 20.00 26
## 20 \n$23 - $26 an hour $23 - $26 23.00 26
## 21 \n$25,000 - $60,000 a year $25000 - $60000 25000.00 60000
## 22 \n$31.05 - $55.00 an hour $31.05 - $55.00 31.05 55
## 23 \n$62,000 a year $62000 62000.00 NA
## 24 \n$12 - $14 an hour $12 - $14 12.00 14
## 25 \n$30 an hour $30 30.00 NA
## 26 \n$45,000 - $55,000 a year $45000 - $55000 45000.00 55000
## 27 \n$18 - $20 an hour $18 - $20 18.00 20
## 28 \n$20 - $30 an hour $20 - $30 20.00 30
## 29 \n$20 - $25 an hour $20 - $25 20.00 25
## 30 \n$21 an hour $21 21.00 NA
## 31 \n$50,000 - $65,000 a year $50000 - $65000 50000.00 65000
## 32 \n$18 - $35 an hour $18 - $35 18.00 35
## 33 \n$30 an hour $30 30.00 NA
## 34 \n$22 - $25 an hour $22 - $25 22.00 25
## 35 \n$25 an hour $25 25.00 NA
## 36 \n$16 - $24 an hour $16 - $24 16.00 24
## 37 \n$40 - $50 an hour $40 - $50 40.00 50
## 38 \n$45,000 - $55,000 a year $45000 - $55000 45000.00 55000
## 39 \n$19 - $20 an hour $19 - $20 19.00 20
## 40 \n$18 - $35 an hour $18 - $35 18.00 35
## 41 \n$30 an hour $30 30.00 NA
## 42 \n$22 - $25 an hour $22 - $25 22.00 25
## 43 \n$25 an hour $25 25.00 NA
## 44 \n$16 - $24 an hour $16 - $24 16.00 24
## 45 \n$40 - $50 an hour $40 - $50 40.00 50
## 46 \n$22 - $24 an hour $22 - $24 22.00 24
## 47 \n$20 - $26 an hour $20 - $26 20.00 26
## 48 \n$40,000 - $72,000 a year $40000 - $72000 40000.00 72000
## 49 \n$23 - $26 an hour $23 - $26 23.00 26
## 50 \n$18 - $20 an hour $18 - $20 18.00 20
## 51 \n$25 an hour $25 25.00 NA
## 52 \n$28 an hour $28 28.00 NA
## 53 \n$20 - $30 an hour $20 - $30 20.00 30
## 54 \n$16 - $18 an hour ++ $16 - $18 16.00 18
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 24 25 7685.982 9553.011 12
## 2 24 25 7685.982 9553.011 12
## 3 24 25 7685.982 9553.011 12
## 4 24 25 7685.982 9553.011 12
## 5 24 25 7685.982 9553.011 12
## 6 24 25 7685.982 9553.011 12
## 7 24 25 7685.982 9553.011 12
## 8 24 25 7685.982 9553.011 12
## 9 24 25 7685.982 9553.011 12
## 10 24 25 7685.982 9553.011 12
## 11 24 25 7685.982 9553.011 12
## 12 24 25 7685.982 9553.011 12
## 13 24 25 7685.982 9553.011 12
## 14 24 25 7685.982 9553.011 12
## 15 24 25 7685.982 9553.011 12
## 16 24 25 7685.982 9553.011 12
## 17 24 25 7685.982 9553.011 12
## 18 24 25 7685.982 9553.011 12
## 19 24 25 7685.982 9553.011 12
## 20 24 25 7685.982 9553.011 12
## 21 24 25 7685.982 9553.011 12
## 22 24 25 7685.982 9553.011 12
## 23 24 25 7685.982 9553.011 12
## 24 24 25 7685.982 9553.011 12
## 25 24 25 7685.982 9553.011 12
## 26 24 25 7685.982 9553.011 12
## 27 24 25 7685.982 9553.011 12
## 28 24 25 7685.982 9553.011 12
## 29 24 25 7685.982 9553.011 12
## 30 24 25 7685.982 9553.011 12
## 31 24 25 7685.982 9553.011 12
## 32 24 25 7685.982 9553.011 12
## 33 24 25 7685.982 9553.011 12
## 34 24 25 7685.982 9553.011 12
## 35 24 25 7685.982 9553.011 12
## 36 24 25 7685.982 9553.011 12
## 37 24 25 7685.982 9553.011 12
## 38 24 25 7685.982 9553.011 12
## 39 24 25 7685.982 9553.011 12
## 40 24 25 7685.982 9553.011 12
## 41 24 25 7685.982 9553.011 12
## 42 24 25 7685.982 9553.011 12
## 43 24 25 7685.982 9553.011 12
## 44 24 25 7685.982 9553.011 12
## 45 24 25 7685.982 9553.011 12
## 46 24 25 7685.982 9553.011 12
## 47 24 25 7685.982 9553.011 12
## 48 24 25 7685.982 9553.011 12
## 49 24 25 7685.982 9553.011 12
## 50 24 25 7685.982 9553.011 12
## 51 24 25 7685.982 9553.011 12
## 52 24 25 7685.982 9553.011 12
## 53 24 25 7685.982 9553.011 12
## 54 24 25 7685.982 9553.011 12
## maximumMaxSalary
## 1 72000
## 2 72000
## 3 72000
## 4 72000
## 5 72000
## 6 72000
## 7 72000
## 8 72000
## 9 72000
## 10 72000
## 11 72000
## 12 72000
## 13 72000
## 14 72000
## 15 72000
## 16 72000
## 17 72000
## 18 72000
## 19 72000
## 20 72000
## 21 72000
## 22 72000
## 23 72000
## 24 72000
## 25 72000
## 26 72000
## 27 72000
## 28 72000
## 29 72000
## 30 72000
## 31 72000
## 32 72000
## 33 72000
## 34 72000
## 35 72000
## 36 72000
## 37 72000
## 38 72000
## 39 72000
## 40 72000
## 41 72000
## 42 72000
## 43 72000
## 44 72000
## 45 72000
## 46 72000
## 47 72000
## 48 72000
## 49 72000
## 50 72000
## 51 72000
## 52 72000
## 53 72000
## 54 72000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 Just posted
## 4 11
## 5 5
## 6 13
## 7 6
## 8 18
## 9 5
## 10 17
## 11 15
## 12 30
## 13 7
## 14 3
## 15 30
## 16 13
## 17 30
## 18 5
## 19 13
## 20 30
## 21 30
## 22 13
## 23 Just posted
## 24 10
## 25 22
## 26 30
## 27 21
## 28 28
## 29 30
## 30 30
## 31 30
## 32 11
## 33 6
## 34 30
## 35 30
## 36 9
## 37 30
## 38 30
## 39 10
## 40 30
## 41 12
## 42 27
## 43 30
## 44 30
## 45 30
## 46 30
## 47 19
## 48 30
## 49 30
## 50 10
## 51 30
## 52 30
## 53 27
## 54 30
## 55 30
## 56 30
## 57 30
## 58 19
## 59 30
## 60 11
## 61 13
## 62 13
## 63 5
## 64 Just posted
## 65 6
## 66 30
## 67 30
## 68 30
## 69 30
## 70 30
## 71 24
##
## [[4]]
## HiringAgency
## 1 Hand & Stone Massage and Facial- Queen Creek, AZ3.0Queen Creek, AZ 85142
## 2 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 3 Keystone Body TherapiesChandler, AZ 85224
## 4 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 5 Elements Massage3.6Paradise Valley, AZ 85253
## 6 Davis ChiropracticMesa, AZ 85212
## 7 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 8 Friendship Village Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 9 Indo-Pak Massage TherapyMesa, AZ+1 location•Remote work available
## 10 Friendship Village of Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 11 Resilience Massage and WellnessMesa, AZ 85213 (Northgrove area)
## 12 Elements3.6Gilbert, AZ 85295 (Spectrum area)+6 locations
## 13 Rubs of ChandlerMesa, AZ+3 locations
## 14 Advanced Holistic Health CtrChandler, AZ 85226
## 15 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 16 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 17 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 18 Elements Massage3.6Paradise Valley, AZ 85253
## 19 Davis ChiropracticMesa, AZ 85212
## 20 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 21 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 22 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 23 Keystone Body TherapiesChandler, AZ 85224
## 24 Wellness Clinic4.0Scottsdale, AZ
## 25 Elements MassageMesa, AZ+6 locations
## 26 Pinnacle Pain & Spine Consultants PScottsdale, AZ 85260 (North Scottsdale area)
## 27 Lala Luna SpaScottsdale, AZ 85254 (Paradise Valley area)
## 28 Elements3.6Scottsdale, AZ 85254 (North Scottsdale area)
## 29 Stretch U4.0Scottsdale, AZ 85251 (North Scottsdale area)
## 30 The Scottsdale Plaza Resort3.4Scottsdale, AZ 85253
## 31 Massage Envy3.2Mesa, AZ 85202 (Dobson Ranch area)+4 locations
## 32 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 33 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 34 Hand & Stone Massage and Facial- Queen Creek, AZ3.0Queen Creek, AZ 85142
## 35 Stretch Zone2.7Mesa, AZ 85215 (Northeast area)+2 locations
## 36 Mary Lynn's Massage and Day SpaParadise Valley, AZ 85253
## 37 Babymoon Inn4.0Phoenix, AZ 85012 (Alhambra area)
## 38 Life Time3.6Phoenix, AZ 85054 (Desert View area)
## 39 Green leaf body and foot massageGilbert, AZ
## 40 JCPenney3.7Mesa, AZ 85206 (Southeast area)
## 41 Maaly TeamScottsdale, AZ 85260 (North Scottsdale area)
## 42 Fuchsia Spa-High StreetPhoenix, AZ 85054 (Desert View area)
## 43 Maaly ManagementMesa, AZ 85205 (Northeast area)+1 location
## 44 Elements3.6Chandler, AZ 85226
## 45 Bodisense Skincare and MassageScottsdale, AZ 85253 (North Scottsdale area)
## 46 New Serenity Spa4.3Scottsdale, AZ 85260 (North Scottsdale area)
## 47 MassageLuXe3.0Chandler, AZ 85249
## 48 Hawaiian Experience Spa3.5Scottsdale, AZ 85259 (North Scottsdale area)
## 49 Massage Envy3.2Gilbert, AZ 85234+3 locations
## 50 Green leaf body and foot massageGilbert, AZ
## 51 LifeQuest Physical Medicine and RehabChandler, AZ 85225 (The Provinces area)
## 52 JCPenney3.7Mesa, AZ 85206 (Southeast area)
## 53 Fuchsia Spa-High StreetPhoenix, AZ 85054 (Desert View area)
## 54 Maaly ManagementMesa, AZ 85205 (Northeast area)+1 location
## 55 Elements3.6Chandler, AZ 85226
## 56 Bodisense Skincare and MassageScottsdale, AZ 85253 (North Scottsdale area)
## 57 New Serenity Spa4.3Scottsdale, AZ 85260 (North Scottsdale area)
## 58 MassageLuXe3.0Chandler, AZ 85249
## 59 Hawaiian Experience Spa3.5Scottsdale, AZ 85259 (North Scottsdale area)
## 60 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 61 Davis ChiropracticMesa, AZ 85212
## 62 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 63 Elements Massage3.6Paradise Valley, AZ 85253
## 64 Keystone Body TherapiesChandler, AZ 85224
## 65 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 66 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 67 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 68 Hand & Stone Massage and Facial- Queen Creek, AZ3.0Queen Creek, AZ 85142
## 69 Phoenix Wellness Companies IncorporatedGlendale, AZ 85302
## 70 Massage Envy3.2Scottsdale, AZ 85253 (South Scottsdale area)+1 location
## 71 Soothe3.7Phoenix, AZ
##
## [[5]]
## Salary salary minSalary maxSalary
## 4 \n$40,000 - $72,000 a year $40000 - $72000 40000 72000
## 11 \n$62,000 a year $62000 62000 NA
## 15 \n$40,000 - $72,000 a year $40000 - $72000 40000 72000
## 21 \n$25,000 - $60,000 a year $25000 - $60000 25000 60000
## 23 \n$62,000 a year $62000 62000 NA
## 26 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 31 \n$50,000 - $65,000 a year $50000 - $65000 50000 65000
## 38 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 48 \n$40,000 - $72,000 a year $40000 - $72000 40000 72000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 4 45000 65000 45444.44 64428.57 25000
## 11 45000 65000 45444.44 64428.57 25000
## 15 45000 65000 45444.44 64428.57 25000
## 21 45000 65000 45444.44 64428.57 25000
## 23 45000 65000 45444.44 64428.57 25000
## 26 45000 65000 45444.44 64428.57 25000
## 31 45000 65000 45444.44 64428.57 25000
## 38 45000 65000 45444.44 64428.57 25000
## 48 45000 65000 45444.44 64428.57 25000
## maximumMaxSalary
## 4 72000
## 11 72000
## 15 72000
## 21 72000
## 23 72000
## 26 72000
## 31 72000
## 38 72000
## 48 72000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $30 an hour $20 - $30 20.00 30
## 2 \n$28 an hour $28 28.00 NA
## 3 \n$23 - $26 an hour $23 - $26 23.00 26
## 5 \n$22 - $24 an hour $22 - $24 22.00 24
## 6 \n$18 - $20 an hour $18 - $20 18.00 20
## 7 \n$30 an hour $30 30.00 NA
## 9 \n$50 an hour $50 50.00 NA
## 10 \n$27 - $32 an hour $27 - $32 27.00 32
## 12 \n$17 - $24 an hour $17 - $24 17.00 24
## 13 \n$20 - $26 an hour $20 - $26 20.00 26
## 14 \n$25 an hour $25 25.00 NA
## 16 \n$22 - $24 an hour $22 - $24 22.00 24
## 17 \n$25 an hour $25 25.00 NA
## 18 \n$28 an hour $28 28.00 NA
## 19 \n$20 - $26 an hour $20 - $26 20.00 26
## 20 \n$23 - $26 an hour $23 - $26 23.00 26
## 22 \n$31.05 - $55.00 an hour $31.05 - $55.00 31.05 55
## 24 \n$12 - $14 an hour $12 - $14 12.00 14
## 25 \n$30 an hour $30 30.00 NA
## 27 \n$18 - $20 an hour $18 - $20 18.00 20
## 28 \n$20 - $30 an hour $20 - $30 20.00 30
## 29 \n$20 - $25 an hour $20 - $25 20.00 25
## 30 \n$21 an hour $21 21.00 NA
## 32 \n$18 - $35 an hour $18 - $35 18.00 35
## 33 \n$30 an hour $30 30.00 NA
## 34 \n$22 - $25 an hour $22 - $25 22.00 25
## 35 \n$25 an hour $25 25.00 NA
## 36 \n$16 - $24 an hour $16 - $24 16.00 24
## 37 \n$40 - $50 an hour $40 - $50 40.00 50
## 39 \n$19 - $20 an hour $19 - $20 19.00 20
## 40 \n$18 - $35 an hour $18 - $35 18.00 35
## 41 \n$30 an hour $30 30.00 NA
## 42 \n$22 - $25 an hour $22 - $25 22.00 25
## 43 \n$25 an hour $25 25.00 NA
## 44 \n$16 - $24 an hour $16 - $24 16.00 24
## 45 \n$40 - $50 an hour $40 - $50 40.00 50
## 46 \n$22 - $24 an hour $22 - $24 22.00 24
## 47 \n$20 - $26 an hour $20 - $26 20.00 26
## 49 \n$23 - $26 an hour $23 - $26 23.00 26
## 50 \n$18 - $20 an hour $18 - $20 18.00 20
## 51 \n$25 an hour $25 25.00 NA
## 52 \n$28 an hour $28 28.00 NA
## 53 \n$20 - $30 an hour $20 - $30 20.00 30
## 54 \n$16 - $18 an hour ++ $16 - $18 16.00 18
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22 25.5 23.70568 27.8 12
## 2 22 25.5 23.70568 27.8 12
## 3 22 25.5 23.70568 27.8 12
## 5 22 25.5 23.70568 27.8 12
## 6 22 25.5 23.70568 27.8 12
## 7 22 25.5 23.70568 27.8 12
## 9 22 25.5 23.70568 27.8 12
## 10 22 25.5 23.70568 27.8 12
## 12 22 25.5 23.70568 27.8 12
## 13 22 25.5 23.70568 27.8 12
## 14 22 25.5 23.70568 27.8 12
## 16 22 25.5 23.70568 27.8 12
## 17 22 25.5 23.70568 27.8 12
## 18 22 25.5 23.70568 27.8 12
## 19 22 25.5 23.70568 27.8 12
## 20 22 25.5 23.70568 27.8 12
## 22 22 25.5 23.70568 27.8 12
## 24 22 25.5 23.70568 27.8 12
## 25 22 25.5 23.70568 27.8 12
## 27 22 25.5 23.70568 27.8 12
## 28 22 25.5 23.70568 27.8 12
## 29 22 25.5 23.70568 27.8 12
## 30 22 25.5 23.70568 27.8 12
## 32 22 25.5 23.70568 27.8 12
## 33 22 25.5 23.70568 27.8 12
## 34 22 25.5 23.70568 27.8 12
## 35 22 25.5 23.70568 27.8 12
## 36 22 25.5 23.70568 27.8 12
## 37 22 25.5 23.70568 27.8 12
## 39 22 25.5 23.70568 27.8 12
## 40 22 25.5 23.70568 27.8 12
## 41 22 25.5 23.70568 27.8 12
## 42 22 25.5 23.70568 27.8 12
## 43 22 25.5 23.70568 27.8 12
## 44 22 25.5 23.70568 27.8 12
## 45 22 25.5 23.70568 27.8 12
## 46 22 25.5 23.70568 27.8 12
## 47 22 25.5 23.70568 27.8 12
## 49 22 25.5 23.70568 27.8 12
## 50 22 25.5 23.70568 27.8 12
## 51 22 25.5 23.70568 27.8 12
## 52 22 25.5 23.70568 27.8 12
## 53 22 25.5 23.70568 27.8 12
## 54 22 25.5 23.70568 27.8 12
## maximumMaxSalary
## 1 55
## 2 55
## 3 55
## 5 55
## 6 55
## 7 55
## 9 55
## 10 55
## 12 55
## 13 55
## 14 55
## 16 55
## 17 55
## 18 55
## 19 55
## 20 55
## 22 55
## 24 55
## 25 55
## 27 55
## 28 55
## 29 55
## 30 55
## 32 55
## 33 55
## 34 55
## 35 55
## 36 55
## 37 55
## 39 55
## 40 55
## 41 55
## 42 55
## 43 55
## 44 55
## 45 55
## 46 55
## 47 55
## 49 55
## 50 55
## 51 55
## 52 55
## 53 55
## 54 55
##
## [[7]]
## city state jobTitle
## 1 mesa AZ Licensed Massage Therapist
## 2 mesa AZ Massage Therapist
## 3 mesa AZ Licensed Massage Therapist
## 4 mesa AZ Licensed Massage Therapist
## 5 mesa AZ Licensed Massage Therapist
## 6 mesa AZ Licensed Massage Therapist
## 7 mesa AZ Licensed Massage Therapist
## 8 mesa AZ Massage Therapist
## 9 mesa AZ Massage Therapist - Independent Contractor
## 10 mesa AZ Massage Therapist
## 11 mesa AZ Licensed Massage Therapist
## 12 mesa AZ Massage Therapist
## 13 mesa AZ Massage Therapist
## 14 mesa AZ Chiropractic Assistant/ Massage therapist
## 15 mesa AZ Nail Technicians, Massage Therapists and Registered Nurse In...
## 16 mesa AZ Experienced Massage Therapist LMT
## 17 mesa AZ Massage Therapist - Independent Contractor
## 18 mesa AZ Licensed Massage Therapist
## 19 mesa AZ Licensed Massage Therapist
## 20 mesa AZ Massage Therapist - Independent Contractor
## 21 mesa AZ Massage Therapist
## 22 mesa AZ Experienced Massage Therapist LMT
## 23 mesa AZ Licensed Massage Therapist
## 24 mesa AZ Massage Therapist
## 25 mesa AZ Massage Therapist
## 26 mesa AZ Massage Therapist
## 27 mesa AZ Licensed Massage Therapist
## 28 mesa AZ Massage Therapist Job at Elements Massage Scottsdale
## 29 mesa AZ Massage Therapist
## 30 mesa AZ Massage Therapist
## 31 mesa AZ Massage Therapist
## 32 mesa AZ Licensed Massage Therapist
## 33 mesa AZ Licensed Massage Therapist
## 34 mesa AZ Licensed Massage Therapist
## 35 mesa AZ Stretch Practitioner
## 36 mesa AZ Licensed Massage Therapist
## 37 mesa AZ Licensed Massage Therapist
## 38 mesa AZ Life Spa Massage Therapist
## 39 mesa AZ Massage Therapist - Independent Contractor
## 40 mesa AZ Salon Massage Therapist
## 41 mesa AZ Massage Therapist
## 42 mesa AZ Massage Therapist
## 43 mesa AZ Licensed Massage Therapist
## 44 mesa AZ Elements Massage Chandler West: Massage Therapist
## 45 mesa AZ Licensed Massage Therapist
## 46 mesa AZ Massage therapist
## 47 mesa AZ Massage Therapist
## 48 mesa AZ Licensed Massage Therapist
## 49 mesa AZ Massage Therapist Gilbert Location
## 50 mesa AZ Massage Therapist - Independent Contractor
## 51 mesa AZ Event Licensed Massage Therapist (Part Time)
## 52 mesa AZ Salon Massage Therapist
## 53 mesa AZ Massage Therapist
## 54 mesa AZ Licensed Massage Therapist
## 55 mesa AZ Elements Massage Chandler West: Massage Therapist
## 56 mesa AZ Licensed Massage Therapist
## 57 mesa AZ Massage therapist
## 58 mesa AZ Massage Therapist
## 59 mesa AZ Licensed Massage Therapist
## 60 mesa AZ Licensed Massage Therapist
## 61 mesa AZ Licensed Massage Therapist
## 62 mesa AZ Experienced Massage Therapist LMT
## 63 mesa AZ Licensed Massage Therapist
## 64 mesa AZ Licensed Massage Therapist
## 65 mesa AZ Licensed Massage Therapist
## 66 mesa AZ Massage Therapist - Independent Contractor
## 67 mesa AZ Massage Therapist
## 68 mesa AZ Licensed Massage Therapist
## 69 mesa AZ Licensed Massage Therapist- $18-$20 per service hour
## 70 mesa AZ Massage Therapist- PT
## 71 mesa AZ Licensed Massage Therapist
## HiringAgency
## 1 Hand & Stone Massage and Facial- Queen Creek, AZ3.0Queen Creek, AZ 85142
## 2 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 3 Keystone Body TherapiesChandler, AZ 85224
## 4 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 5 Elements Massage3.6Paradise Valley, AZ 85253
## 6 Davis ChiropracticMesa, AZ 85212
## 7 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 8 Friendship Village Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 9 Indo-Pak Massage TherapyMesa, AZ+1 location•Remote work available
## 10 Friendship Village of Tempe4.1Tempe, AZ 85282 (Cyprus Southwest area)
## 11 Resilience Massage and WellnessMesa, AZ 85213 (Northgrove area)
## 12 Elements3.6Gilbert, AZ 85295 (Spectrum area)+6 locations
## 13 Rubs of ChandlerMesa, AZ+3 locations
## 14 Advanced Holistic Health CtrChandler, AZ 85226
## 15 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 16 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 17 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 18 Elements Massage3.6Paradise Valley, AZ 85253
## 19 Davis ChiropracticMesa, AZ 85212
## 20 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 21 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 22 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 23 Keystone Body TherapiesChandler, AZ 85224
## 24 Wellness Clinic4.0Scottsdale, AZ
## 25 Elements MassageMesa, AZ+6 locations
## 26 Pinnacle Pain & Spine Consultants PScottsdale, AZ 85260 (North Scottsdale area)
## 27 Lala Luna SpaScottsdale, AZ 85254 (Paradise Valley area)
## 28 Elements3.6Scottsdale, AZ 85254 (North Scottsdale area)
## 29 Stretch U4.0Scottsdale, AZ 85251 (North Scottsdale area)
## 30 The Scottsdale Plaza Resort3.4Scottsdale, AZ 85253
## 31 Massage Envy3.2Mesa, AZ 85202 (Dobson Ranch area)+4 locations
## 32 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 33 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 34 Hand & Stone Massage and Facial- Queen Creek, AZ3.0Queen Creek, AZ 85142
## 35 Stretch Zone2.7Mesa, AZ 85215 (Northeast area)+2 locations
## 36 Mary Lynn's Massage and Day SpaParadise Valley, AZ 85253
## 37 Babymoon Inn4.0Phoenix, AZ 85012 (Alhambra area)
## 38 Life Time3.6Phoenix, AZ 85054 (Desert View area)
## 39 Green leaf body and foot massageGilbert, AZ
## 40 JCPenney3.7Mesa, AZ 85206 (Southeast area)
## 41 Maaly TeamScottsdale, AZ 85260 (North Scottsdale area)
## 42 Fuchsia Spa-High StreetPhoenix, AZ 85054 (Desert View area)
## 43 Maaly ManagementMesa, AZ 85205 (Northeast area)+1 location
## 44 Elements3.6Chandler, AZ 85226
## 45 Bodisense Skincare and MassageScottsdale, AZ 85253 (North Scottsdale area)
## 46 New Serenity Spa4.3Scottsdale, AZ 85260 (North Scottsdale area)
## 47 MassageLuXe3.0Chandler, AZ 85249
## 48 Hawaiian Experience Spa3.5Scottsdale, AZ 85259 (North Scottsdale area)
## 49 Massage Envy3.2Gilbert, AZ 85234+3 locations
## 50 Green leaf body and foot massageGilbert, AZ
## 51 LifeQuest Physical Medicine and RehabChandler, AZ 85225 (The Provinces area)
## 52 JCPenney3.7Mesa, AZ 85206 (Southeast area)
## 53 Fuchsia Spa-High StreetPhoenix, AZ 85054 (Desert View area)
## 54 Maaly ManagementMesa, AZ 85205 (Northeast area)+1 location
## 55 Elements3.6Chandler, AZ 85226
## 56 Bodisense Skincare and MassageScottsdale, AZ 85253 (North Scottsdale area)
## 57 New Serenity Spa4.3Scottsdale, AZ 85260 (North Scottsdale area)
## 58 MassageLuXe3.0Chandler, AZ 85249
## 59 Hawaiian Experience Spa3.5Scottsdale, AZ 85259 (North Scottsdale area)
## 60 Hand & Stone Massage and Facial Spa3.0Gilbert, AZ 85295
## 61 Davis ChiropracticMesa, AZ 85212
## 62 Chiropractic OfficeTempe, AZ 85282 (Meyer Park area)
## 63 Elements Massage3.6Paradise Valley, AZ 85253
## 64 Keystone Body TherapiesChandler, AZ 85224
## 65 The Hills Salon & SpaScottsdale, AZ 85255 (North Scottsdale area)
## 66 Precision Physical Therapy and Sports MedicineTempe, AZ 85282 (Brentwood-Cavalier area)
## 67 AZ SpineMesa, AZ 85204 (Summer Place Village area)
## 68 Hand & Stone Massage and Facial- Queen Creek, AZ3.0Queen Creek, AZ 85142
## 69 Phoenix Wellness Companies IncorporatedGlendale, AZ 85302
## 70 Massage Envy3.2Scottsdale, AZ 85253 (South Scottsdale area)+1 location
## 71 Soothe3.7Phoenix, AZ
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 12 55 25000 72000
## 2 30 12 55 25000 72000
## 3 Just posted 12 55 25000 72000
## 4 11 12 55 25000 72000
## 5 5 12 55 25000 72000
## 6 13 12 55 25000 72000
## 7 6 12 55 25000 72000
## 8 18 12 55 25000 72000
## 9 5 12 55 25000 72000
## 10 17 12 55 25000 72000
## 11 15 12 55 25000 72000
## 12 30 12 55 25000 72000
## 13 7 12 55 25000 72000
## 14 3 12 55 25000 72000
## 15 30 12 55 25000 72000
## 16 13 12 55 25000 72000
## 17 30 12 55 25000 72000
## 18 5 12 55 25000 72000
## 19 13 12 55 25000 72000
## 20 30 12 55 25000 72000
## 21 30 12 55 25000 72000
## 22 13 12 55 25000 72000
## 23 Just posted 12 55 25000 72000
## 24 10 12 55 25000 72000
## 25 22 12 55 25000 72000
## 26 30 12 55 25000 72000
## 27 21 12 55 25000 72000
## 28 28 12 55 25000 72000
## 29 30 12 55 25000 72000
## 30 30 12 55 25000 72000
## 31 30 12 55 25000 72000
## 32 11 12 55 25000 72000
## 33 6 12 55 25000 72000
## 34 30 12 55 25000 72000
## 35 30 12 55 25000 72000
## 36 9 12 55 25000 72000
## 37 30 12 55 25000 72000
## 38 30 12 55 25000 72000
## 39 10 12 55 25000 72000
## 40 30 12 55 25000 72000
## 41 12 12 55 25000 72000
## 42 27 12 55 25000 72000
## 43 30 12 55 25000 72000
## 44 30 12 55 25000 72000
## 45 30 12 55 25000 72000
## 46 30 12 55 25000 72000
## 47 19 12 55 25000 72000
## 48 30 12 55 25000 72000
## 49 30 12 55 25000 72000
## 50 10 12 55 25000 72000
## 51 30 12 55 25000 72000
## 52 30 12 55 25000 72000
## 53 27 12 55 25000 72000
## 54 30 12 55 25000 72000
## 55 30 12 55 25000 72000
## 56 30 12 55 25000 72000
## 57 30 12 55 25000 72000
## 58 19 12 55 25000 72000
## 59 30 12 55 25000 72000
## 60 11 12 55 25000 72000
## 61 13 12 55 25000 72000
## 62 13 12 55 25000 72000
## 63 5 12 55 25000 72000
## 64 Just posted 12 55 25000 72000
## 65 6 12 55 25000 72000
## 66 30 12 55 25000 72000
## 67 30 12 55 25000 72000
## 68 30 12 55 25000 72000
## 69 30 12 55 25000 72000
## 70 30 12 55 25000 72000
## 71 24 12 55 25000 72000
Mesa has 67 listings with an hourly of 16-70 and salary of 25k-72k.
Arkansas Little Rock, Fayetteville, Fort Smith
getIndeedJobData5pages("massage therapist","little rock","AR")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist ($300-500 signing bonus)
## 2 Massage Therapist - Independent Contractor
## 3 Stretch Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist Full Time
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Full-time Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Stretch Therapist
## 13 Massage Therapist
## 14 Massage Therapist Full Time
## 15 Licensed Massage Therapist (LMT)
## 16 Licensed Massage Therapist
## 17 Full-time Licensed Massage Therapist
## 18 Licensed Massage Therapist ($300-500 signing bonus)
## 19 Licensed Massage Therapist ($300-500 signing bonus)
## 20 Massage Therapist - Independent Contractor
## 21 Stretch Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist Full Time
## 25 Licensed Massage Therapist (LMT)
## 26 Licensed Massage Therapist
## 27 Full-time Licensed Massage Therapist
## 28 Licensed Massage Therapist ($300-500 signing bonus)
## 29 Massage Therapist - Independent Contractor
## 30 Stretch Therapist
## 31 Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapist Full Time
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist
## 36 Full-time Licensed Massage Therapist
## 37 Licensed Massage Therapist ($300-500 signing bonus)
## 38 Massage Therapist - Independent Contractor
## 39 Stretch Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist
## 42 Massage Therapist Full Time
## 43 Licensed Massage Therapist (LMT)
## 44 Licensed Massage Therapist
## 45 Full-time Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 3 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 4 \n$20 - $23 an hour $20 - $23 20 23
## 5 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 8 \n$20 - $23 an hour $20 - $23 20 23
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 11 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 12 \n$20 - $23 an hour $20 - $23 20 23
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 15 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 16 \n$20 - $23 an hour $20 - $23 20 23
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 19 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 20 \n$20 - $23 an hour $20 - $23 20 23
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 20000 23500 19289.5 23004.38 20
## 2 20000 23500 19289.5 23004.38 20
## 3 20000 23500 19289.5 23004.38 20
## 4 20000 23500 19289.5 23004.38 20
## 5 20000 23500 19289.5 23004.38 20
## 6 20000 23500 19289.5 23004.38 20
## 7 20000 23500 19289.5 23004.38 20
## 8 20000 23500 19289.5 23004.38 20
## 9 20000 23500 19289.5 23004.38 20
## 10 20000 23500 19289.5 23004.38 20
## 11 20000 23500 19289.5 23004.38 20
## 12 20000 23500 19289.5 23004.38 20
## 13 20000 23500 19289.5 23004.38 20
## 14 20000 23500 19289.5 23004.38 20
## 15 20000 23500 19289.5 23004.38 20
## 16 20000 23500 19289.5 23004.38 20
## 17 20000 23500 19289.5 23004.38 20
## 18 20000 23500 19289.5 23004.38 20
## 19 20000 23500 19289.5 23004.38 20
## 20 20000 23500 19289.5 23004.38 20
## maximumMaxSalary
## 1 50000
## 2 50000
## 3 50000
## 4 50000
## 5 50000
## 6 50000
## 7 50000
## 8 50000
## 9 50000
## 10 50000
## 11 50000
## 12 50000
## 13 50000
## 14 50000
## 15 50000
## 16 50000
## 17 50000
## 18 50000
## 19 50000
## 20 50000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 5
## 3 2
## 4 1
## 5 30
## 6 Today
## 7 11
## 8 22
## 9 30
## 10 1
## 11 5
## 12 2
## 13 30
## 14 Today
## 15 11
## 16 22
## 17 30
## 18 30
## 19 30
## 20 5
## 21 2
## 22 30
## 23 1
## 24 Today
## 25 11
## 26 22
## 27 30
## 28 30
## 29 5
## 30 2
## 31 30
## 32 1
## 33 Today
## 34 11
## 35 22
## 36 30
## 37 30
## 38 5
## 39 2
## 40 1
## 41 30
## 42 Today
## 43 11
## 44 22
## 45 30
##
## [[4]]
## HiringAgency
## 1 Massage Envy/ConwayConway, AR 72032
## 2 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 3 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 4 THE SPA'AH LLC5.0Conway, AR 72032
## 5 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 6 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 7 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 8 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 9 Massage Envy3.2Conway, AR 72032
## 10 THE SPA'AH LLC5.0Conway, AR 72032
## 11 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 12 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 13 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 14 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 15 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 16 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 17 Massage Envy3.2Conway, AR 72032
## 18 Massage Envy/ConwayConway, AR 72032
## 19 Massage Envy/ConwayConway, AR 72032
## 20 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 21 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 22 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 23 THE SPA'AH LLC5.0Conway, AR 72032
## 24 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 25 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 26 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 27 Massage Envy3.2Conway, AR 72032
## 28 Massage Envy/ConwayConway, AR 72032
## 29 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 30 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 31 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 32 THE SPA'AH LLC5.0Conway, AR 72032
## 33 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 34 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 35 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 36 Massage Envy3.2Conway, AR 72032
## 37 Massage Envy/ConwayConway, AR 72032
## 38 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 39 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 40 THE SPA'AH LLC5.0Conway, AR 72032
## 41 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 42 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 43 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 44 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 45 Massage Envy3.2Conway, AR 72032
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 3 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 5 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 7 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 10 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 11 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 14 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 15 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## 18 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 19 \n$37,138 - $44,854 a year $37138 - $44854 37138 44854
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 36069 47427 36069 47427 35000
## 3 36069 47427 36069 47427 35000
## 5 36069 47427 36069 47427 35000
## 7 36069 47427 36069 47427 35000
## 10 36069 47427 36069 47427 35000
## 11 36069 47427 36069 47427 35000
## 14 36069 47427 36069 47427 35000
## 15 36069 47427 36069 47427 35000
## 18 36069 47427 36069 47427 35000
## 19 36069 47427 36069 47427 35000
## maximumMaxSalary
## 2 50000
## 3 50000
## 5 50000
## 7 50000
## 10 50000
## 11 50000
## 14 50000
## 15 50000
## 18 50000
## 19 50000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 4 \n$20 - $23 an hour $20 - $23 20 23 20
## 8 \n$20 - $23 an hour $20 - $23 20 23 20
## 12 \n$20 - $23 an hour $20 - $23 20 23 20
## 16 \n$20 - $23 an hour $20 - $23 20 23 20
## 20 \n$20 - $23 an hour $20 - $23 20 23 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 4 23 20 23 20 23
## 8 23 20 23 20 23
## 12 23 20 23 20 23
## 16 23 20 23 20 23
## 20 23 20 23 20 23
##
## [[7]]
## city state jobTitle
## 1 little rock AR Licensed Massage Therapist ($300-500 signing bonus)
## 2 little rock AR Massage Therapist - Independent Contractor
## 3 little rock AR Stretch Therapist
## 4 little rock AR Licensed Massage Therapist
## 5 little rock AR Massage Therapist
## 6 little rock AR Massage Therapist Full Time
## 7 little rock AR Licensed Massage Therapist (LMT)
## 8 little rock AR Licensed Massage Therapist
## 9 little rock AR Full-time Licensed Massage Therapist
## 10 little rock AR Licensed Massage Therapist
## 11 little rock AR Massage Therapist - Independent Contractor
## 12 little rock AR Stretch Therapist
## 13 little rock AR Massage Therapist
## 14 little rock AR Massage Therapist Full Time
## 15 little rock AR Licensed Massage Therapist (LMT)
## 16 little rock AR Licensed Massage Therapist
## 17 little rock AR Full-time Licensed Massage Therapist
## 18 little rock AR Licensed Massage Therapist ($300-500 signing bonus)
## 19 little rock AR Licensed Massage Therapist ($300-500 signing bonus)
## 20 little rock AR Massage Therapist - Independent Contractor
## 21 little rock AR Stretch Therapist
## 22 little rock AR Massage Therapist
## 23 little rock AR Licensed Massage Therapist
## 24 little rock AR Massage Therapist Full Time
## 25 little rock AR Licensed Massage Therapist (LMT)
## 26 little rock AR Licensed Massage Therapist
## 27 little rock AR Full-time Licensed Massage Therapist
## 28 little rock AR Licensed Massage Therapist ($300-500 signing bonus)
## 29 little rock AR Massage Therapist - Independent Contractor
## 30 little rock AR Stretch Therapist
## 31 little rock AR Massage Therapist
## 32 little rock AR Licensed Massage Therapist
## 33 little rock AR Massage Therapist Full Time
## 34 little rock AR Licensed Massage Therapist (LMT)
## 35 little rock AR Licensed Massage Therapist
## 36 little rock AR Full-time Licensed Massage Therapist
## 37 little rock AR Licensed Massage Therapist ($300-500 signing bonus)
## 38 little rock AR Massage Therapist - Independent Contractor
## 39 little rock AR Stretch Therapist
## 40 little rock AR Licensed Massage Therapist
## 41 little rock AR Massage Therapist
## 42 little rock AR Massage Therapist Full Time
## 43 little rock AR Licensed Massage Therapist (LMT)
## 44 little rock AR Licensed Massage Therapist
## 45 little rock AR Full-time Licensed Massage Therapist
## HiringAgency
## 1 Massage Envy/ConwayConway, AR 72032
## 2 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 3 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 4 THE SPA'AH LLC5.0Conway, AR 72032
## 5 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 6 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 7 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 8 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 9 Massage Envy3.2Conway, AR 72032
## 10 THE SPA'AH LLC5.0Conway, AR 72032
## 11 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 12 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 13 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 14 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 15 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 16 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 17 Massage Envy3.2Conway, AR 72032
## 18 Massage Envy/ConwayConway, AR 72032
## 19 Massage Envy/ConwayConway, AR 72032
## 20 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 21 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 22 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 23 THE SPA'AH LLC5.0Conway, AR 72032
## 24 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 25 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 26 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 27 Massage Envy3.2Conway, AR 72032
## 28 Massage Envy/ConwayConway, AR 72032
## 29 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 30 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 31 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 32 THE SPA'AH LLC5.0Conway, AR 72032
## 33 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 34 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 35 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 36 Massage Envy3.2Conway, AR 72032
## 37 Massage Envy/ConwayConway, AR 72032
## 38 Indo-Pak Massage TherapyLittle Rock, AR•Remote work available
## 39 Restore Health HoldingsLittle Rock, AR 72212 (River Mountain area)
## 40 THE SPA'AH LLC5.0Conway, AR 72032
## 41 Blackmon Chiropractic ClinicLittle Rock, AR 72207
## 42 Massage Envy3.2Little Rock, AR 72205 (Hillcrest area)
## 43 Copper Well RetreatLittle Rock, AR 72223 (River Mountain area)
## 44 Trinity Massage and SpaSherwood, AR 72116+4 locations
## 45 Massage Envy3.2Conway, AR 72032
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 20 23 35000 50000
## 2 5 20 23 35000 50000
## 3 2 20 23 35000 50000
## 4 1 20 23 35000 50000
## 5 30 20 23 35000 50000
## 6 Today 20 23 35000 50000
## 7 11 20 23 35000 50000
## 8 22 20 23 35000 50000
## 9 30 20 23 35000 50000
## 10 1 20 23 35000 50000
## 11 5 20 23 35000 50000
## 12 2 20 23 35000 50000
## 13 30 20 23 35000 50000
## 14 Today 20 23 35000 50000
## 15 11 20 23 35000 50000
## 16 22 20 23 35000 50000
## 17 30 20 23 35000 50000
## 18 30 20 23 35000 50000
## 19 30 20 23 35000 50000
## 20 5 20 23 35000 50000
## 21 2 20 23 35000 50000
## 22 30 20 23 35000 50000
## 23 1 20 23 35000 50000
## 24 Today 20 23 35000 50000
## 25 11 20 23 35000 50000
## 26 22 20 23 35000 50000
## 27 30 20 23 35000 50000
## 28 30 20 23 35000 50000
## 29 5 20 23 35000 50000
## 30 2 20 23 35000 50000
## 31 30 20 23 35000 50000
## 32 1 20 23 35000 50000
## 33 Today 20 23 35000 50000
## 34 11 20 23 35000 50000
## 35 22 20 23 35000 50000
## 36 30 20 23 35000 50000
## 37 30 20 23 35000 50000
## 38 5 20 23 35000 50000
## 39 2 20 23 35000 50000
## 40 1 20 23 35000 50000
## 41 30 20 23 35000 50000
## 42 Today 20 23 35000 50000
## 43 11 20 23 35000 50000
## 44 22 20 23 35000 50000
## 45 30 20 23 35000 50000
getIndeedJobData5pages("massage therapist","fayetteville","AR")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist - Independent Contractor
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Massage Therapist - Independent Contractor
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5000 8500 5000 8500 5000
## 2 5000 8500 5000 8500 5000
## 3 5000 8500 5000 8500 5000
## 4 5000 8500 5000 8500 5000
## 5 5000 8500 5000 8500 5000
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 5
## 3 30
## 4 28
## 5 30
## 6 5
## 7 30
## 8 28
## 9 30
## 10 30
## 11 5
## 12 30
## 13 28
## 14 30
## 15 30
## 16 5
## 17 30
## 18 28
## 19 30
## 20 30
## 21 5
## 22 30
## 23 28
## 24 30
## 25 30
##
## [[4]]
## HiringAgency
## 1 LaVida Massage3.7Bentonville, AR 72713
## 2 Indo-Pak Massage TherapyBentonville, AR•Remote work available
## 3 Fayetteville Athletic Club2.8Fayetteville, AR 72703
## 4 Revive Medical Spa, LLCFayetteville, AR 72703
## 5 Massage Envy3.2Fayetteville, AR 72703+1 location
## 6 Indo-Pak Massage TherapyBentonville, AR•Remote work available
## 7 Fayetteville Athletic Club2.8Fayetteville, AR 72703
## 8 Revive Medical Spa, LLCFayetteville, AR 72703
## 9 LaVida Massage3.7Bentonville, AR 72713
## 10 Massage Envy3.2Fayetteville, AR 72703+1 location
## 11 Indo-Pak Massage TherapyBentonville, AR•Remote work available
## 12 Fayetteville Athletic Club2.8Fayetteville, AR 72703
## 13 Revive Medical Spa, LLCFayetteville, AR 72703
## 14 LaVida Massage3.7Bentonville, AR 72713
## 15 Massage Envy3.2Fayetteville, AR 72703+1 location
## 16 Indo-Pak Massage TherapyBentonville, AR•Remote work available
## 17 Fayetteville Athletic Club2.8Fayetteville, AR 72703
## 18 Revive Medical Spa, LLCFayetteville, AR 72703
## 19 LaVida Massage3.7Bentonville, AR 72713
## 20 Massage Envy3.2Fayetteville, AR 72703+1 location
## 21 Indo-Pak Massage TherapyBentonville, AR•Remote work available
## 22 Fayetteville Athletic Club2.8Fayetteville, AR 72703
## 23 Revive Medical Spa, LLCFayetteville, AR 72703
## 24 LaVida Massage3.7Bentonville, AR 72713
## 25 Massage Envy3.2Fayetteville, AR 72703+1 location
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 fayetteville AR Licensed Massage Therapist
## 2 fayetteville AR Massage Therapist - Independent Contractor
## 3 fayetteville AR Massage Therapist
## 4 fayetteville AR Licensed Massage Therapist
## 5 fayetteville AR Massage Therapist
## 6 fayetteville AR Massage Therapist - Independent Contractor
## 7 fayetteville AR Massage Therapist
## 8 fayetteville AR Licensed Massage Therapist
## 9 fayetteville AR Licensed Massage Therapist
## 10 fayetteville AR Massage Therapist
## 11 fayetteville AR Massage Therapist - Independent Contractor
## 12 fayetteville AR Massage Therapist
## 13 fayetteville AR Licensed Massage Therapist
## 14 fayetteville AR Licensed Massage Therapist
## 15 fayetteville AR Massage Therapist
## 16 fayetteville AR Massage Therapist - Independent Contractor
## 17 fayetteville AR Massage Therapist
## 18 fayetteville AR Licensed Massage Therapist
## 19 fayetteville AR Licensed Massage Therapist
## 20 fayetteville AR Massage Therapist
## 21 fayetteville AR Massage Therapist - Independent Contractor
## 22 fayetteville AR Massage Therapist
## 23 fayetteville AR Licensed Massage Therapist
## 24 fayetteville AR Licensed Massage Therapist
## 25 fayetteville AR Massage Therapist
## HiringAgency date_daysAgo
## 1 LaVida Massage3.7Bentonville, AR 72713 30
## 2 Indo-Pak Massage TherapyBentonville, AR•Remote work available 5
## 3 Fayetteville Athletic Club2.8Fayetteville, AR 72703 30
## 4 Revive Medical Spa, LLCFayetteville, AR 72703 28
## 5 Massage Envy3.2Fayetteville, AR 72703+1 location 30
## 6 Indo-Pak Massage TherapyBentonville, AR•Remote work available 5
## 7 Fayetteville Athletic Club2.8Fayetteville, AR 72703 30
## 8 Revive Medical Spa, LLCFayetteville, AR 72703 28
## 9 LaVida Massage3.7Bentonville, AR 72713 30
## 10 Massage Envy3.2Fayetteville, AR 72703+1 location 30
## 11 Indo-Pak Massage TherapyBentonville, AR•Remote work available 5
## 12 Fayetteville Athletic Club2.8Fayetteville, AR 72703 30
## 13 Revive Medical Spa, LLCFayetteville, AR 72703 28
## 14 LaVida Massage3.7Bentonville, AR 72713 30
## 15 Massage Envy3.2Fayetteville, AR 72703+1 location 30
## 16 Indo-Pak Massage TherapyBentonville, AR•Remote work available 5
## 17 Fayetteville Athletic Club2.8Fayetteville, AR 72703 30
## 18 Revive Medical Spa, LLCFayetteville, AR 72703 28
## 19 LaVida Massage3.7Bentonville, AR 72713 30
## 20 Massage Envy3.2Fayetteville, AR 72703+1 location 30
## 21 Indo-Pak Massage TherapyBentonville, AR•Remote work available 5
## 22 Fayetteville Athletic Club2.8Fayetteville, AR 72703 30
## 23 Revive Medical Spa, LLCFayetteville, AR 72703 28
## 24 LaVida Massage3.7Bentonville, AR 72713 30
## 25 Massage Envy3.2Fayetteville, AR 72703+1 location 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
## 6 NA NA NA NA
## 7 NA NA NA NA
## 8 NA NA NA NA
## 9 NA NA NA NA
## 10 NA NA NA NA
## 11 NA NA NA NA
## 12 NA NA NA NA
## 13 NA NA NA NA
## 14 NA NA NA NA
## 15 NA NA NA NA
## 16 NA NA NA NA
## 17 NA NA NA NA
## 18 NA NA NA NA
## 19 NA NA NA NA
## 20 NA NA NA NA
## 21 NA NA NA NA
## 22 NA NA NA NA
## 23 NA NA NA NA
## 24 NA NA NA NA
## 25 NA NA NA NA
getIndeedJobData5pages("massage therapist","fort smith","AR")
## [[1]]
## [1] jobTitle
## <0 rows> (or 0-length row.names)
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## [1] date_daysAgo
## <0 rows> (or 0-length row.names)
##
## [[4]]
## [1] HiringAgency
## <0 rows> (or 0-length row.names)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## [1] city state jobTitle HiringAgency
## [5] date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary
## [9] MaxAnnualSalary
## <0 rows> (or 0-length row.names)
California Los Angeles, San Diego, San JOse
getIndeedJobData5pages("massage therapist","Los Angeles","CA")
## Warning in getIndeedJobData5pages("massage therapist", "Los Angeles", "CA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Los Angeles", "CA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 3 Massage Therapist
## 4 Massage Therapist (soft tissue specialist) chiropractic offi...
## 5 Sport Massage Therapist. Myofacial Release Therapist. FMS Ex...
## 6 Full Time License Massage Therapist Ready to work tomorrow
## 7 Certified Massage Therapist
## 8 CAMT licensed massage therapist
## 9 Licensed Massage Therapist / PT Aide
## 10 Massage Therapist
## 11 Now Hiring Swedish Massage Therapists
## 12 Certified Massage Therapist
## 13 Licensed Massage Therapist
## 14 Seeking Injury focused Massage Therapist
## 15 MASSAGE THERAPIST (CAMTC) WEEKEND Position Available in BUSY...
## 16 Full Time License Massage Therapist Ready to work tomorrow
## 17 Certified Massage Therapist
## 18 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 19 Massage Therapist
## 20 Massage Therapist (soft tissue specialist) chiropractic offi...
## 21 CAMT licensed massage therapist
## 22 Massage Therapist
## 23 Massage Therapist for chiropractic clinic
## 24 Certified Massage Therapist
## 25 Licensed Massage Therapist/Practioner
## 26 Now Hiring Swedish Massage Therapists
## 27 Massage Therapist- Full or Part Time (Silver Lake)
## 28 Massage Therapist
## 29 Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist / PT Aide
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Full Time License Massage Therapist Ready to work tomorrow
## 35 Massage Therapist
## 36 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 37 Massage Therapist
## 38 Massage Therapist (soft tissue specialist) chiropractic offi...
## 39 CAMT licensed massage therapist
## 40 Massage Therapist CA - Northridge, Studio City, Topanga
## 41 Certified Massage Therapist
## 42 Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Part-time Mobile Massage Therapists
## 47 Certified Massage Therapist
## 48 Licensed Massage Therapist
## 49 Mobile Massage Therapist
## 50 Licensed Massage Therapist / PT Aide
## 51 Certified Massage Therapist
## 52 Massage Therapist
## 53 Licensed Massage Therapist
## 54 Mobile Massage Therapist
## 55 Licensed Massage Therapist
## 56 MASSAGE THERAPIST
## 57 Licensed Massage Therpaist
## 58 Licensed Massage Therapist/Chiropractic Assistant
## 59 Massage Therapist - Now Hiring at Massage Revolution!
## 60 Massage Therapist
## 61 MASSAGE THERAPIST
## 62 Licensed Massage Therapist / PT Aide
## 63 Massage Therapist
## 64 Massage Therapist (soft tissue specialist) chiropractic offi...
## 65 CAMT licensed massage therapist
## 66 Full Time License Massage Therapist Ready to work tomorrow
## 67 Certified Massage Therapist
## 68 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 69 Massage Therapist
## 70 Massage Therapist
## 71 Fitness/Stretch Professional
## 72 Licensed Massage Therapist
## 73 Massage Therapist Part-time or Full-time
## 74 MASSAGE THERAPIST (CAMTC) WEEKEND Position Available in BUSY...
## 75 Seeking Injury focused Massage Therapist
## 76 Lead Massage Therapist
## 77 Massage Therapist Signing Bonus Available
## 78 Certified Massage Therapist
## 79 Massage Therapists! "BE apart of the BEST!"
## 80 Stretch Professional (Flexologist)
## 81 Licensed Massage Therapist for Busy Nights and Weekend
## 82 Licensed Massage Therapist
## 83 Massage Therapist- Part-time and Full-Time Openings $500 Sig...
## 84 Massage Therapist Full-Time
## 85 Massage Therapist, Holistic & Energy Healers, MFTs, Acupunct...
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$50 - $180 an hour $50 - $180 50.00 180
## 2 \n$17 - $44 an hour $17 - $44 17.00 44
## 3 \n$35 an hour $35 35.00 NA
## 4 \n$30 - $100 an hour $30 - $100 30.00 100
## 5 \n$22 - $45 an hour $22 - $45 22.00 45
## 6 \n$22 - $28 an hour $22 - $28 22.00 28
## 7 \n$13 - $30 an hour $13 - $30 13.00 30
## 8 \n$22 - $28 an hour $22 - $28 22.00 28
## 9 \n$30 - $35 an hour $30 - $35 30.00 35
## 10 \n$30 an hour $30 30.00 NA
## 11 \n$25 an hour $25 25.00 NA
## 12 \n$22 - $45 an hour $22 - $45 22.00 45
## 13 \n$17 - $44 an hour $17 - $44 17.00 44
## 14 \n$35 an hour $35 35.00 NA
## 15 \n$22 - $28 an hour $22 - $28 22.00 28
## 16 \n$17 - $25 an hour $17 - $25 17.00 25
## 17 \n$25 - $35 an hour $25 - $35 25.00 35
## 18 \n$35 - $40 an hour $35 - $40 35.00 40
## 19 \n$20 - $25 an hour $20 - $25 20.00 25
## 20 \n$25 - $35 an hour $25 - $35 25.00 35
## 21 \n$13 - $30 an hour $13 - $30 13.00 30
## 22 \n$19 - $23 an hour $19 - $23 19.00 23
## 23 \n$50 - $180 an hour $50 - $180 50.00 180
## 24 \n$22 - $45 an hour $22 - $45 22.00 45
## 25 \n$19 - $23 an hour $19 - $23 19.00 23
## 26 \n$17 - $44 an hour $17 - $44 17.00 44
## 27 \n$35 an hour $35 35.00 NA
## 28 \n$22 - $28 an hour $22 - $28 22.00 28
## 29 \n$20 - $35 an hour $20 - $35 20.00 35
## 30 \n$31,000 - $42,258 a year $31000 - $42258 31000.00 42258
## 31 \n$50 - $70 an hour $50 - $70 50.00 70
## 32 \n$30 - $35 an hour $30 - $35 30.00 35
## 33 \n$30 an hour $30 30.00 NA
## 34 \n$45 - $70 an hour $45 - $70 45.00 70
## 35 \n$13 - $30 an hour $13 - $30 13.00 30
## 36 \n$50 - $180 an hour $50 - $180 50.00 180
## 37 \n$13.25 an hour $13.25 13.25 NA
## 38 \n$45 - $70 an hour $45 - $70 45.00 70
## 39 \n$22 - $25 an hour $22 - $25 22.00 25
## 40 \n$15 - $25 an hour $15 - $25 15.00 25
## 41 \n$13 - $30 an hour $13 - $30 13.00 30
## 42 \n$19 - $23 an hour $19 - $23 19.00 23
## 43 \n$35 an hour $35 35.00 NA
## 44 \n$22 - $28 an hour $22 - $28 22.00 28
## 45 \n$22 - $45 an hour $22 - $45 22.00 45
## 46 \n$17 - $44 an hour $17 - $44 17.00 44
## 47 \n$50 - $180 an hour $50 - $180 50.00 180
## 48 \n$35 an hour $35 35.00 NA
## 49 \n$25 an hour $25 25.00 NA
## 50 \n$2,000 - $6,000 a month $2000 - $6000 2000.00 6000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22 30 685.645 939.6694 13
## 2 22 30 685.645 939.6694 13
## 3 22 30 685.645 939.6694 13
## 4 22 30 685.645 939.6694 13
## 5 22 30 685.645 939.6694 13
## 6 22 30 685.645 939.6694 13
## 7 22 30 685.645 939.6694 13
## 8 22 30 685.645 939.6694 13
## 9 22 30 685.645 939.6694 13
## 10 22 30 685.645 939.6694 13
## 11 22 30 685.645 939.6694 13
## 12 22 30 685.645 939.6694 13
## 13 22 30 685.645 939.6694 13
## 14 22 30 685.645 939.6694 13
## 15 22 30 685.645 939.6694 13
## 16 22 30 685.645 939.6694 13
## 17 22 30 685.645 939.6694 13
## 18 22 30 685.645 939.6694 13
## 19 22 30 685.645 939.6694 13
## 20 22 30 685.645 939.6694 13
## 21 22 30 685.645 939.6694 13
## 22 22 30 685.645 939.6694 13
## 23 22 30 685.645 939.6694 13
## 24 22 30 685.645 939.6694 13
## 25 22 30 685.645 939.6694 13
## 26 22 30 685.645 939.6694 13
## 27 22 30 685.645 939.6694 13
## 28 22 30 685.645 939.6694 13
## 29 22 30 685.645 939.6694 13
## 30 22 30 685.645 939.6694 13
## 31 22 30 685.645 939.6694 13
## 32 22 30 685.645 939.6694 13
## 33 22 30 685.645 939.6694 13
## 34 22 30 685.645 939.6694 13
## 35 22 30 685.645 939.6694 13
## 36 22 30 685.645 939.6694 13
## 37 22 30 685.645 939.6694 13
## 38 22 30 685.645 939.6694 13
## 39 22 30 685.645 939.6694 13
## 40 22 30 685.645 939.6694 13
## 41 22 30 685.645 939.6694 13
## 42 22 30 685.645 939.6694 13
## 43 22 30 685.645 939.6694 13
## 44 22 30 685.645 939.6694 13
## 45 22 30 685.645 939.6694 13
## 46 22 30 685.645 939.6694 13
## 47 22 30 685.645 939.6694 13
## 48 22 30 685.645 939.6694 13
## 49 22 30 685.645 939.6694 13
## 50 22 30 685.645 939.6694 13
## maximumMaxSalary
## 1 42258
## 2 42258
## 3 42258
## 4 42258
## 5 42258
## 6 42258
## 7 42258
## 8 42258
## 9 42258
## 10 42258
## 11 42258
## 12 42258
## 13 42258
## 14 42258
## 15 42258
## 16 42258
## 17 42258
## 18 42258
## 19 42258
## 20 42258
## 21 42258
## 22 42258
## 23 42258
## 24 42258
## 25 42258
## 26 42258
## 27 42258
## 28 42258
## 29 42258
## 30 42258
## 31 42258
## 32 42258
## 33 42258
## 34 42258
## 35 42258
## 36 42258
## 37 42258
## 38 42258
## 39 42258
## 40 42258
## 41 42258
## 42 42258
## 43 42258
## 44 42258
## 45 42258
## 46 42258
## 47 42258
## 48 42258
## 49 42258
## 50 42258
##
## [[3]]
## date_daysAgo
## 1 25
## 2 30
## 3 Just posted
## 4 1
## 5 1
## 6 8
## 7 4
## 8 12
## 9 30
## 10 19
## 11 5
## 12 6
## 13 5
## 14 5
## 15 5
## 16 8
## 17 4
## 18 30
## 19 Just posted
## 20 1
## 21 12
## 22 11
## 23 30
## 24 30
## 25 15
## 26 5
## 27 30
## 28 3
## 29 12
## 30 14
## 31 30
## 32 21
## 33 25
## 34 8
## 35 21
## 36 30
## 37 Just posted
## 38 1
## 39 12
## 40 30
## 41 3
## 42 12
## 43 16
## 44 12
## 45 13
## 46 30
## 47 6
## 48 30
## 49 30
## 50 30
## 51 4
## 52 25
## 53 10
## 54 30
## 55 26
## 56 30
## 57 Today
## 58 30
## 59 30
## 60 30
## 61 30
## 62 30
## 63 21
## 64 1
## 65 12
## 66 8
## 67 4
## 68 30
## 69 Just posted
## 70 25
## 71 30
## 72 14
## 73 30
## 74 5
## 75 5
## 76 3
## 77 30
## 78 8
## 79 30
## 80 30
## 81 30
## 82 Just posted
## 83 30
## 84 30
## 85 30
##
## [[4]]
## HiringAgency
## 1 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 2 Massage - Spa ServicesLong Beach, CA 90808
## 3 Chiropractic OfficeTemple City, CA 91780
## 4 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 5 Life Rx Wellness IncLos Angeles, CA
## 6 Massage VillaSouth Pasadena, CA 91030
## 7 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 8 West Hollywood Day SpaWest Hollywood, CA 90069
## 9 Gambucci ClinicEl Segundo, CA 90012
## 10 Spine Pro Tardaguila ChiropracticLawndale, CA 90260
## 11 Aim Sports MedicineHermosa Beach, CA 90254
## 12 Nature Health ChiropracticRancho Palos Verdes, CA 90275
## 13 South Bay Pain and WellnessTorrance, CA 90505
## 14 InnerMovement WellnessGlendale, CA 91206 (City Center area)
## 15 Day Spa3.6Manhattan Beach, CA
## 16 Massage VillaSouth Pasadena, CA 91030
## 17 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 18 Massage - Spa ServicesLong Beach, CA 90808
## 19 Chiropractic OfficeTemple City, CA 91780
## 20 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 21 West Hollywood Day SpaWest Hollywood, CA 90069
## 22 Pacific Shore ChiropracticSan Pedro, CA 90731
## 23 Back To WellnessValley Village, CA 91607
## 24 Back on Point WellnessTorrance, CA 90503
## 25 Massage Envy Pasadena-South Lake3.2Pasadena, CA 91101 (South area)
## 26 Aim Sports MedicineHermosa Beach, CA 90254
## 27 The NOW, LLCLos Angeles, CA 90026+2 locations
## 28 Massage Envy3.2West Hollywood, CA 90046+30 locations
## 29 Aim Sports MedicineHermosa Beach, CA 90254
## 30 Nelson ChiropracticSan Pedro, CA 90732
## 31 Gambucci ClinicEl Segundo, CA 90012
## 32 Hand & Stone Massage and Facial Spa3.0Cerritos, CA 90703
## 33 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 34 Massage VillaSouth Pasadena, CA 91030
## 35 Hand & Stone Massage and Facial Spa3.0Cerritos, CA 90703
## 36 Massage - Spa ServicesLong Beach, CA 90808
## 37 Chiropractic OfficeTemple City, CA 91780
## 38 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 39 West Hollywood Day SpaWest Hollywood, CA 90069
## 40 Total Woman Gym and Spa2.9Studio City, CA 91604+4 locations
## 41 Massage Envy3.2West Hollywood, CA 90046+28 locations
## 42 Health Atlast West LALos Angeles, CA 90066 (Mar Vista area)
## 43 Pacific Sol ChiropracticRedondo Beach, CA 90278
## 44 Royal Palms ManagementSan Pedro, CA 90731
## 45 Facial SuiteWest Covina, CA 91791
## 46 Creative Chakra SpaLos Angeles, CA•Remote work available
## 47 Nature Health ChiropracticRancho Palos Verdes, CA 90275
## 48 Superior Sports Massage by Chris O'HaraHermosa Beach, CA 90254
## 49 Indo-Pak Massage TherapyLos Angeles, CA+2 locations
## 50 Gambucci ClinicEl Segundo, CA 90012
## 51 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 52 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 53 Joanna Vargas Salon Los AngelesWest Hollywood, CA 90069
## 54 Indo-Pak Massage TherapyLos Angeles, CA+2 locations
## 55 Long Beach Spine & RehabilitationLong Beach, CA 90808 (The Plaza area)
## 56 Alchemie SpaSanta Monica, CA 90405 (Ocean Park area)
## 57 Facial SuiteWest Covina, CA 91790
## 58 Health Atlast West LALos Angeles, CA 90066 (Mar Vista area)
## 59 The Back & Neck Relief Center (Massage Revolution)5.0Manhattan Beach, CA 90266
## 60 Rolling Hills Country Club3.8Rolling Hills Estates, CA 90274
## 61 BodyscapePasadena, CA 91107
## 62 Gambucci ClinicEl Segundo, CA 90012
## 63 Hand & Stone Massage and Facial Spa3.0Cerritos, CA 90703
## 64 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 65 West Hollywood Day SpaWest Hollywood, CA 90069
## 66 Massage VillaSouth Pasadena, CA 91030
## 67 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 68 Massage - Spa ServicesLong Beach, CA 90808
## 69 Chiropractic OfficeTemple City, CA 91780
## 70 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 71 StretchLab3.8Studio City, CA 91604+1 location
## 72 South Bay Pain and WellnessTorrance, CA 90505
## 73 Massage Envy3.2Carson, CA 90745
## 74 Day Spa3.6Manhattan Beach, CA
## 75 InnerMovement WellnessGlendale, CA 91206 (City Center area)
## 76 Hand & Stone Massage and Facial Spa3.0Porter Ranch, CA 91326
## 77 Massage Envy3.2Monrovia, CA 91016
## 78 Massage Envy - La HabraLa Habra, CA 90631
## 79 Massage Envy3.2Santa Monica, CA 90403 (North of Montana area)+3 locations
## 80 Stretch Lab LA3.8Rolling Hills Estates, CA
## 81 Hand and Stone3.0Brea, CA 92821
## 82 Lux Aveda Salon SpaFullerton, CA
## 83 Massage Envy3.2West Covina, CA 91791
## 84 Massage Envy3.2Glendora, CA 91740
## 85 Obsidian Healing & WellnessLos Angeles, CA 90034
##
## [[5]]
## Salary salary minSalary maxSalary
## 30 \n$31,000 - $42,258 a year $31000 - $42258 31000 42258
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 30 31000 42258 31000 42258 31000
## maximumMaxSalary
## 30 42258
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$50 - $180 an hour $50 - $180 50.00 180 22
## 2 \n$17 - $44 an hour $17 - $44 17.00 44 22
## 3 \n$35 an hour $35 35.00 NA 22
## 4 \n$30 - $100 an hour $30 - $100 30.00 100 22
## 5 \n$22 - $45 an hour $22 - $45 22.00 45 22
## 6 \n$22 - $28 an hour $22 - $28 22.00 28 22
## 7 \n$13 - $30 an hour $13 - $30 13.00 30 22
## 8 \n$22 - $28 an hour $22 - $28 22.00 28 22
## 9 \n$30 - $35 an hour $30 - $35 30.00 35 22
## 10 \n$30 an hour $30 30.00 NA 22
## 11 \n$25 an hour $25 25.00 NA 22
## 12 \n$22 - $45 an hour $22 - $45 22.00 45 22
## 13 \n$17 - $44 an hour $17 - $44 17.00 44 22
## 14 \n$35 an hour $35 35.00 NA 22
## 15 \n$22 - $28 an hour $22 - $28 22.00 28 22
## 16 \n$17 - $25 an hour $17 - $25 17.00 25 22
## 17 \n$25 - $35 an hour $25 - $35 25.00 35 22
## 18 \n$35 - $40 an hour $35 - $40 35.00 40 22
## 19 \n$20 - $25 an hour $20 - $25 20.00 25 22
## 20 \n$25 - $35 an hour $25 - $35 25.00 35 22
## 21 \n$13 - $30 an hour $13 - $30 13.00 30 22
## 22 \n$19 - $23 an hour $19 - $23 19.00 23 22
## 23 \n$50 - $180 an hour $50 - $180 50.00 180 22
## 24 \n$22 - $45 an hour $22 - $45 22.00 45 22
## 25 \n$19 - $23 an hour $19 - $23 19.00 23 22
## 26 \n$17 - $44 an hour $17 - $44 17.00 44 22
## 27 \n$35 an hour $35 35.00 NA 22
## 28 \n$22 - $28 an hour $22 - $28 22.00 28 22
## 29 \n$20 - $35 an hour $20 - $35 20.00 35 22
## 31 \n$50 - $70 an hour $50 - $70 50.00 70 22
## 32 \n$30 - $35 an hour $30 - $35 30.00 35 22
## 33 \n$30 an hour $30 30.00 NA 22
## 34 \n$45 - $70 an hour $45 - $70 45.00 70 22
## 35 \n$13 - $30 an hour $13 - $30 13.00 30 22
## 36 \n$50 - $180 an hour $50 - $180 50.00 180 22
## 37 \n$13.25 an hour $13.25 13.25 NA 22
## 38 \n$45 - $70 an hour $45 - $70 45.00 70 22
## 39 \n$22 - $25 an hour $22 - $25 22.00 25 22
## 40 \n$15 - $25 an hour $15 - $25 15.00 25 22
## 41 \n$13 - $30 an hour $13 - $30 13.00 30 22
## 42 \n$19 - $23 an hour $19 - $23 19.00 23 22
## 43 \n$35 an hour $35 35.00 NA 22
## 44 \n$22 - $28 an hour $22 - $28 22.00 28 22
## 45 \n$22 - $45 an hour $22 - $45 22.00 45 22
## 46 \n$17 - $44 an hour $17 - $44 17.00 44 22
## 47 \n$50 - $180 an hour $50 - $180 50.00 180 22
## 48 \n$35 an hour $35 35.00 NA 22
## 49 \n$25 an hour $25 25.00 NA 22
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 35 26.71354 53.42105 13 180
## 2 35 26.71354 53.42105 13 180
## 3 35 26.71354 53.42105 13 180
## 4 35 26.71354 53.42105 13 180
## 5 35 26.71354 53.42105 13 180
## 6 35 26.71354 53.42105 13 180
## 7 35 26.71354 53.42105 13 180
## 8 35 26.71354 53.42105 13 180
## 9 35 26.71354 53.42105 13 180
## 10 35 26.71354 53.42105 13 180
## 11 35 26.71354 53.42105 13 180
## 12 35 26.71354 53.42105 13 180
## 13 35 26.71354 53.42105 13 180
## 14 35 26.71354 53.42105 13 180
## 15 35 26.71354 53.42105 13 180
## 16 35 26.71354 53.42105 13 180
## 17 35 26.71354 53.42105 13 180
## 18 35 26.71354 53.42105 13 180
## 19 35 26.71354 53.42105 13 180
## 20 35 26.71354 53.42105 13 180
## 21 35 26.71354 53.42105 13 180
## 22 35 26.71354 53.42105 13 180
## 23 35 26.71354 53.42105 13 180
## 24 35 26.71354 53.42105 13 180
## 25 35 26.71354 53.42105 13 180
## 26 35 26.71354 53.42105 13 180
## 27 35 26.71354 53.42105 13 180
## 28 35 26.71354 53.42105 13 180
## 29 35 26.71354 53.42105 13 180
## 31 35 26.71354 53.42105 13 180
## 32 35 26.71354 53.42105 13 180
## 33 35 26.71354 53.42105 13 180
## 34 35 26.71354 53.42105 13 180
## 35 35 26.71354 53.42105 13 180
## 36 35 26.71354 53.42105 13 180
## 37 35 26.71354 53.42105 13 180
## 38 35 26.71354 53.42105 13 180
## 39 35 26.71354 53.42105 13 180
## 40 35 26.71354 53.42105 13 180
## 41 35 26.71354 53.42105 13 180
## 42 35 26.71354 53.42105 13 180
## 43 35 26.71354 53.42105 13 180
## 44 35 26.71354 53.42105 13 180
## 45 35 26.71354 53.42105 13 180
## 46 35 26.71354 53.42105 13 180
## 47 35 26.71354 53.42105 13 180
## 48 35 26.71354 53.42105 13 180
## 49 35 26.71354 53.42105 13 180
##
## [[7]]
## city state
## 1 Los Angeles CA
## 2 Los Angeles CA
## 3 Los Angeles CA
## 4 Los Angeles CA
## 5 Los Angeles CA
## 6 Los Angeles CA
## 7 Los Angeles CA
## 8 Los Angeles CA
## 9 Los Angeles CA
## 10 Los Angeles CA
## 11 Los Angeles CA
## 12 Los Angeles CA
## 13 Los Angeles CA
## 14 Los Angeles CA
## 15 Los Angeles CA
## 16 Los Angeles CA
## 17 Los Angeles CA
## 18 Los Angeles CA
## 19 Los Angeles CA
## 20 Los Angeles CA
## 21 Los Angeles CA
## 22 Los Angeles CA
## 23 Los Angeles CA
## 24 Los Angeles CA
## 25 Los Angeles CA
## 26 Los Angeles CA
## 27 Los Angeles CA
## 28 Los Angeles CA
## 29 Los Angeles CA
## 30 Los Angeles CA
## 31 Los Angeles CA
## 32 Los Angeles CA
## 33 Los Angeles CA
## 34 Los Angeles CA
## 35 Los Angeles CA
## 36 Los Angeles CA
## 37 Los Angeles CA
## 38 Los Angeles CA
## 39 Los Angeles CA
## 40 Los Angeles CA
## 41 Los Angeles CA
## 42 Los Angeles CA
## 43 Los Angeles CA
## 44 Los Angeles CA
## 45 Los Angeles CA
## 46 Los Angeles CA
## 47 Los Angeles CA
## 48 Los Angeles CA
## 49 Los Angeles CA
## 50 Los Angeles CA
## 51 Los Angeles CA
## 52 Los Angeles CA
## 53 Los Angeles CA
## 54 Los Angeles CA
## 55 Los Angeles CA
## 56 Los Angeles CA
## 57 Los Angeles CA
## 58 Los Angeles CA
## 59 Los Angeles CA
## 60 Los Angeles CA
## 61 Los Angeles CA
## 62 Los Angeles CA
## 63 Los Angeles CA
## 64 Los Angeles CA
## 65 Los Angeles CA
## 66 Los Angeles CA
## 67 Los Angeles CA
## 68 Los Angeles CA
## 69 Los Angeles CA
## 70 Los Angeles CA
## 71 Los Angeles CA
## 72 Los Angeles CA
## 73 Los Angeles CA
## 74 Los Angeles CA
## 75 Los Angeles CA
## 76 Los Angeles CA
## 77 Los Angeles CA
## 78 Los Angeles CA
## 79 Los Angeles CA
## 80 Los Angeles CA
## 81 Los Angeles CA
## 82 Los Angeles CA
## 83 Los Angeles CA
## 84 Los Angeles CA
## 85 Los Angeles CA
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 3 Massage Therapist
## 4 Massage Therapist (soft tissue specialist) chiropractic offi...
## 5 Sport Massage Therapist. Myofacial Release Therapist. FMS Ex...
## 6 Full Time License Massage Therapist Ready to work tomorrow
## 7 Certified Massage Therapist
## 8 CAMT licensed massage therapist
## 9 Licensed Massage Therapist / PT Aide
## 10 Massage Therapist
## 11 Now Hiring Swedish Massage Therapists
## 12 Certified Massage Therapist
## 13 Licensed Massage Therapist
## 14 Seeking Injury focused Massage Therapist
## 15 MASSAGE THERAPIST (CAMTC) WEEKEND Position Available in BUSY...
## 16 Full Time License Massage Therapist Ready to work tomorrow
## 17 Certified Massage Therapist
## 18 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 19 Massage Therapist
## 20 Massage Therapist (soft tissue specialist) chiropractic offi...
## 21 CAMT licensed massage therapist
## 22 Massage Therapist
## 23 Massage Therapist for chiropractic clinic
## 24 Certified Massage Therapist
## 25 Licensed Massage Therapist/Practioner
## 26 Now Hiring Swedish Massage Therapists
## 27 Massage Therapist- Full or Part Time (Silver Lake)
## 28 Massage Therapist
## 29 Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist / PT Aide
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Full Time License Massage Therapist Ready to work tomorrow
## 35 Massage Therapist
## 36 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 37 Massage Therapist
## 38 Massage Therapist (soft tissue specialist) chiropractic offi...
## 39 CAMT licensed massage therapist
## 40 Massage Therapist CA - Northridge, Studio City, Topanga
## 41 Certified Massage Therapist
## 42 Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Part-time Mobile Massage Therapists
## 47 Certified Massage Therapist
## 48 Licensed Massage Therapist
## 49 Mobile Massage Therapist
## 50 Licensed Massage Therapist / PT Aide
## 51 Certified Massage Therapist
## 52 Massage Therapist
## 53 Licensed Massage Therapist
## 54 Mobile Massage Therapist
## 55 Licensed Massage Therapist
## 56 MASSAGE THERAPIST
## 57 Licensed Massage Therpaist
## 58 Licensed Massage Therapist/Chiropractic Assistant
## 59 Massage Therapist - Now Hiring at Massage Revolution!
## 60 Massage Therapist
## 61 MASSAGE THERAPIST
## 62 Licensed Massage Therapist / PT Aide
## 63 Massage Therapist
## 64 Massage Therapist (soft tissue specialist) chiropractic offi...
## 65 CAMT licensed massage therapist
## 66 Full Time License Massage Therapist Ready to work tomorrow
## 67 Certified Massage Therapist
## 68 Massage Therapist- You'll Love Us - 500 Signing Bonus*
## 69 Massage Therapist
## 70 Massage Therapist
## 71 Fitness/Stretch Professional
## 72 Licensed Massage Therapist
## 73 Massage Therapist Part-time or Full-time
## 74 MASSAGE THERAPIST (CAMTC) WEEKEND Position Available in BUSY...
## 75 Seeking Injury focused Massage Therapist
## 76 Lead Massage Therapist
## 77 Massage Therapist Signing Bonus Available
## 78 Certified Massage Therapist
## 79 Massage Therapists! "BE apart of the BEST!"
## 80 Stretch Professional (Flexologist)
## 81 Licensed Massage Therapist for Busy Nights and Weekend
## 82 Licensed Massage Therapist
## 83 Massage Therapist- Part-time and Full-Time Openings $500 Sig...
## 84 Massage Therapist Full-Time
## 85 Massage Therapist, Holistic & Energy Healers, MFTs, Acupunct...
## HiringAgency
## 1 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 2 Massage - Spa ServicesLong Beach, CA 90808
## 3 Chiropractic OfficeTemple City, CA 91780
## 4 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 5 Life Rx Wellness IncLos Angeles, CA
## 6 Massage VillaSouth Pasadena, CA 91030
## 7 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 8 West Hollywood Day SpaWest Hollywood, CA 90069
## 9 Gambucci ClinicEl Segundo, CA 90012
## 10 Spine Pro Tardaguila ChiropracticLawndale, CA 90260
## 11 Aim Sports MedicineHermosa Beach, CA 90254
## 12 Nature Health ChiropracticRancho Palos Verdes, CA 90275
## 13 South Bay Pain and WellnessTorrance, CA 90505
## 14 InnerMovement WellnessGlendale, CA 91206 (City Center area)
## 15 Day Spa3.6Manhattan Beach, CA
## 16 Massage VillaSouth Pasadena, CA 91030
## 17 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 18 Massage - Spa ServicesLong Beach, CA 90808
## 19 Chiropractic OfficeTemple City, CA 91780
## 20 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 21 West Hollywood Day SpaWest Hollywood, CA 90069
## 22 Pacific Shore ChiropracticSan Pedro, CA 90731
## 23 Back To WellnessValley Village, CA 91607
## 24 Back on Point WellnessTorrance, CA 90503
## 25 Massage Envy Pasadena-South Lake3.2Pasadena, CA 91101 (South area)
## 26 Aim Sports MedicineHermosa Beach, CA 90254
## 27 The NOW, LLCLos Angeles, CA 90026+2 locations
## 28 Massage Envy3.2West Hollywood, CA 90046+30 locations
## 29 Aim Sports MedicineHermosa Beach, CA 90254
## 30 Nelson ChiropracticSan Pedro, CA 90732
## 31 Gambucci ClinicEl Segundo, CA 90012
## 32 Hand & Stone Massage and Facial Spa3.0Cerritos, CA 90703
## 33 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 34 Massage VillaSouth Pasadena, CA 91030
## 35 Hand & Stone Massage and Facial Spa3.0Cerritos, CA 90703
## 36 Massage - Spa ServicesLong Beach, CA 90808
## 37 Chiropractic OfficeTemple City, CA 91780
## 38 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 39 West Hollywood Day SpaWest Hollywood, CA 90069
## 40 Total Woman Gym and Spa2.9Studio City, CA 91604+4 locations
## 41 Massage Envy3.2West Hollywood, CA 90046+28 locations
## 42 Health Atlast West LALos Angeles, CA 90066 (Mar Vista area)
## 43 Pacific Sol ChiropracticRedondo Beach, CA 90278
## 44 Royal Palms ManagementSan Pedro, CA 90731
## 45 Facial SuiteWest Covina, CA 91791
## 46 Creative Chakra SpaLos Angeles, CA•Remote work available
## 47 Nature Health ChiropracticRancho Palos Verdes, CA 90275
## 48 Superior Sports Massage by Chris O'HaraHermosa Beach, CA 90254
## 49 Indo-Pak Massage TherapyLos Angeles, CA+2 locations
## 50 Gambucci ClinicEl Segundo, CA 90012
## 51 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 52 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 53 Joanna Vargas Salon Los AngelesWest Hollywood, CA 90069
## 54 Indo-Pak Massage TherapyLos Angeles, CA+2 locations
## 55 Long Beach Spine & RehabilitationLong Beach, CA 90808 (The Plaza area)
## 56 Alchemie SpaSanta Monica, CA 90405 (Ocean Park area)
## 57 Facial SuiteWest Covina, CA 91790
## 58 Health Atlast West LALos Angeles, CA 90066 (Mar Vista area)
## 59 The Back & Neck Relief Center (Massage Revolution)5.0Manhattan Beach, CA 90266
## 60 Rolling Hills Country Club3.8Rolling Hills Estates, CA 90274
## 61 BodyscapePasadena, CA 91107
## 62 Gambucci ClinicEl Segundo, CA 90012
## 63 Hand & Stone Massage and Facial Spa3.0Cerritos, CA 90703
## 64 Prodigy Chiro Care & Spinal RehabSanta Monica, CA 90401 (Downtown/Third Street Promenade area)
## 65 West Hollywood Day SpaWest Hollywood, CA 90069
## 66 Massage VillaSouth Pasadena, CA 91030
## 67 Ronald D. Zlotolow Medical GroupSanta Monica, CA 90404 (Mid-City area)
## 68 Massage - Spa ServicesLong Beach, CA 90808
## 69 Chiropractic OfficeTemple City, CA 91780
## 70 ConfidentialLos Angeles, CA 90049 (Brentwood area)
## 71 StretchLab3.8Studio City, CA 91604+1 location
## 72 South Bay Pain and WellnessTorrance, CA 90505
## 73 Massage Envy3.2Carson, CA 90745
## 74 Day Spa3.6Manhattan Beach, CA
## 75 InnerMovement WellnessGlendale, CA 91206 (City Center area)
## 76 Hand & Stone Massage and Facial Spa3.0Porter Ranch, CA 91326
## 77 Massage Envy3.2Monrovia, CA 91016
## 78 Massage Envy - La HabraLa Habra, CA 90631
## 79 Massage Envy3.2Santa Monica, CA 90403 (North of Montana area)+3 locations
## 80 Stretch Lab LA3.8Rolling Hills Estates, CA
## 81 Hand and Stone3.0Brea, CA 92821
## 82 Lux Aveda Salon SpaFullerton, CA
## 83 Massage Envy3.2West Covina, CA 91791
## 84 Massage Envy3.2Glendora, CA 91740
## 85 Obsidian Healing & WellnessLos Angeles, CA 90034
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 25 13 180 31000 42258
## 2 30 13 180 31000 42258
## 3 Just posted 13 180 31000 42258
## 4 1 13 180 31000 42258
## 5 1 13 180 31000 42258
## 6 8 13 180 31000 42258
## 7 4 13 180 31000 42258
## 8 12 13 180 31000 42258
## 9 30 13 180 31000 42258
## 10 19 13 180 31000 42258
## 11 5 13 180 31000 42258
## 12 6 13 180 31000 42258
## 13 5 13 180 31000 42258
## 14 5 13 180 31000 42258
## 15 5 13 180 31000 42258
## 16 8 13 180 31000 42258
## 17 4 13 180 31000 42258
## 18 30 13 180 31000 42258
## 19 Just posted 13 180 31000 42258
## 20 1 13 180 31000 42258
## 21 12 13 180 31000 42258
## 22 11 13 180 31000 42258
## 23 30 13 180 31000 42258
## 24 30 13 180 31000 42258
## 25 15 13 180 31000 42258
## 26 5 13 180 31000 42258
## 27 30 13 180 31000 42258
## 28 3 13 180 31000 42258
## 29 12 13 180 31000 42258
## 30 14 13 180 31000 42258
## 31 30 13 180 31000 42258
## 32 21 13 180 31000 42258
## 33 25 13 180 31000 42258
## 34 8 13 180 31000 42258
## 35 21 13 180 31000 42258
## 36 30 13 180 31000 42258
## 37 Just posted 13 180 31000 42258
## 38 1 13 180 31000 42258
## 39 12 13 180 31000 42258
## 40 30 13 180 31000 42258
## 41 3 13 180 31000 42258
## 42 12 13 180 31000 42258
## 43 16 13 180 31000 42258
## 44 12 13 180 31000 42258
## 45 13 13 180 31000 42258
## 46 30 13 180 31000 42258
## 47 6 13 180 31000 42258
## 48 30 13 180 31000 42258
## 49 30 13 180 31000 42258
## 50 30 13 180 31000 42258
## 51 4 13 180 31000 42258
## 52 25 13 180 31000 42258
## 53 10 13 180 31000 42258
## 54 30 13 180 31000 42258
## 55 26 13 180 31000 42258
## 56 30 13 180 31000 42258
## 57 Today 13 180 31000 42258
## 58 30 13 180 31000 42258
## 59 30 13 180 31000 42258
## 60 30 13 180 31000 42258
## 61 30 13 180 31000 42258
## 62 30 13 180 31000 42258
## 63 21 13 180 31000 42258
## 64 1 13 180 31000 42258
## 65 12 13 180 31000 42258
## 66 8 13 180 31000 42258
## 67 4 13 180 31000 42258
## 68 30 13 180 31000 42258
## 69 Just posted 13 180 31000 42258
## 70 25 13 180 31000 42258
## 71 30 13 180 31000 42258
## 72 14 13 180 31000 42258
## 73 30 13 180 31000 42258
## 74 5 13 180 31000 42258
## 75 5 13 180 31000 42258
## 76 3 13 180 31000 42258
## 77 30 13 180 31000 42258
## 78 8 13 180 31000 42258
## 79 30 13 180 31000 42258
## 80 30 13 180 31000 42258
## 81 30 13 180 31000 42258
## 82 Just posted 13 180 31000 42258
## 83 30 13 180 31000 42258
## 84 30 13 180 31000 42258
## 85 30 13 180 31000 42258
getIndeedJobData5pages("massage therapist","San Diego","CA")
## Warning in getIndeedJobData5pages("massage therapist", "San Diego", "CA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "San Diego", "CA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Certified Massage Therapist
## 2 Now Hiring Experienced Massage Therapist
## 3 Certified Massage Therapist (July 2020)
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Spa Therapist
## 10 Massage Therapist (PT)
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Acupuncturist and Massage Therapist
## 15 Mobile Chair Massage Therapist
## 16 Certified Massage Therapist
## 17 Mobile Massage Therapist
## 18 Massage Therapist
## 19 Stretch Practitioner
## 20 Massage Therapist
## 21 Massage Therapist - Part time
## 22 Licensed Massage Therapist
## 23 Athletic Trainers/Personal trainers/massage therapists/physi...
## 24 Massage Therapist / Esthetician
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist Full and Part Time
## 27 Massage Therapist
## 28 Massage Therapist "Work for the BEST!"
## 29 Women's wellness center in North Park Hiring LMT
## 30 Dual Licensed Therapist Massage and Skincare
## 31 Dual Licensed Therapist Massage and Skincare
## 32 Mobile Massage Therapist
## 33 Massage Therapist
## 34 Stretch Practitioner
## 35 Massage Therapist
## 36 Massage Therapist - Part time
## 37 Licensed Massage Therapist
## 38 Athletic Trainers/Personal trainers/massage therapists/physi...
## 39 Massage Therapist / Esthetician
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist Full and Part Time
## 42 Massage Therapist
## 43 Massage Therapist "Work for the BEST!"
## 44 Women's wellness center in North Park Hiring LMT
## 45 Dual Licensed Therapist Massage and Skincare
## 46 Dual Licensed Therapist Massage and Skincare
## 47 Certified Massage Therapist
## 48 Massage Therapist
## 49 Stretch Practitioner
## 50 Massage Therapist
## 51 Massage Therapist - Part time
## 52 Licensed Massage Therapist
## 53 Athletic Trainers/Personal trainers/massage therapists/physi...
## 54 Massage Therapist / Esthetician
## 55 Licensed Massage Therapist
## 56 Massage Therapist
## 57 Massage Therapist "Work for the BEST!"
## 58 Licensed Massage Therapist Full and Part Time
## 59 Women's wellness center in North Park Hiring LMT
## 60 Dual Licensed Therapist Massage and Skincare
## 61 Dual Licensed Therapist Massage and Skincare
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30 - $45 an hour $30 - $45 30 45
## 2 \n$17 - $20 an hour $17 - $20 17 20
## 3 \n$35 - $55 an hour $35 - $55 35 55
## 4 \n$40 - $50 an hour $40 - $50 40 50
## 5 \n$23 - $25 an hour $23 - $25 23 25
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$25 - $30 an hour $25 - $30 25 30
## 8 \n$30 an hour $30 30 NA
## 9 \n$45 - $70 an hour $45 - $70 45 70
## 10 \n$20 an hour $20 20 NA
## 11 \n$40 - $50 an hour $40 - $50 40 50
## 12 \n$14 - $25 an hour $14 - $25 14 25
## 13 \n$45 - $70 an hour $45 - $70 45 70
## 14 \n$20 an hour $20 20 NA
## 15 \n$40 - $50 an hour $40 - $50 40 50
## 16 \n$14 - $25 an hour $14 - $25 14 25
## 17 \n$20 an hour $20 20 NA
## 18 \n$40 - $50 an hour $40 - $50 40 50
## 19 \n$14 - $25 an hour $14 - $25 14 25
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 32.5 290.1053 532.4118 14
## 2 30 32.5 290.1053 532.4118 14
## 3 30 32.5 290.1053 532.4118 14
## 4 30 32.5 290.1053 532.4118 14
## 5 30 32.5 290.1053 532.4118 14
## 6 30 32.5 290.1053 532.4118 14
## 7 30 32.5 290.1053 532.4118 14
## 8 30 32.5 290.1053 532.4118 14
## 9 30 32.5 290.1053 532.4118 14
## 10 30 32.5 290.1053 532.4118 14
## 11 30 32.5 290.1053 532.4118 14
## 12 30 32.5 290.1053 532.4118 14
## 13 30 32.5 290.1053 532.4118 14
## 14 30 32.5 290.1053 532.4118 14
## 15 30 32.5 290.1053 532.4118 14
## 16 30 32.5 290.1053 532.4118 14
## 17 30 32.5 290.1053 532.4118 14
## 18 30 32.5 290.1053 532.4118 14
## 19 30 32.5 290.1053 532.4118 14
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
##
## [[3]]
## date_daysAgo
## 1 5
## 2 1
## 3 7
## 4 24
## 5 1
## 6 4
## 7 30
## 8 1
## 9 Today
## 10 6
## 11 30
## 12 6
## 13 7
## 14 9
## 15 30
## 16 3
## 17 30
## 18 30
## 19 27
## 20 22
## 21 18
## 22 20
## 23 30
## 24 22
## 25 30
## 26 30
## 27 30
## 28 30
## 29 12
## 30 21
## 31 30
## 32 30
## 33 30
## 34 27
## 35 22
## 36 18
## 37 20
## 38 30
## 39 22
## 40 30
## 41 30
## 42 30
## 43 30
## 44 12
## 45 21
## 46 30
## 47 3
## 48 30
## 49 27
## 50 22
## 51 18
## 52 20
## 53 30
## 54 22
## 55 30
## 56 30
## 57 30
## 58 30
## 59 12
## 60 21
## 61 30
##
## [[4]]
## HiringAgency
## 1 The KnotstopSan Diego, CA 92103 (Hillcrest area)
## 2 Girl on the Go! Night Spa3.0San Diego, CA 92102 (Golden Hill area)
## 3 Massage Heights Carmel Valley3.1San Diego, CA 92130 (Carmel Valley area)
## 4 Soothe3.7San Diego, CA
## 5 Ramsey InsightSan Diego, CA
## 6 Simply Staffing SolutionsLemon Grove, CA
## 7 Creative Wellness ChiropracticSan Diego, CA 92111
## 8 Spa KingstonSan Diego, CA 92101 (Park West area)
## 9 HEI Hotels3.3Rancho Santa Fe, CA 92067
## 10 Montage International2.9San Diego, CA
## 11 Indo-Pak Massage TherapySan Diego, CA•Remote work available
## 12 SSSolutionSan Diego, CA+2 locations
## 13 Day Spa In The CitySan Diego, CA 92120
## 14 Chiropractic Offices Of Kirsten Sage, APCEncinitas, CA 92024
## 15 4 Your Health Massage CenterSan Diego, CA 92108 (Mission Valley West area)
## 16 Massage Envy3.2Point Loma, CA+8 locations
## 17 Indo-Pak Massage TherapySan Diego, CA
## 18 VIVO HEALTH & WELLNESSLa Jolla, CA 92037
## 19 Stretch Zone2.7Encinitas, CA 92024
## 20 Eroma Day SpaEl Cajon, CA 92020
## 21 Hidden SpaSan Diego, CA 92107 (Ocean Beach area)
## 22 Massage Heights - Rancho Penasquitos3.1San Diego, CA 92129
## 23 Stretch Lab3.8San Diego, CA 92103 (Hillcrest area)
## 24 Eroma Day SpaEl Cajon, CA 92020
## 25 Massage Heights3.1San Diego, CA 92130 (Carmel Valley area)+1 location
## 26 Massage Heights3.1San Diego, CA 92127
## 27 Fix Body GroupSan Diego, CA 92128 (Rancho Bernardo area)
## 28 Massage Envy3.2San Diego, CA 92109 (Pacific Beach area)+7 locations
## 29 Rebirth MassageSan Diego, CA 92116 (North Park area)
## 30 Massage Heights - 4S Ranch3.1San Diego, CA 92127
## 31 Massage Heights3.1San Diego, CA 92127
## 32 Indo-Pak Massage TherapySan Diego, CA
## 33 VIVO HEALTH & WELLNESSLa Jolla, CA 92037
## 34 Stretch Zone2.7Encinitas, CA 92024
## 35 Eroma Day SpaEl Cajon, CA 92020
## 36 Hidden SpaSan Diego, CA 92107 (Ocean Beach area)
## 37 Massage Heights - Rancho Penasquitos3.1San Diego, CA 92129
## 38 Stretch Lab3.8San Diego, CA 92103 (Hillcrest area)
## 39 Eroma Day SpaEl Cajon, CA 92020
## 40 Massage Heights3.1San Diego, CA 92130 (Carmel Valley area)+1 location
## 41 Massage Heights3.1San Diego, CA 92127
## 42 Fix Body GroupSan Diego, CA 92128 (Rancho Bernardo area)
## 43 Massage Envy3.2San Diego, CA 92109 (Pacific Beach area)+7 locations
## 44 Rebirth MassageSan Diego, CA 92116 (North Park area)
## 45 Massage Heights - 4S Ranch3.1San Diego, CA 92127
## 46 Massage Heights3.1San Diego, CA 92127
## 47 Massage Envy3.2Point Loma, CA+8 locations
## 48 VIVO HEALTH & WELLNESSLa Jolla, CA 92037
## 49 Stretch Zone2.7Encinitas, CA 92024
## 50 Eroma Day SpaEl Cajon, CA 92020
## 51 Hidden SpaSan Diego, CA 92107 (Ocean Beach area)
## 52 Massage Heights - Rancho Penasquitos3.1San Diego, CA 92129
## 53 Stretch Lab3.8San Diego, CA 92103 (Hillcrest area)
## 54 Eroma Day SpaEl Cajon, CA 92020
## 55 Massage Heights3.1San Diego, CA 92130 (Carmel Valley area)+1 location
## 56 Fix Body GroupSan Diego, CA 92128 (Rancho Bernardo area)
## 57 Massage Envy3.2San Diego, CA 92108 (Mission Valley East area)+7 locations
## 58 Massage Heights3.1San Diego, CA 92127
## 59 Rebirth MassageSan Diego, CA 92116 (North Park area)
## 60 Massage Heights - 4S Ranch3.1San Diego, CA 92127
## 61 Massage Heights3.1San Diego, CA 92127
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 - $45 an hour $30 - $45 30 45 27.5
## 2 \n$17 - $20 an hour $17 - $20 17 20 27.5
## 3 \n$35 - $55 an hour $35 - $55 35 55 27.5
## 4 \n$40 - $50 an hour $40 - $50 40 50 27.5
## 5 \n$23 - $25 an hour $23 - $25 23 25 27.5
## 7 \n$25 - $30 an hour $25 - $30 25 30 27.5
## 8 \n$30 an hour $30 30 NA 27.5
## 9 \n$45 - $70 an hour $45 - $70 45 70 27.5
## 10 \n$20 an hour $20 20 NA 27.5
## 11 \n$40 - $50 an hour $40 - $50 40 50 27.5
## 12 \n$14 - $25 an hour $14 - $25 14 25 27.5
## 13 \n$45 - $70 an hour $45 - $70 45 70 27.5
## 14 \n$20 an hour $20 20 NA 27.5
## 15 \n$40 - $50 an hour $40 - $50 40 50 27.5
## 16 \n$14 - $25 an hour $14 - $25 14 25 27.5
## 17 \n$20 an hour $20 20 NA 27.5
## 18 \n$40 - $50 an hour $40 - $50 40 50 27.5
## 19 \n$14 - $25 an hour $14 - $25 14 25 27.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 47.5 28.44444 42.14286 14 70
## 2 47.5 28.44444 42.14286 14 70
## 3 47.5 28.44444 42.14286 14 70
## 4 47.5 28.44444 42.14286 14 70
## 5 47.5 28.44444 42.14286 14 70
## 7 47.5 28.44444 42.14286 14 70
## 8 47.5 28.44444 42.14286 14 70
## 9 47.5 28.44444 42.14286 14 70
## 10 47.5 28.44444 42.14286 14 70
## 11 47.5 28.44444 42.14286 14 70
## 12 47.5 28.44444 42.14286 14 70
## 13 47.5 28.44444 42.14286 14 70
## 14 47.5 28.44444 42.14286 14 70
## 15 47.5 28.44444 42.14286 14 70
## 16 47.5 28.44444 42.14286 14 70
## 17 47.5 28.44444 42.14286 14 70
## 18 47.5 28.44444 42.14286 14 70
## 19 47.5 28.44444 42.14286 14 70
##
## [[7]]
## city state
## 1 San Diego CA
## 2 San Diego CA
## 3 San Diego CA
## 4 San Diego CA
## 5 San Diego CA
## 6 San Diego CA
## 7 San Diego CA
## 8 San Diego CA
## 9 San Diego CA
## 10 San Diego CA
## 11 San Diego CA
## 12 San Diego CA
## 13 San Diego CA
## 14 San Diego CA
## 15 San Diego CA
## 16 San Diego CA
## 17 San Diego CA
## 18 San Diego CA
## 19 San Diego CA
## 20 San Diego CA
## 21 San Diego CA
## 22 San Diego CA
## 23 San Diego CA
## 24 San Diego CA
## 25 San Diego CA
## 26 San Diego CA
## 27 San Diego CA
## 28 San Diego CA
## 29 San Diego CA
## 30 San Diego CA
## 31 San Diego CA
## 32 San Diego CA
## 33 San Diego CA
## 34 San Diego CA
## 35 San Diego CA
## 36 San Diego CA
## 37 San Diego CA
## 38 San Diego CA
## 39 San Diego CA
## 40 San Diego CA
## 41 San Diego CA
## 42 San Diego CA
## 43 San Diego CA
## 44 San Diego CA
## 45 San Diego CA
## 46 San Diego CA
## 47 San Diego CA
## 48 San Diego CA
## 49 San Diego CA
## 50 San Diego CA
## 51 San Diego CA
## 52 San Diego CA
## 53 San Diego CA
## 54 San Diego CA
## 55 San Diego CA
## 56 San Diego CA
## 57 San Diego CA
## 58 San Diego CA
## 59 San Diego CA
## 60 San Diego CA
## 61 San Diego CA
## jobTitle
## 1 Certified Massage Therapist
## 2 Now Hiring Experienced Massage Therapist
## 3 Certified Massage Therapist (July 2020)
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Spa Therapist
## 10 Massage Therapist (PT)
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Acupuncturist and Massage Therapist
## 15 Mobile Chair Massage Therapist
## 16 Certified Massage Therapist
## 17 Mobile Massage Therapist
## 18 Massage Therapist
## 19 Stretch Practitioner
## 20 Massage Therapist
## 21 Massage Therapist - Part time
## 22 Licensed Massage Therapist
## 23 Athletic Trainers/Personal trainers/massage therapists/physi...
## 24 Massage Therapist / Esthetician
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist Full and Part Time
## 27 Massage Therapist
## 28 Massage Therapist "Work for the BEST!"
## 29 Women's wellness center in North Park Hiring LMT
## 30 Dual Licensed Therapist Massage and Skincare
## 31 Dual Licensed Therapist Massage and Skincare
## 32 Mobile Massage Therapist
## 33 Massage Therapist
## 34 Stretch Practitioner
## 35 Massage Therapist
## 36 Massage Therapist - Part time
## 37 Licensed Massage Therapist
## 38 Athletic Trainers/Personal trainers/massage therapists/physi...
## 39 Massage Therapist / Esthetician
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist Full and Part Time
## 42 Massage Therapist
## 43 Massage Therapist "Work for the BEST!"
## 44 Women's wellness center in North Park Hiring LMT
## 45 Dual Licensed Therapist Massage and Skincare
## 46 Dual Licensed Therapist Massage and Skincare
## 47 Certified Massage Therapist
## 48 Massage Therapist
## 49 Stretch Practitioner
## 50 Massage Therapist
## 51 Massage Therapist - Part time
## 52 Licensed Massage Therapist
## 53 Athletic Trainers/Personal trainers/massage therapists/physi...
## 54 Massage Therapist / Esthetician
## 55 Licensed Massage Therapist
## 56 Massage Therapist
## 57 Massage Therapist "Work for the BEST!"
## 58 Licensed Massage Therapist Full and Part Time
## 59 Women's wellness center in North Park Hiring LMT
## 60 Dual Licensed Therapist Massage and Skincare
## 61 Dual Licensed Therapist Massage and Skincare
## HiringAgency
## 1 The KnotstopSan Diego, CA 92103 (Hillcrest area)
## 2 Girl on the Go! Night Spa3.0San Diego, CA 92102 (Golden Hill area)
## 3 Massage Heights Carmel Valley3.1San Diego, CA 92130 (Carmel Valley area)
## 4 Soothe3.7San Diego, CA
## 5 Ramsey InsightSan Diego, CA
## 6 Simply Staffing SolutionsLemon Grove, CA
## 7 Creative Wellness ChiropracticSan Diego, CA 92111
## 8 Spa KingstonSan Diego, CA 92101 (Park West area)
## 9 HEI Hotels3.3Rancho Santa Fe, CA 92067
## 10 Montage International2.9San Diego, CA
## 11 Indo-Pak Massage TherapySan Diego, CA•Remote work available
## 12 SSSolutionSan Diego, CA+2 locations
## 13 Day Spa In The CitySan Diego, CA 92120
## 14 Chiropractic Offices Of Kirsten Sage, APCEncinitas, CA 92024
## 15 4 Your Health Massage CenterSan Diego, CA 92108 (Mission Valley West area)
## 16 Massage Envy3.2Point Loma, CA+8 locations
## 17 Indo-Pak Massage TherapySan Diego, CA
## 18 VIVO HEALTH & WELLNESSLa Jolla, CA 92037
## 19 Stretch Zone2.7Encinitas, CA 92024
## 20 Eroma Day SpaEl Cajon, CA 92020
## 21 Hidden SpaSan Diego, CA 92107 (Ocean Beach area)
## 22 Massage Heights - Rancho Penasquitos3.1San Diego, CA 92129
## 23 Stretch Lab3.8San Diego, CA 92103 (Hillcrest area)
## 24 Eroma Day SpaEl Cajon, CA 92020
## 25 Massage Heights3.1San Diego, CA 92130 (Carmel Valley area)+1 location
## 26 Massage Heights3.1San Diego, CA 92127
## 27 Fix Body GroupSan Diego, CA 92128 (Rancho Bernardo area)
## 28 Massage Envy3.2San Diego, CA 92109 (Pacific Beach area)+7 locations
## 29 Rebirth MassageSan Diego, CA 92116 (North Park area)
## 30 Massage Heights - 4S Ranch3.1San Diego, CA 92127
## 31 Massage Heights3.1San Diego, CA 92127
## 32 Indo-Pak Massage TherapySan Diego, CA
## 33 VIVO HEALTH & WELLNESSLa Jolla, CA 92037
## 34 Stretch Zone2.7Encinitas, CA 92024
## 35 Eroma Day SpaEl Cajon, CA 92020
## 36 Hidden SpaSan Diego, CA 92107 (Ocean Beach area)
## 37 Massage Heights - Rancho Penasquitos3.1San Diego, CA 92129
## 38 Stretch Lab3.8San Diego, CA 92103 (Hillcrest area)
## 39 Eroma Day SpaEl Cajon, CA 92020
## 40 Massage Heights3.1San Diego, CA 92130 (Carmel Valley area)+1 location
## 41 Massage Heights3.1San Diego, CA 92127
## 42 Fix Body GroupSan Diego, CA 92128 (Rancho Bernardo area)
## 43 Massage Envy3.2San Diego, CA 92109 (Pacific Beach area)+7 locations
## 44 Rebirth MassageSan Diego, CA 92116 (North Park area)
## 45 Massage Heights - 4S Ranch3.1San Diego, CA 92127
## 46 Massage Heights3.1San Diego, CA 92127
## 47 Massage Envy3.2Point Loma, CA+8 locations
## 48 VIVO HEALTH & WELLNESSLa Jolla, CA 92037
## 49 Stretch Zone2.7Encinitas, CA 92024
## 50 Eroma Day SpaEl Cajon, CA 92020
## 51 Hidden SpaSan Diego, CA 92107 (Ocean Beach area)
## 52 Massage Heights - Rancho Penasquitos3.1San Diego, CA 92129
## 53 Stretch Lab3.8San Diego, CA 92103 (Hillcrest area)
## 54 Eroma Day SpaEl Cajon, CA 92020
## 55 Massage Heights3.1San Diego, CA 92130 (Carmel Valley area)+1 location
## 56 Fix Body GroupSan Diego, CA 92128 (Rancho Bernardo area)
## 57 Massage Envy3.2San Diego, CA 92108 (Mission Valley East area)+7 locations
## 58 Massage Heights3.1San Diego, CA 92127
## 59 Rebirth MassageSan Diego, CA 92116 (North Park area)
## 60 Massage Heights - 4S Ranch3.1San Diego, CA 92127
## 61 Massage Heights3.1San Diego, CA 92127
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 5 14 70 NA NA
## 2 1 14 70 NA NA
## 3 7 14 70 NA NA
## 4 24 14 70 NA NA
## 5 1 14 70 NA NA
## 6 4 14 70 NA NA
## 7 30 14 70 NA NA
## 8 1 14 70 NA NA
## 9 Today 14 70 NA NA
## 10 6 14 70 NA NA
## 11 30 14 70 NA NA
## 12 6 14 70 NA NA
## 13 7 14 70 NA NA
## 14 9 14 70 NA NA
## 15 30 14 70 NA NA
## 16 3 14 70 NA NA
## 17 30 14 70 NA NA
## 18 30 14 70 NA NA
## 19 27 14 70 NA NA
## 20 22 14 70 NA NA
## 21 18 14 70 NA NA
## 22 20 14 70 NA NA
## 23 30 14 70 NA NA
## 24 22 14 70 NA NA
## 25 30 14 70 NA NA
## 26 30 14 70 NA NA
## 27 30 14 70 NA NA
## 28 30 14 70 NA NA
## 29 12 14 70 NA NA
## 30 21 14 70 NA NA
## 31 30 14 70 NA NA
## 32 30 14 70 NA NA
## 33 30 14 70 NA NA
## 34 27 14 70 NA NA
## 35 22 14 70 NA NA
## 36 18 14 70 NA NA
## 37 20 14 70 NA NA
## 38 30 14 70 NA NA
## 39 22 14 70 NA NA
## 40 30 14 70 NA NA
## 41 30 14 70 NA NA
## 42 30 14 70 NA NA
## 43 30 14 70 NA NA
## 44 12 14 70 NA NA
## 45 21 14 70 NA NA
## 46 30 14 70 NA NA
## 47 3 14 70 NA NA
## 48 30 14 70 NA NA
## 49 27 14 70 NA NA
## 50 22 14 70 NA NA
## 51 18 14 70 NA NA
## 52 20 14 70 NA NA
## 53 30 14 70 NA NA
## 54 22 14 70 NA NA
## 55 30 14 70 NA NA
## 56 30 14 70 NA NA
## 57 30 14 70 NA NA
## 58 30 14 70 NA NA
## 59 12 14 70 NA NA
## 60 21 14 70 NA NA
## 61 30 14 70 NA NA
getIndeedJobData5pages("massage therapist","San Jose","CA")
## Warning in getIndeedJobData5pages("massage therapist", "San Jose", "CA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "San Jose", "CA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Certified Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist - Hiring Immediately
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist
## 7 Personal Trainer and Stretch Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist CA - San Jose
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed/Certified Massage Therapist to Join our Growing Tea...
## 15 Massage Therapist
## 16 Flexologist-Stretch Professional
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist [CUSTOMIZATION REQUIRED]
## 20 MANUAL THERAPIST / MASSAGE THERAPIST
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Stretch Service Provider
## 24 Licensed Massage Therapist - Hiring Immediately
## 25 Licensed Massage Therapist
## 26 Massage Therapist Deep Tissue preferred
## 27 Total Body Stretch Service Provider
## 28 Total Body Stretch Service Provider (FT)
## 29 Massage Therapist
## 30 Total Body Stretch Service Provider (PT)
## 31 Flexologist-Stretch Professional
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Massage Therapist [CUSTOMIZATION REQUIRED]
## 35 MANUAL THERAPIST / MASSAGE THERAPIST
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Stretch Service Provider
## 39 Licensed Massage Therapist - Hiring Immediately
## 40 Licensed Massage Therapist
## 41 Massage Therapist Deep Tissue preferred
## 42 Total Body Stretch Service Provider
## 43 Total Body Stretch Service Provider (FT)
## 44 Massage Therapist
## 45 Total Body Stretch Service Provider (PT)
## 46 Flexologist-Stretch Professional
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Massage Therapist [CUSTOMIZATION REQUIRED]
## 50 MANUAL THERAPIST / MASSAGE THERAPIST
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Stretch Service Provider
## 54 Licensed Massage Therapist - Hiring Immediately
## 55 Licensed Massage Therapist
## 56 Massage Therapist Deep Tissue preferred
## 57 Total Body Stretch Service Provider
## 58 Total Body Stretch Service Provider (FT)
## 59 Massage Therapist
## 60 Total Body Stretch Service Provider (PT)
## 61 Flexologist-Stretch Professional
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist [CUSTOMIZATION REQUIRED]
## 65 MANUAL THERAPIST / MASSAGE THERAPIST
## 66 Licensed Massage Therapist
## 67 Massage Therapist
## 68 Stretch Service Provider
## 69 Licensed Massage Therapist - Hiring Immediately
## 70 Licensed Massage Therapist
## 71 Massage Therapist Deep Tissue preferred
## 72 Total Body Stretch Service Provider
## 73 Total Body Stretch Service Provider (FT)
## 74 Massage Therapist
## 75 Total Body Stretch Service Provider (PT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$60 - $120 an hour $60 - $120 60 120
## 2 \n$28 - $30 an hour $28 - $30 28 30
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$20 - $30 an hour $20 - $30 20 30
## 5 \n$20 - $30 an hour $20 - $30 20 30
## 6 \n$30 an hour $30 30 NA
## 7 \n$48,805 - $66,000 a year $48805 - $66000 48805 66000
## 8 \n$16 - $20 an hour $16 - $20 16 20
## 9 \n$24 - $38 an hour $24 - $38 24 38
## 10 \n$28 - $30 an hour $28 - $30 28 30
## 11 \n$23 an hour $23 23 NA
## 12 \n$24 - $38 an hour $24 - $38 24 38
## 13 \n$28 - $30 an hour $28 - $30 28 30
## 14 \n$23 an hour $23 23 NA
## 15 \n$24 - $38 an hour $24 - $38 24 38
## 16 \n$28 - $30 an hour $28 - $30 28 30
## 17 \n$23 an hour $23 23 NA
## 18 \n$24 - $38 an hour $24 - $38 24 38
## 19 \n$28 - $30 an hour $28 - $30 28 30
## 20 \n$23 an hour $23 23 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 24 30 2713.95 3793.743 16
## 2 24 30 2713.95 3793.743 16
## 3 24 30 2713.95 3793.743 16
## 4 24 30 2713.95 3793.743 16
## 5 24 30 2713.95 3793.743 16
## 6 24 30 2713.95 3793.743 16
## 7 24 30 2713.95 3793.743 16
## 8 24 30 2713.95 3793.743 16
## 9 24 30 2713.95 3793.743 16
## 10 24 30 2713.95 3793.743 16
## 11 24 30 2713.95 3793.743 16
## 12 24 30 2713.95 3793.743 16
## 13 24 30 2713.95 3793.743 16
## 14 24 30 2713.95 3793.743 16
## 15 24 30 2713.95 3793.743 16
## 16 24 30 2713.95 3793.743 16
## 17 24 30 2713.95 3793.743 16
## 18 24 30 2713.95 3793.743 16
## 19 24 30 2713.95 3793.743 16
## 20 24 30 2713.95 3793.743 16
## maximumMaxSalary
## 1 66000
## 2 66000
## 3 66000
## 4 66000
## 5 66000
## 6 66000
## 7 66000
## 8 66000
## 9 66000
## 10 66000
## 11 66000
## 12 66000
## 13 66000
## 14 66000
## 15 66000
## 16 66000
## 17 66000
## 18 66000
## 19 66000
## 20 66000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 Just posted
## 3 24
## 4 30
## 5 5
## 6 30
## 7 6
## 8 30
## 9 20
## 10 14
## 11 30
## 12 5
## 13 27
## 14 26
## 15 30
## 16 30
## 17 30
## 18 30
## 19 30
## 20 30
## 21 24
## 22 30
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 12
## 29 30
## 30 12
## 31 30
## 32 30
## 33 30
## 34 30
## 35 30
## 36 24
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 12
## 44 30
## 45 12
## 46 30
## 47 30
## 48 30
## 49 30
## 50 30
## 51 24
## 52 30
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 12
## 59 30
## 60 12
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
## 66 24
## 67 30
## 68 30
## 69 30
## 70 30
## 71 30
## 72 30
## 73 12
## 74 30
## 75 12
##
## [[4]]
## HiringAgency
## 1 labarre studiosSan Jose, CA 95126 (Downtown area)
## 2 Exhale. Day Spa3.7Scotts Valley, CA 95066
## 3 Soothe3.7Silicon Valley, CA
## 4 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 5 Indo-Pak Massage TherapyPalo Alto, CA•Remote work available
## 6 Elements3.6Los Gatos, CA 95032+2 locations
## 7 Stretchlab Corporate3.8Mountain View, CA
## 8 Rosewood Hotels & Resorts4.1San Martin, CA 95046
## 9 Mind Body MotionMorgan Hill, CA 95037
## 10 Whole Body Chiropractic & MassageSan Jose, CA 95128 (West San Jose area)
## 11 Total Woman Gym and Spa2.9San Jose, CA 95130 (West San Jose area)
## 12 Massage Envy3.2San Jose, CA 95130+3 locations
## 13 Elements Massage Sunnyvale3.6Sunnyvale, CA 94087 (De Anza area)+1 location
## 14 Milpitas Spine CenterMilpitas, CA 95035
## 15 Berryessa ChiropracticSan Jose, CA 95132 (Berryessa area)
## 16 StretchLab3.8San Jose, CA
## 17 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 18 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 19 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 20 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 21 Soothe3.7Silicon Valley, CA
## 22 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 23 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 24 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 25 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 26 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 27 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 28 Massage Envy3.2Pleasanton, CA 94566
## 29 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 30 Massage Envy3.2Pleasanton, CA 94566
## 31 StretchLab3.8San Jose, CA
## 32 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 33 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 34 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 35 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 36 Soothe3.7Silicon Valley, CA
## 37 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 38 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 39 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 40 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 41 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 42 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 43 Massage Envy3.2Pleasanton, CA 94566
## 44 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 45 Massage Envy3.2Pleasanton, CA 94566
## 46 StretchLab3.8San Jose, CA
## 47 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 48 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 49 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 50 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 51 Soothe3.7Silicon Valley, CA
## 52 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 53 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 54 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 55 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 56 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 57 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 58 Massage Envy3.2Pleasanton, CA 94566
## 59 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 60 Massage Envy3.2Pleasanton, CA 94566
## 61 StretchLab3.8San Jose, CA
## 62 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 63 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 64 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 65 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 66 Soothe3.7Silicon Valley, CA
## 67 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 68 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 69 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 70 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 71 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 72 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 73 Massage Envy3.2Pleasanton, CA 94566
## 74 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 75 Massage Envy3.2Pleasanton, CA 94566
##
## [[5]]
## Salary salary minSalary maxSalary
## 7 \n$48,805 - $66,000 a year $48805 - $66000 48805 66000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 7 48805 66000 48805 66000 48805
## maximumMaxSalary
## 7 66000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$60 - $120 an hour $60 - $120 60 120 24
## 2 \n$28 - $30 an hour $28 - $30 28 30 24
## 4 \n$20 - $30 an hour $20 - $30 20 30 24
## 5 \n$20 - $30 an hour $20 - $30 20 30 24
## 6 \n$30 an hour $30 30 NA 24
## 8 \n$16 - $20 an hour $16 - $20 16 20 24
## 9 \n$24 - $38 an hour $24 - $38 24 38 24
## 10 \n$28 - $30 an hour $28 - $30 28 30 24
## 11 \n$23 an hour $23 23 NA 24
## 12 \n$24 - $38 an hour $24 - $38 24 38 24
## 13 \n$28 - $30 an hour $28 - $30 28 30 24
## 14 \n$23 an hour $23 23 NA 24
## 15 \n$24 - $38 an hour $24 - $38 24 38 24
## 16 \n$28 - $30 an hour $28 - $30 28 30 24
## 17 \n$23 an hour $23 23 NA 24
## 18 \n$24 - $38 an hour $24 - $38 24 38 24
## 19 \n$28 - $30 an hour $28 - $30 28 30 24
## 20 \n$23 an hour $23 23 NA 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 26.33333 38.61538 16 120
## 2 30 26.33333 38.61538 16 120
## 4 30 26.33333 38.61538 16 120
## 5 30 26.33333 38.61538 16 120
## 6 30 26.33333 38.61538 16 120
## 8 30 26.33333 38.61538 16 120
## 9 30 26.33333 38.61538 16 120
## 10 30 26.33333 38.61538 16 120
## 11 30 26.33333 38.61538 16 120
## 12 30 26.33333 38.61538 16 120
## 13 30 26.33333 38.61538 16 120
## 14 30 26.33333 38.61538 16 120
## 15 30 26.33333 38.61538 16 120
## 16 30 26.33333 38.61538 16 120
## 17 30 26.33333 38.61538 16 120
## 18 30 26.33333 38.61538 16 120
## 19 30 26.33333 38.61538 16 120
## 20 30 26.33333 38.61538 16 120
##
## [[7]]
## city state
## 1 San Jose CA
## 2 San Jose CA
## 3 San Jose CA
## 4 San Jose CA
## 5 San Jose CA
## 6 San Jose CA
## 7 San Jose CA
## 8 San Jose CA
## 9 San Jose CA
## 10 San Jose CA
## 11 San Jose CA
## 12 San Jose CA
## 13 San Jose CA
## 14 San Jose CA
## 15 San Jose CA
## 16 San Jose CA
## 17 San Jose CA
## 18 San Jose CA
## 19 San Jose CA
## 20 San Jose CA
## 21 San Jose CA
## 22 San Jose CA
## 23 San Jose CA
## 24 San Jose CA
## 25 San Jose CA
## 26 San Jose CA
## 27 San Jose CA
## 28 San Jose CA
## 29 San Jose CA
## 30 San Jose CA
## 31 San Jose CA
## 32 San Jose CA
## 33 San Jose CA
## 34 San Jose CA
## 35 San Jose CA
## 36 San Jose CA
## 37 San Jose CA
## 38 San Jose CA
## 39 San Jose CA
## 40 San Jose CA
## 41 San Jose CA
## 42 San Jose CA
## 43 San Jose CA
## 44 San Jose CA
## 45 San Jose CA
## 46 San Jose CA
## 47 San Jose CA
## 48 San Jose CA
## 49 San Jose CA
## 50 San Jose CA
## 51 San Jose CA
## 52 San Jose CA
## 53 San Jose CA
## 54 San Jose CA
## 55 San Jose CA
## 56 San Jose CA
## 57 San Jose CA
## 58 San Jose CA
## 59 San Jose CA
## 60 San Jose CA
## 61 San Jose CA
## 62 San Jose CA
## 63 San Jose CA
## 64 San Jose CA
## 65 San Jose CA
## 66 San Jose CA
## 67 San Jose CA
## 68 San Jose CA
## 69 San Jose CA
## 70 San Jose CA
## 71 San Jose CA
## 72 San Jose CA
## 73 San Jose CA
## 74 San Jose CA
## 75 San Jose CA
## jobTitle
## 1 Licensed Massage Therapist
## 2 Certified Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist - Hiring Immediately
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist
## 7 Personal Trainer and Stretch Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist CA - San Jose
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed/Certified Massage Therapist to Join our Growing Tea...
## 15 Massage Therapist
## 16 Flexologist-Stretch Professional
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist [CUSTOMIZATION REQUIRED]
## 20 MANUAL THERAPIST / MASSAGE THERAPIST
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Stretch Service Provider
## 24 Licensed Massage Therapist - Hiring Immediately
## 25 Licensed Massage Therapist
## 26 Massage Therapist Deep Tissue preferred
## 27 Total Body Stretch Service Provider
## 28 Total Body Stretch Service Provider (FT)
## 29 Massage Therapist
## 30 Total Body Stretch Service Provider (PT)
## 31 Flexologist-Stretch Professional
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Massage Therapist [CUSTOMIZATION REQUIRED]
## 35 MANUAL THERAPIST / MASSAGE THERAPIST
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Stretch Service Provider
## 39 Licensed Massage Therapist - Hiring Immediately
## 40 Licensed Massage Therapist
## 41 Massage Therapist Deep Tissue preferred
## 42 Total Body Stretch Service Provider
## 43 Total Body Stretch Service Provider (FT)
## 44 Massage Therapist
## 45 Total Body Stretch Service Provider (PT)
## 46 Flexologist-Stretch Professional
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Massage Therapist [CUSTOMIZATION REQUIRED]
## 50 MANUAL THERAPIST / MASSAGE THERAPIST
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Stretch Service Provider
## 54 Licensed Massage Therapist - Hiring Immediately
## 55 Licensed Massage Therapist
## 56 Massage Therapist Deep Tissue preferred
## 57 Total Body Stretch Service Provider
## 58 Total Body Stretch Service Provider (FT)
## 59 Massage Therapist
## 60 Total Body Stretch Service Provider (PT)
## 61 Flexologist-Stretch Professional
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist [CUSTOMIZATION REQUIRED]
## 65 MANUAL THERAPIST / MASSAGE THERAPIST
## 66 Licensed Massage Therapist
## 67 Massage Therapist
## 68 Stretch Service Provider
## 69 Licensed Massage Therapist - Hiring Immediately
## 70 Licensed Massage Therapist
## 71 Massage Therapist Deep Tissue preferred
## 72 Total Body Stretch Service Provider
## 73 Total Body Stretch Service Provider (FT)
## 74 Massage Therapist
## 75 Total Body Stretch Service Provider (PT)
## HiringAgency
## 1 labarre studiosSan Jose, CA 95126 (Downtown area)
## 2 Exhale. Day Spa3.7Scotts Valley, CA 95066
## 3 Soothe3.7Silicon Valley, CA
## 4 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 5 Indo-Pak Massage TherapyPalo Alto, CA•Remote work available
## 6 Elements3.6Los Gatos, CA 95032+2 locations
## 7 Stretchlab Corporate3.8Mountain View, CA
## 8 Rosewood Hotels & Resorts4.1San Martin, CA 95046
## 9 Mind Body MotionMorgan Hill, CA 95037
## 10 Whole Body Chiropractic & MassageSan Jose, CA 95128 (West San Jose area)
## 11 Total Woman Gym and Spa2.9San Jose, CA 95130 (West San Jose area)
## 12 Massage Envy3.2San Jose, CA 95130+3 locations
## 13 Elements Massage Sunnyvale3.6Sunnyvale, CA 94087 (De Anza area)+1 location
## 14 Milpitas Spine CenterMilpitas, CA 95035
## 15 Berryessa ChiropracticSan Jose, CA 95132 (Berryessa area)
## 16 StretchLab3.8San Jose, CA
## 17 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 18 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 19 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 20 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 21 Soothe3.7Silicon Valley, CA
## 22 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 23 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 24 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 25 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 26 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 27 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 28 Massage Envy3.2Pleasanton, CA 94566
## 29 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 30 Massage Envy3.2Pleasanton, CA 94566
## 31 StretchLab3.8San Jose, CA
## 32 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 33 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 34 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 35 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 36 Soothe3.7Silicon Valley, CA
## 37 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 38 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 39 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 40 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 41 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 42 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 43 Massage Envy3.2Pleasanton, CA 94566
## 44 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 45 Massage Envy3.2Pleasanton, CA 94566
## 46 StretchLab3.8San Jose, CA
## 47 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 48 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 49 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 50 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 51 Soothe3.7Silicon Valley, CA
## 52 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 53 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 54 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 55 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 56 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 57 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 58 Massage Envy3.2Pleasanton, CA 94566
## 59 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 60 Massage Envy3.2Pleasanton, CA 94566
## 61 StretchLab3.8San Jose, CA
## 62 Massage Envy3.2San Jose, CA 95125 (Fairgrounds area)+11 locations
## 63 Kneadful Touch Therapeutic MassageUnion City, CA 94587
## 64 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+1 location
## 65 Complete Therapeutic MassageMenlo Park, CA 94025 (Downtown Menlo Park area)
## 66 Soothe3.7Silicon Valley, CA
## 67 Retreat Salon4.5Redwood City, CA 94063 (Downtown area)
## 68 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)
## 69 LifeGiving Chiropractic4.0Campbell, CA (East Campbell area)
## 70 Massage Therapy Center3.2Palo Alto, CA 94306 (Evergreen Park area)
## 71 Massage Envy3.2Cupertino, CA 95014 (Jollyman area)+1 location
## 72 Massage Envy3.2Campbell, CA 95008 (Pruneyard area)+8 locations
## 73 Massage Envy3.2Pleasanton, CA 94566
## 74 Claudia's Body & Skin Care CenterHayward, CA 94545 (Southgate area)
## 75 Massage Envy3.2Pleasanton, CA 94566
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 16 120 48805 66000
## 2 Just posted 16 120 48805 66000
## 3 24 16 120 48805 66000
## 4 30 16 120 48805 66000
## 5 5 16 120 48805 66000
## 6 30 16 120 48805 66000
## 7 6 16 120 48805 66000
## 8 30 16 120 48805 66000
## 9 20 16 120 48805 66000
## 10 14 16 120 48805 66000
## 11 30 16 120 48805 66000
## 12 5 16 120 48805 66000
## 13 27 16 120 48805 66000
## 14 26 16 120 48805 66000
## 15 30 16 120 48805 66000
## 16 30 16 120 48805 66000
## 17 30 16 120 48805 66000
## 18 30 16 120 48805 66000
## 19 30 16 120 48805 66000
## 20 30 16 120 48805 66000
## 21 24 16 120 48805 66000
## 22 30 16 120 48805 66000
## 23 30 16 120 48805 66000
## 24 30 16 120 48805 66000
## 25 30 16 120 48805 66000
## 26 30 16 120 48805 66000
## 27 30 16 120 48805 66000
## 28 12 16 120 48805 66000
## 29 30 16 120 48805 66000
## 30 12 16 120 48805 66000
## 31 30 16 120 48805 66000
## 32 30 16 120 48805 66000
## 33 30 16 120 48805 66000
## 34 30 16 120 48805 66000
## 35 30 16 120 48805 66000
## 36 24 16 120 48805 66000
## 37 30 16 120 48805 66000
## 38 30 16 120 48805 66000
## 39 30 16 120 48805 66000
## 40 30 16 120 48805 66000
## 41 30 16 120 48805 66000
## 42 30 16 120 48805 66000
## 43 12 16 120 48805 66000
## 44 30 16 120 48805 66000
## 45 12 16 120 48805 66000
## 46 30 16 120 48805 66000
## 47 30 16 120 48805 66000
## 48 30 16 120 48805 66000
## 49 30 16 120 48805 66000
## 50 30 16 120 48805 66000
## 51 24 16 120 48805 66000
## 52 30 16 120 48805 66000
## 53 30 16 120 48805 66000
## 54 30 16 120 48805 66000
## 55 30 16 120 48805 66000
## 56 30 16 120 48805 66000
## 57 30 16 120 48805 66000
## 58 12 16 120 48805 66000
## 59 30 16 120 48805 66000
## 60 12 16 120 48805 66000
## 61 30 16 120 48805 66000
## 62 30 16 120 48805 66000
## 63 30 16 120 48805 66000
## 64 30 16 120 48805 66000
## 65 30 16 120 48805 66000
## 66 24 16 120 48805 66000
## 67 30 16 120 48805 66000
## 68 30 16 120 48805 66000
## 69 30 16 120 48805 66000
## 70 30 16 120 48805 66000
## 71 30 16 120 48805 66000
## 72 30 16 120 48805 66000
## 73 12 16 120 48805 66000
## 74 30 16 120 48805 66000
## 75 12 16 120 48805 66000
Colorado Denver, Colorada Springs, Aurora
getIndeedJobData5pages("massage therapist", "Denver","CO")
## Warning in getIndeedJobData5pages("massage therapist", "Denver", "CO"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Denver", "CO"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Denver", "CO"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Liscensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist
## 4 REGISTERED MASSAGE THERAPIST
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist (2yrs experience required)
## 13 Massage Therapist - Have a Full Schedule!
## 14 Massage Therapist
## 15 Massage Therapist - Independent Contractor
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 MASSAGE THERAPIST
## 19 Massage Therapist
## 20 Licensed Massage Therapist
## 21 Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Covid-19 Compliant Massage Studio in Lodo Seeking LMTs!
## 28 Massage Therapist- Full or Part Time (Denver, CO)
## 29 Licensed Massage Therapist (LMT)
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Massage Therapist
## 33 Massage Therapist - Independent Contractor
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Stretch Practitioner
## 39 Part-time Massage Therapist
## 40 Massage Therapist
## 41 Massage Therapist - Independent Contractor
## 42 Massage Therapist
## 43 Massage Therapist - Full Time
## 44 Massage Therapy / Physical Therapy / Personal Training / Yog...
## 45 LifeSpa Massage Therapist - Full-Time
## 46 Massage Therapist
## 47 Massage Therapist (2yrs experience required)
## 48 Massage Therapist
## 49 Massage Therapist Career 2
## 50 Job Fair Saturday! - Massage Therapist
## 51 Sports Massage Therapist
## 52 Mobile Massage Therapist
## 53 Massage Therapist
## 54 Massage Therapist
## 55 Licensed Sports Massage Therapist
## 56 Licensed Massage Therapist - Great Compensation and Benefits
## 57 Massage Therapist - Flex Schedule
## 58 Licensed Massage Therapist
## 59 Massage Therapist (2yrs experience required)
## 60 Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist
## 65 Massage Therapist - Independent Contractor
## 66 Licensed Massage Therapist (LMT)
## 67 Massage Therapist Career 2
## 68 Licensed Massage Therapist
## 69 Licensed Massage Therapist LMT COVID Compliant Workplace
## 70 Massage Therapist
## 71 Licensed Massage Therapist
## 72 Massage Therapy Supervisor
## 73 Fitness and Stretch Professional Flexologist
## 74 Licensed Massage Therapist
## 75 Salon Massage Therapist
## 76 Licensed Massage Therapist
## 77 Hiring Male or Female Massage Therapist
## 78 Massage Therapist to join our great Team
## 79 Massage Therapist to join our great Team
## 80 Licensed Massage Therapist in COVID Safe Environment
## 81 Part Time Massage Therapist-Great Compensation, Fun Environm...
## 82 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$40 an hour $40 40.00 NA
## 2 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000.00
## 3 \n$25 - $45 an hour $25 - $45 25.00 45.00
## 4 \n$50 - $80 an hour ++ $50 - $80 50.00 80.00
## 5 \n$18 - $30 an hour $18 - $30 18.00 30.00
## 6 \n$27 - $28 an hour $27 - $28 27.00 28.00
## 7 \n$3,020 - $4,860 a month $3020 - $4860 3020.00 4860.00
## 8 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 9 \n$18 - $30 an hour $18 - $30 18.00 30.00
## 10 \n$21 - $25 an hour $21 - $25 21.00 25.00
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000.00
## 12 \n$28 - $36 an hour $28 - $36 28.00 36.00
## 13 \n$26 - $30 an hour $26 - $30 26.00 30.00
## 14 \n$20 - $40 an hour $20 - $40 20.00 40.00
## 15 \n$28.50 - $32.25 an hour $28.50 - $32.25 28.50 32.25
## 16 \n$8.98 an hour $8.98 8.98 NA
## 17 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 18 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 19 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000.00
## 20 \n$22 - $26 an hour $22 - $26 22.00 26.00
## 21 \n$35 - $38 an hour $35 - $38 35.00 38.00
## 22 \n$20 - $26 an hour $20 - $26 20.00 26.00
## 23 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 24 \n$28,000 - $36,000 a year $28000 - $36000 28000.00 36000.00
## 25 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 26 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 27 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000.00
## 28 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 29 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 30 \n$17 - $22 an hour $17 - $22 17.00 22.00
## 31 \n$35 - $55 an hour $35 - $55 35.00 55.00
## 32 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 33 \n$3,020 - $4,860 a month $3020 - $4860 3020.00 4860.00
## 34 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000.00
## 35 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 36 \n$45 - $70 an hour $45 - $70 45.00 70.00
## 37 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 38 \n$40 - $45 an hour $40 - $45 40.00 45.00
## 39 \n$20 - $40 an hour ++ $20 - $40 20.00 40.00
## 40 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 41 \n$28,000 - $36,000 a year $28000 - $36000 28000.00 36000.00
## 42 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 43 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000.00
## 44 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 45 \n$3,020 - $4,860 a month $3020 - $4860 3020.00 4860.00
## 46 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 47 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000.00
## 48 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 49 \n$49,000 a year $49000 49000.00 NA
## 50 \nUp to $50,000 a year $50000 50000.00 NA
## 51 \n$23 - $25 an hour $23 - $25 23.00 25.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 35 8333.402 9681.661 8.98
## 2 30 35 8333.402 9681.661 8.98
## 3 30 35 8333.402 9681.661 8.98
## 4 30 35 8333.402 9681.661 8.98
## 5 30 35 8333.402 9681.661 8.98
## 6 30 35 8333.402 9681.661 8.98
## 7 30 35 8333.402 9681.661 8.98
## 8 30 35 8333.402 9681.661 8.98
## 9 30 35 8333.402 9681.661 8.98
## 10 30 35 8333.402 9681.661 8.98
## 11 30 35 8333.402 9681.661 8.98
## 12 30 35 8333.402 9681.661 8.98
## 13 30 35 8333.402 9681.661 8.98
## 14 30 35 8333.402 9681.661 8.98
## 15 30 35 8333.402 9681.661 8.98
## 16 30 35 8333.402 9681.661 8.98
## 17 30 35 8333.402 9681.661 8.98
## 18 30 35 8333.402 9681.661 8.98
## 19 30 35 8333.402 9681.661 8.98
## 20 30 35 8333.402 9681.661 8.98
## 21 30 35 8333.402 9681.661 8.98
## 22 30 35 8333.402 9681.661 8.98
## 23 30 35 8333.402 9681.661 8.98
## 24 30 35 8333.402 9681.661 8.98
## 25 30 35 8333.402 9681.661 8.98
## 26 30 35 8333.402 9681.661 8.98
## 27 30 35 8333.402 9681.661 8.98
## 28 30 35 8333.402 9681.661 8.98
## 29 30 35 8333.402 9681.661 8.98
## 30 30 35 8333.402 9681.661 8.98
## 31 30 35 8333.402 9681.661 8.98
## 32 30 35 8333.402 9681.661 8.98
## 33 30 35 8333.402 9681.661 8.98
## 34 30 35 8333.402 9681.661 8.98
## 35 30 35 8333.402 9681.661 8.98
## 36 30 35 8333.402 9681.661 8.98
## 37 30 35 8333.402 9681.661 8.98
## 38 30 35 8333.402 9681.661 8.98
## 39 30 35 8333.402 9681.661 8.98
## 40 30 35 8333.402 9681.661 8.98
## 41 30 35 8333.402 9681.661 8.98
## 42 30 35 8333.402 9681.661 8.98
## 43 30 35 8333.402 9681.661 8.98
## 44 30 35 8333.402 9681.661 8.98
## 45 30 35 8333.402 9681.661 8.98
## 46 30 35 8333.402 9681.661 8.98
## 47 30 35 8333.402 9681.661 8.98
## 48 30 35 8333.402 9681.661 8.98
## 49 30 35 8333.402 9681.661 8.98
## 50 30 35 8333.402 9681.661 8.98
## 51 30 35 8333.402 9681.661 8.98
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
## 26 62000
## 27 62000
## 28 62000
## 29 62000
## 30 62000
## 31 62000
## 32 62000
## 33 62000
## 34 62000
## 35 62000
## 36 62000
## 37 62000
## 38 62000
## 39 62000
## 40 62000
## 41 62000
## 42 62000
## 43 62000
## 44 62000
## 45 62000
## 46 62000
## 47 62000
## 48 62000
## 49 62000
## 50 62000
## 51 62000
##
## [[3]]
## date_daysAgo
## 1 4
## 2 18
## 3 22
## 4 30
## 5 Today
## 6 18
## 7 2
## 8 6
## 9 30
## 10 30
## 11 18
## 12 30
## 13 9
## 14 30
## 15 5
## 16 30
## 17 16
## 18 20
## 19 30
## 20 30
## 21 11
## 22 27
## 23 1
## 24 14
## 25 30
## 26 1
## 27 27
## 28 30
## 29 28
## 30 11
## 31 30
## 32 8
## 33 30
## 34 6
## 35 18
## 36 18
## 37 11
## 38 30
## 39 12
## 40 30
## 41 10
## 42 30
## 43 30
## 44 30
## 45 30
## 46 Today
## 47 30
## 48 30
## 49 30
## 50 7
## 51 30
## 52 30
## 53 15
## 54 30
## 55 30
## 56 30
## 57 30
## 58 30
## 59 30
## 60 8
## 61 18
## 62 18
## 63 30
## 64 30
## 65 30
## 66 6
## 67 30
## 68 30
## 69 30
## 70 8
## 71 26
## 72 30
## 73 30
## 74 30
## 75 30
## 76 24
## 77 30
## 78 30
## 79 20
## 80 14
## 81 30
## 82 30
##
## [[4]]
## HiringAgency
## 1 Progressive Health Center4.3Denver, CO 80218 (City Park West area)
## 2 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)
## 3 Jalan Facial Spa4.9Denver, CO 80218 (North Capitol Hill area)
## 4 Mountainview Health & WellnessWestminster, CO
## 5 Sage Hospitality3.3Denver, CO (Union Station area)
## 6 Meadowsweet Gifts & WellnessMorrison, CO 80465
## 7 Bodhi Body StudiosBroomfield, CO 80021
## 8 Elevation Chiropractic & WellnessDenver, CO 80246 (Belcaro area)
## 9 Massage HeightsThornton, CO 80023
## 10 Elements3.6Denver, CO 80218 (Country Club area)+11 locations
## 11 5 Star Salt CavesDenver, CO 80209 (Washington Park West area)
## 12 Integrative Health and RehabilitationDenver, CO 80212 (Northwestern Denver area)
## 13 Bodhi Body StudiosBroomfield, CO 80021
## 14 Cherry Creek Wellness Center, Inc3.6Wheat Ridge, CO 80033
## 15 Indo-Pak Massage TherapyBoulder, CO+1 location•Remote work available
## 16 White Lotus TherapeuticsDenver, CO 80211 (Sloan Lake area)
## 17 Luna Massage And WellnessDenver, CO 80205 (Five Points area)
## 18 Blue Creek therapeutic health spaDenver, CO 80238 (Stapleton area)
## 19 Stretch Lab3.8Denver, CO
## 20 Indulgences Day SpaDenver, CO 80211 (Sunnyside area)
## 21 Omni Hotels & Resorts3.8Broomfield, CO 80021 (Interlocken area)
## 22 Elements Massage3.6Aurora, CO 80016
## 23 100% Chiropractic4.0Superior, CO 80027
## 24 Summit Fitness4.4Denver, CO 80222 (Virginia Village area)
## 25 Symmetry360Denver, CO 80211 (Highland area)+1 location
## 26 Hand & Stone Massage and Facial Spa - Cherry Creek3.0Denver, CO 80206 (Central East Denver area)+8 locations
## 27 Elixir Mind Body Massage3.6Denver, CO (Union Station area)
## 28 The NOW, LLCDenver, CO 80206 (Central East Denver area)
## 29 Cornerstone Chiropractic & AcupunctureLouisville, CO 80027
## 30 Massage Green Spa - SouthlandsAurora, CO 80016
## 31 100% Chiropractic4.0Castle Rock, CO 80104
## 32 Horizon Chiropractic5.0Thornton, CO 80602
## 33 LoDo Massage StudiosDenver, CO (Five Points area)
## 34 Elements MassageDenver, CO 80222 (Hampden South area)
## 35 Elements Massage3.6Parker, CO 80134
## 36 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)
## 37 The Woodhouse Day Spa - Denver & LittletonDenver, CO 80218 (Central East Denver area)
## 38 Stretch Zone2.7Denver, CO
## 39 Healing Solutions Inc.3.6Broomfield, CO 80020
## 40 Mind Body Spa Holistic Wellness CenterLittleton, CO 80127
## 41 Integrated HealthCentennial, CO 80112
## 42 Columbine Country Club2.5Littleton, CO 80123
## 43 Life Time3.6Broomfield, CO 80021+3 locations
## 44 StretchLab3.8Denver, CO
## 45 Life Time3.6Westminster, CO 80020
## 46 Massage Envy3.2Castle Rock, CO 80108+5 locations
## 47 Integrative Health and RehabilitationDenver, CO 80212 (Northwestern Denver area)
## 48 Massage HeightsThornton, CO 80023
## 49 Symmetry360 MassageDenver, CO 80211 (Highland area)
## 50 WTS International3.3Lakewood, CO 80123
## 51 Colorado Sports MassageBoulder, CO 80303 (Southeast Boulder area)
## 52 Indo-Pak Massage TherapyDenver, CO+2 locations
## 53 Mountain View Pain CenterLone Tree, CO 80124+1 location
## 54 Hand and Stone3.0Denver, CO 80202 (Lodo area)
## 55 The FAST Lab, LLCCentennial, CO 80111
## 56 Life Time3.6Centennial, CO
## 57 Symmetry360Denver, CO 80211 (Highland area)
## 58 Spavia Day Spa3.3Greenwood Village, CO 80111+4 locations
## 59 Integrative Health and RehabilitationDenver, CO 80212 (Northwestern Denver area)
## 60 Horizon Chiropractic5.0Thornton, CO 80602
## 61 Elements Massage3.6Parker, CO 80134
## 62 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)
## 63 100% Chiropractic4.0Castle Rock, CO 80104
## 64 Massage HeightsThornton, CO 80023
## 65 LoDo Massage StudiosDenver, CO (Five Points area)
## 66 Elements MassageDenver, CO 80222 (Hampden South area)
## 67 Symmetry360 MassageDenver, CO 80211 (Highland area)
## 68 Kalologie SkincareHighlands Ranch, CO
## 69 Hand and Stone3.0Denver, CO 80231
## 70 WTS Spa and Fitness3.3Lakewood, CO 80123
## 71 Selbo TherapeuticsWestminster, CO 80234
## 72 The Child and Family Therapy Center of Denver4.6Greenwood Village, CO 80111
## 73 Stretch Lab3.8Denver, CO
## 74 Massage Heights - North ThorntonThornton, CO 80023
## 75 JCPenney3.7Lone Tree, CO 80124
## 76 Soothe3.7Denver, CO 80202 (Central Business District area)
## 77 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 78 Massage Heights3.1Thornton, CO 80023
## 79 Massage Heights - North ThorntonThornton, CO 80023
## 80 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 81 Life Time3.6Centennial, CO
## 82 Massage Heights3.1Thornton, CO 80023+1 location
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 19 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 24 \n$28,000 - $36,000 a year $28000 - $36000 28000 36000
## 26 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 27 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 34 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 41 \n$28,000 - $36,000 a year $28000 - $36000 28000 36000
## 42 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 43 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 47 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 49 \n$49,000 a year $49000 49000 NA
## 50 \nUp to $50,000 a year $50000 50000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 35000 50000 34166.67 49600 25000
## 19 35000 50000 34166.67 49600 25000
## 24 35000 50000 34166.67 49600 25000
## 26 35000 50000 34166.67 49600 25000
## 27 35000 50000 34166.67 49600 25000
## 34 35000 50000 34166.67 49600 25000
## 41 35000 50000 34166.67 49600 25000
## 42 35000 50000 34166.67 49600 25000
## 43 35000 50000 34166.67 49600 25000
## 47 35000 50000 34166.67 49600 25000
## 49 35000 50000 34166.67 49600 25000
## 50 35000 50000 34166.67 49600 25000
## maximumMaxSalary
## 2 62000
## 19 62000
## 24 62000
## 26 62000
## 27 62000
## 34 62000
## 41 62000
## 42 62000
## 43 62000
## 47 62000
## 49 62000
## 50 62000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$40 an hour $40 40.00 NA
## 3 \n$25 - $45 an hour $25 - $45 25.00 45.00
## 4 \n$50 - $80 an hour ++ $50 - $80 50.00 80.00
## 5 \n$18 - $30 an hour $18 - $30 18.00 30.00
## 6 \n$27 - $28 an hour $27 - $28 27.00 28.00
## 8 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 9 \n$18 - $30 an hour $18 - $30 18.00 30.00
## 10 \n$21 - $25 an hour $21 - $25 21.00 25.00
## 12 \n$28 - $36 an hour $28 - $36 28.00 36.00
## 13 \n$26 - $30 an hour $26 - $30 26.00 30.00
## 14 \n$20 - $40 an hour $20 - $40 20.00 40.00
## 15 \n$28.50 - $32.25 an hour $28.50 - $32.25 28.50 32.25
## 16 \n$8.98 an hour $8.98 8.98 NA
## 17 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 18 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 20 \n$22 - $26 an hour $22 - $26 22.00 26.00
## 21 \n$35 - $38 an hour $35 - $38 35.00 38.00
## 22 \n$20 - $26 an hour $20 - $26 20.00 26.00
## 23 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 25 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 28 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 29 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 30 \n$17 - $22 an hour $17 - $22 17.00 22.00
## 31 \n$35 - $55 an hour $35 - $55 35.00 55.00
## 32 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 35 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 36 \n$45 - $70 an hour $45 - $70 45.00 70.00
## 37 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 38 \n$40 - $45 an hour $40 - $45 40.00 45.00
## 39 \n$20 - $40 an hour ++ $20 - $40 20.00 40.00
## 40 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 44 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 46 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 48 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 51 \n$23 - $25 an hour $23 - $25 23.00 25.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 35 26.95657 36.94697 8.98
## 3 25 35 26.95657 36.94697 8.98
## 4 25 35 26.95657 36.94697 8.98
## 5 25 35 26.95657 36.94697 8.98
## 6 25 35 26.95657 36.94697 8.98
## 8 25 35 26.95657 36.94697 8.98
## 9 25 35 26.95657 36.94697 8.98
## 10 25 35 26.95657 36.94697 8.98
## 12 25 35 26.95657 36.94697 8.98
## 13 25 35 26.95657 36.94697 8.98
## 14 25 35 26.95657 36.94697 8.98
## 15 25 35 26.95657 36.94697 8.98
## 16 25 35 26.95657 36.94697 8.98
## 17 25 35 26.95657 36.94697 8.98
## 18 25 35 26.95657 36.94697 8.98
## 20 25 35 26.95657 36.94697 8.98
## 21 25 35 26.95657 36.94697 8.98
## 22 25 35 26.95657 36.94697 8.98
## 23 25 35 26.95657 36.94697 8.98
## 25 25 35 26.95657 36.94697 8.98
## 28 25 35 26.95657 36.94697 8.98
## 29 25 35 26.95657 36.94697 8.98
## 30 25 35 26.95657 36.94697 8.98
## 31 25 35 26.95657 36.94697 8.98
## 32 25 35 26.95657 36.94697 8.98
## 35 25 35 26.95657 36.94697 8.98
## 36 25 35 26.95657 36.94697 8.98
## 37 25 35 26.95657 36.94697 8.98
## 38 25 35 26.95657 36.94697 8.98
## 39 25 35 26.95657 36.94697 8.98
## 40 25 35 26.95657 36.94697 8.98
## 44 25 35 26.95657 36.94697 8.98
## 46 25 35 26.95657 36.94697 8.98
## 48 25 35 26.95657 36.94697 8.98
## 51 25 35 26.95657 36.94697 8.98
## maximumMaxSalary
## 1 80
## 3 80
## 4 80
## 5 80
## 6 80
## 8 80
## 9 80
## 10 80
## 12 80
## 13 80
## 14 80
## 15 80
## 16 80
## 17 80
## 18 80
## 20 80
## 21 80
## 22 80
## 23 80
## 25 80
## 28 80
## 29 80
## 30 80
## 31 80
## 32 80
## 35 80
## 36 80
## 37 80
## 38 80
## 39 80
## 40 80
## 44 80
## 46 80
## 48 80
## 51 80
##
## [[7]]
## city state jobTitle
## 1 Denver CO Liscensed Massage Therapist
## 2 Denver CO Licensed Massage Therapist
## 3 Denver CO Massage Therapist
## 4 Denver CO REGISTERED MASSAGE THERAPIST
## 5 Denver CO Massage Therapist
## 6 Denver CO Massage Therapist
## 7 Denver CO Massage Therapist
## 8 Denver CO Massage Therapist
## 9 Denver CO Massage Therapist
## 10 Denver CO Massage Therapist
## 11 Denver CO Massage Therapist
## 12 Denver CO Massage Therapist (2yrs experience required)
## 13 Denver CO Massage Therapist - Have a Full Schedule!
## 14 Denver CO Massage Therapist
## 15 Denver CO Massage Therapist - Independent Contractor
## 16 Denver CO Massage Therapist
## 17 Denver CO Licensed Massage Therapist
## 18 Denver CO MASSAGE THERAPIST
## 19 Denver CO Massage Therapist
## 20 Denver CO Licensed Massage Therapist
## 21 Denver CO Massage Therapist
## 22 Denver CO Massage Therapist
## 23 Denver CO Licensed Massage Therapist
## 24 Denver CO Massage Therapist
## 25 Denver CO Massage Therapist
## 26 Denver CO Licensed Massage Therapist
## 27 Denver CO Covid-19 Compliant Massage Studio in Lodo Seeking LMTs!
## 28 Denver CO Massage Therapist- Full or Part Time (Denver, CO)
## 29 Denver CO Licensed Massage Therapist (LMT)
## 30 Denver CO Licensed Massage Therapist
## 31 Denver CO Licensed Massage Therapist (LMT)
## 32 Denver CO Massage Therapist
## 33 Denver CO Massage Therapist - Independent Contractor
## 34 Denver CO Licensed Massage Therapist (LMT)
## 35 Denver CO Licensed Massage Therapist
## 36 Denver CO Licensed Massage Therapist
## 37 Denver CO Massage Therapist
## 38 Denver CO Stretch Practitioner
## 39 Denver CO Part-time Massage Therapist
## 40 Denver CO Massage Therapist
## 41 Denver CO Massage Therapist - Independent Contractor
## 42 Denver CO Massage Therapist
## 43 Denver CO Massage Therapist - Full Time
## 44 Denver CO Massage Therapy / Physical Therapy / Personal Training / Yog...
## 45 Denver CO LifeSpa Massage Therapist - Full-Time
## 46 Denver CO Massage Therapist
## 47 Denver CO Massage Therapist (2yrs experience required)
## 48 Denver CO Massage Therapist
## 49 Denver CO Massage Therapist Career 2
## 50 Denver CO Job Fair Saturday! - Massage Therapist
## 51 Denver CO Sports Massage Therapist
## 52 Denver CO Mobile Massage Therapist
## 53 Denver CO Massage Therapist
## 54 Denver CO Massage Therapist
## 55 Denver CO Licensed Sports Massage Therapist
## 56 Denver CO Licensed Massage Therapist - Great Compensation and Benefits
## 57 Denver CO Massage Therapist - Flex Schedule
## 58 Denver CO Licensed Massage Therapist
## 59 Denver CO Massage Therapist (2yrs experience required)
## 60 Denver CO Massage Therapist
## 61 Denver CO Licensed Massage Therapist
## 62 Denver CO Licensed Massage Therapist
## 63 Denver CO Licensed Massage Therapist (LMT)
## 64 Denver CO Massage Therapist
## 65 Denver CO Massage Therapist - Independent Contractor
## 66 Denver CO Licensed Massage Therapist (LMT)
## 67 Denver CO Massage Therapist Career 2
## 68 Denver CO Licensed Massage Therapist
## 69 Denver CO Licensed Massage Therapist LMT COVID Compliant Workplace
## 70 Denver CO Massage Therapist
## 71 Denver CO Licensed Massage Therapist
## 72 Denver CO Massage Therapy Supervisor
## 73 Denver CO Fitness and Stretch Professional Flexologist
## 74 Denver CO Licensed Massage Therapist
## 75 Denver CO Salon Massage Therapist
## 76 Denver CO Licensed Massage Therapist
## 77 Denver CO Hiring Male or Female Massage Therapist
## 78 Denver CO Massage Therapist to join our great Team
## 79 Denver CO Massage Therapist to join our great Team
## 80 Denver CO Licensed Massage Therapist in COVID Safe Environment
## 81 Denver CO Part Time Massage Therapist-Great Compensation, Fun Environm...
## 82 Denver CO Licensed Massage Therapist
## HiringAgency
## 1 Progressive Health Center4.3Denver, CO 80218 (City Park West area)
## 2 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)
## 3 Jalan Facial Spa4.9Denver, CO 80218 (North Capitol Hill area)
## 4 Mountainview Health & WellnessWestminster, CO
## 5 Sage Hospitality3.3Denver, CO (Union Station area)
## 6 Meadowsweet Gifts & WellnessMorrison, CO 80465
## 7 Bodhi Body StudiosBroomfield, CO 80021
## 8 Elevation Chiropractic & WellnessDenver, CO 80246 (Belcaro area)
## 9 Massage HeightsThornton, CO 80023
## 10 Elements3.6Denver, CO 80218 (Country Club area)+11 locations
## 11 5 Star Salt CavesDenver, CO 80209 (Washington Park West area)
## 12 Integrative Health and RehabilitationDenver, CO 80212 (Northwestern Denver area)
## 13 Bodhi Body StudiosBroomfield, CO 80021
## 14 Cherry Creek Wellness Center, Inc3.6Wheat Ridge, CO 80033
## 15 Indo-Pak Massage TherapyBoulder, CO+1 location•Remote work available
## 16 White Lotus TherapeuticsDenver, CO 80211 (Sloan Lake area)
## 17 Luna Massage And WellnessDenver, CO 80205 (Five Points area)
## 18 Blue Creek therapeutic health spaDenver, CO 80238 (Stapleton area)
## 19 Stretch Lab3.8Denver, CO
## 20 Indulgences Day SpaDenver, CO 80211 (Sunnyside area)
## 21 Omni Hotels & Resorts3.8Broomfield, CO 80021 (Interlocken area)
## 22 Elements Massage3.6Aurora, CO 80016
## 23 100% Chiropractic4.0Superior, CO 80027
## 24 Summit Fitness4.4Denver, CO 80222 (Virginia Village area)
## 25 Symmetry360Denver, CO 80211 (Highland area)+1 location
## 26 Hand & Stone Massage and Facial Spa - Cherry Creek3.0Denver, CO 80206 (Central East Denver area)+8 locations
## 27 Elixir Mind Body Massage3.6Denver, CO (Union Station area)
## 28 The NOW, LLCDenver, CO 80206 (Central East Denver area)
## 29 Cornerstone Chiropractic & AcupunctureLouisville, CO 80027
## 30 Massage Green Spa - SouthlandsAurora, CO 80016
## 31 100% Chiropractic4.0Castle Rock, CO 80104
## 32 Horizon Chiropractic5.0Thornton, CO 80602
## 33 LoDo Massage StudiosDenver, CO (Five Points area)
## 34 Elements MassageDenver, CO 80222 (Hampden South area)
## 35 Elements Massage3.6Parker, CO 80134
## 36 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)
## 37 The Woodhouse Day Spa - Denver & LittletonDenver, CO 80218 (Central East Denver area)
## 38 Stretch Zone2.7Denver, CO
## 39 Healing Solutions Inc.3.6Broomfield, CO 80020
## 40 Mind Body Spa Holistic Wellness CenterLittleton, CO 80127
## 41 Integrated HealthCentennial, CO 80112
## 42 Columbine Country Club2.5Littleton, CO 80123
## 43 Life Time3.6Broomfield, CO 80021+3 locations
## 44 StretchLab3.8Denver, CO
## 45 Life Time3.6Westminster, CO 80020
## 46 Massage Envy3.2Castle Rock, CO 80108+5 locations
## 47 Integrative Health and RehabilitationDenver, CO 80212 (Northwestern Denver area)
## 48 Massage HeightsThornton, CO 80023
## 49 Symmetry360 MassageDenver, CO 80211 (Highland area)
## 50 WTS International3.3Lakewood, CO 80123
## 51 Colorado Sports MassageBoulder, CO 80303 (Southeast Boulder area)
## 52 Indo-Pak Massage TherapyDenver, CO+2 locations
## 53 Mountain View Pain CenterLone Tree, CO 80124+1 location
## 54 Hand and Stone3.0Denver, CO 80202 (Lodo area)
## 55 The FAST Lab, LLCCentennial, CO 80111
## 56 Life Time3.6Centennial, CO
## 57 Symmetry360Denver, CO 80211 (Highland area)
## 58 Spavia Day Spa3.3Greenwood Village, CO 80111+4 locations
## 59 Integrative Health and RehabilitationDenver, CO 80212 (Northwestern Denver area)
## 60 Horizon Chiropractic5.0Thornton, CO 80602
## 61 Elements Massage3.6Parker, CO 80134
## 62 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)
## 63 100% Chiropractic4.0Castle Rock, CO 80104
## 64 Massage HeightsThornton, CO 80023
## 65 LoDo Massage StudiosDenver, CO (Five Points area)
## 66 Elements MassageDenver, CO 80222 (Hampden South area)
## 67 Symmetry360 MassageDenver, CO 80211 (Highland area)
## 68 Kalologie SkincareHighlands Ranch, CO
## 69 Hand and Stone3.0Denver, CO 80231
## 70 WTS Spa and Fitness3.3Lakewood, CO 80123
## 71 Selbo TherapeuticsWestminster, CO 80234
## 72 The Child and Family Therapy Center of Denver4.6Greenwood Village, CO 80111
## 73 Stretch Lab3.8Denver, CO
## 74 Massage Heights - North ThorntonThornton, CO 80023
## 75 JCPenney3.7Lone Tree, CO 80124
## 76 Soothe3.7Denver, CO 80202 (Central Business District area)
## 77 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 78 Massage Heights3.1Thornton, CO 80023
## 79 Massage Heights - North ThorntonThornton, CO 80023
## 80 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 81 Life Time3.6Centennial, CO
## 82 Massage Heights3.1Thornton, CO 80023+1 location
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 4 8.98 80 25000 62000
## 2 18 8.98 80 25000 62000
## 3 22 8.98 80 25000 62000
## 4 30 8.98 80 25000 62000
## 5 Today 8.98 80 25000 62000
## 6 18 8.98 80 25000 62000
## 7 2 8.98 80 25000 62000
## 8 6 8.98 80 25000 62000
## 9 30 8.98 80 25000 62000
## 10 30 8.98 80 25000 62000
## 11 18 8.98 80 25000 62000
## 12 30 8.98 80 25000 62000
## 13 9 8.98 80 25000 62000
## 14 30 8.98 80 25000 62000
## 15 5 8.98 80 25000 62000
## 16 30 8.98 80 25000 62000
## 17 16 8.98 80 25000 62000
## 18 20 8.98 80 25000 62000
## 19 30 8.98 80 25000 62000
## 20 30 8.98 80 25000 62000
## 21 11 8.98 80 25000 62000
## 22 27 8.98 80 25000 62000
## 23 1 8.98 80 25000 62000
## 24 14 8.98 80 25000 62000
## 25 30 8.98 80 25000 62000
## 26 1 8.98 80 25000 62000
## 27 27 8.98 80 25000 62000
## 28 30 8.98 80 25000 62000
## 29 28 8.98 80 25000 62000
## 30 11 8.98 80 25000 62000
## 31 30 8.98 80 25000 62000
## 32 8 8.98 80 25000 62000
## 33 30 8.98 80 25000 62000
## 34 6 8.98 80 25000 62000
## 35 18 8.98 80 25000 62000
## 36 18 8.98 80 25000 62000
## 37 11 8.98 80 25000 62000
## 38 30 8.98 80 25000 62000
## 39 12 8.98 80 25000 62000
## 40 30 8.98 80 25000 62000
## 41 10 8.98 80 25000 62000
## 42 30 8.98 80 25000 62000
## 43 30 8.98 80 25000 62000
## 44 30 8.98 80 25000 62000
## 45 30 8.98 80 25000 62000
## 46 Today 8.98 80 25000 62000
## 47 30 8.98 80 25000 62000
## 48 30 8.98 80 25000 62000
## 49 30 8.98 80 25000 62000
## 50 7 8.98 80 25000 62000
## 51 30 8.98 80 25000 62000
## 52 30 8.98 80 25000 62000
## 53 15 8.98 80 25000 62000
## 54 30 8.98 80 25000 62000
## 55 30 8.98 80 25000 62000
## 56 30 8.98 80 25000 62000
## 57 30 8.98 80 25000 62000
## 58 30 8.98 80 25000 62000
## 59 30 8.98 80 25000 62000
## 60 8 8.98 80 25000 62000
## 61 18 8.98 80 25000 62000
## 62 18 8.98 80 25000 62000
## 63 30 8.98 80 25000 62000
## 64 30 8.98 80 25000 62000
## 65 30 8.98 80 25000 62000
## 66 6 8.98 80 25000 62000
## 67 30 8.98 80 25000 62000
## 68 30 8.98 80 25000 62000
## 69 30 8.98 80 25000 62000
## 70 8 8.98 80 25000 62000
## 71 26 8.98 80 25000 62000
## 72 30 8.98 80 25000 62000
## 73 30 8.98 80 25000 62000
## 74 30 8.98 80 25000 62000
## 75 30 8.98 80 25000 62000
## 76 24 8.98 80 25000 62000
## 77 30 8.98 80 25000 62000
## 78 30 8.98 80 25000 62000
## 79 20 8.98 80 25000 62000
## 80 14 8.98 80 25000 62000
## 81 30 8.98 80 25000 62000
## 82 30 8.98 80 25000 62000
getIndeedJobData5pages("massage therapist", "Colorado Springs","CO")
## Warning in getIndeedJobData5pages("massage therapist", "Colorado Springs", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Colorado Springs", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Health & Wellness Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist (LMT)
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist/Structural Integration Practitioner
## 11 In-Home Esthetician - Massages, Facials, Mani-Pedi Etc.
## 12 Licensed Massage Therapist
## 13 Medical Massage Therapist
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist
## 16 Medical Massage Therapist
## 17 Massage Therapist - Independent Contractor
## 18 Massage Therapist
## 19 Massage Therapist Jobs
## 20 Licensed Massage Therapist, Independent Contractor
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Mobile Massage Therapist
## 25 Massage Therapist - Independent Contractor
## 26 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 30 Massage Therapist
## 31 Massage Therapist - Independent Contractor
## 32 Licensed Massage Therapist
## 33 Health & Wellness Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist (LMT)
## 36 Massage Therapist
## 37 Licensed Massage Therapist
## 38 Mobile Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 In-Home Esthetician - Massages, Facials, Mani-Pedi Etc.
## 41 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 45 Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist (LMT)
## 48 Licensed Massage Therapist
## 49 Medical Massage Therapist
## 50 Massage Therapist - Independent Contractor
## 51 Massage Therapist
## 52 Massage Therapist Jobs
## 53 Licensed Massage Therapist, Independent Contractor
## 54 Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Mobile Massage Therapist
## 58 Massage Therapist - Independent Contractor
## 59 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 63 Massage Therapist
## 64 Licensed Massage Therapist
## 65 Mobile Massage Therapist
## 66 Massage Therapist - Independent Contractor
## 67 In-Home Esthetician - Massages, Facials, Mani-Pedi Etc.
## 68 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 69 Licensed Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 72 Massage Therapist
## 73 Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist (LMT)
## 76 Massage Therapist
## 77 Massage Therapist - Independent Contractor
## 78 Licensed Massage Therapist (LMT)
## 79 Health & Wellness Massage Therapist
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $28 an hour $22 - $28 22 28
## 2 \n$26 - $30 an hour $26 - $30 26 30
## 3 \n$40 - $55 an hour $40 - $55 40 55
## 4 \n$25 an hour $25 25 NA
## 5 \n$25 - $40 an hour $25 - $40 25 40
## 6 \n$18 - $33 an hour $18 - $33 18 33
## 7 \n$29 - $45 an hour $29 - $45 29 45
## 8 \n$22 - $35 an hour $22 - $35 22 35
## 9 \n$25 - $65 an hour $25 - $65 25 65
## 10 \n$30 - $45 an hour $30 - $45 30 45
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$45 - $70 an hour $45 - $70 45 70
## 14 \n$25 - $40 an hour $25 - $40 25 40
## 15 \n$29 - $45 an hour $29 - $45 29 45
## 16 \n$26 - $30 an hour $26 - $30 26 30
## 17 \n$25 an hour $25 25 NA
## 18 \n$40 - $55 an hour $40 - $55 40 55
## 19 \n$45 - $70 an hour $45 - $70 45 70
## 20 \n$25 - $65 an hour $25 - $65 25 65
## 21 \n$18 - $33 an hour $18 - $33 18 33
## 22 \n$22 - $28 an hour $22 - $28 22 28
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 24 \n$45 - $70 an hour $45 - $70 45 70
## 25 \n$45 - $70 an hour $45 - $70 45 70
## 26 \n$25 - $65 an hour $25 - $65 25 65
## 27 \n$29 - $45 an hour $29 - $45 29 45
## 28 \n$40 - $55 an hour $40 - $55 40 55
## 29 \n$25 - $40 an hour $25 - $40 25 40
## 30 \n$18 - $33 an hour $18 - $33 18 33
## 31 \n$26 - $30 an hour $26 - $30 26 30
## 32 \n$25 an hour $25 25 NA
## 33 \n$22 - $28 an hour $22 - $28 22 28
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 26 33 480.6667 843.0159 18
## 2 26 33 480.6667 843.0159 18
## 3 26 33 480.6667 843.0159 18
## 4 26 33 480.6667 843.0159 18
## 5 26 33 480.6667 843.0159 18
## 6 26 33 480.6667 843.0159 18
## 7 26 33 480.6667 843.0159 18
## 8 26 33 480.6667 843.0159 18
## 9 26 33 480.6667 843.0159 18
## 10 26 33 480.6667 843.0159 18
## 11 26 33 480.6667 843.0159 18
## 12 26 33 480.6667 843.0159 18
## 13 26 33 480.6667 843.0159 18
## 14 26 33 480.6667 843.0159 18
## 15 26 33 480.6667 843.0159 18
## 16 26 33 480.6667 843.0159 18
## 17 26 33 480.6667 843.0159 18
## 18 26 33 480.6667 843.0159 18
## 19 26 33 480.6667 843.0159 18
## 20 26 33 480.6667 843.0159 18
## 21 26 33 480.6667 843.0159 18
## 22 26 33 480.6667 843.0159 18
## 23 26 33 480.6667 843.0159 18
## 24 26 33 480.6667 843.0159 18
## 25 26 33 480.6667 843.0159 18
## 26 26 33 480.6667 843.0159 18
## 27 26 33 480.6667 843.0159 18
## 28 26 33 480.6667 843.0159 18
## 29 26 33 480.6667 843.0159 18
## 30 26 33 480.6667 843.0159 18
## 31 26 33 480.6667 843.0159 18
## 32 26 33 480.6667 843.0159 18
## 33 26 33 480.6667 843.0159 18
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
##
## [[3]]
## date_daysAgo
## 1 13
## 2 3
## 3 11
## 4 30
## 5 6
## 6 7
## 7 10
## 8 30
## 9 18
## 10 12
## 11 Just posted
## 12 3
## 13 8
## 14 5
## 15 7
## 16 8
## 17 5
## 18 7
## 19 30
## 20 22
## 21 30
## 22 29
## 23 21
## 24 30
## 25 5
## 26 30
## 27 23
## 28 30
## 29 30
## 30 6
## 31 7
## 32 30
## 33 3
## 34 30
## 35 6
## 36 11
## 37 21
## 38 30
## 39 5
## 40 Just posted
## 41 30
## 42 23
## 43 30
## 44 30
## 45 6
## 46 18
## 47 10
## 48 13
## 49 8
## 50 5
## 51 7
## 52 30
## 53 22
## 54 30
## 55 29
## 56 21
## 57 30
## 58 5
## 59 30
## 60 23
## 61 30
## 62 30
## 63 6
## 64 21
## 65 30
## 66 5
## 67 Just posted
## 68 30
## 69 23
## 70 30
## 71 30
## 72 6
## 73 18
## 74 30
## 75 6
## 76 11
## 77 7
## 78 10
## 79 3
## 80 30
## 81 13
##
## [[4]]
## HiringAgency
## 1 100% Chiropractic Monument4.0Monument, CO 80132
## 2 100% Chiropractic-East Colorado Springs4.0Colorado Springs, CO 80918 (Northeast Colorado Springs area)
## 3 Massage Green Spa - Colorado SpringsColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 4 100% Chiropractic4.0Colorado Springs, CO
## 5 Elements MassageColorado Springs, CO 80923 (Powers area)
## 6 Freedom WellnessColorado Springs, CO 80917 (East Colorado Springs area)
## 7 Natural Therapeutics Massage & WellnessColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 8 LaVida Massage3.7Colorado Springs, CO 80905 (Central Colorado Springs area)
## 9 Springs Integrated HealthColorado Springs, CO (Briargate area)
## 10 Structura Body Therapies3.4Colorado Springs, CO 80923 (Powers area)
## 11 Hoste LLCColorado Springs, CO 80909 (East Colorado Springs area)
## 12 Absolute Body BalanceColorado Springs, CO 80922 (Powers area)
## 13 Colorado Accident and InjuryColorado Springs, CO
## 14 Indo-Pak Massage TherapyColorado Springs, CO•Remote work available
## 15 SunWellnessManitou Springs, CO 80829
## 16 Colorado Accident and InjuryColorado Springs, CO
## 17 Indo-Pak Massage TherapyColorado Springs, CO•Remote work available
## 18 SunWellnessManitou Springs, CO 80829
## 19 Elements3.6Colorado Springs, CO 80920 (Briargate area)
## 20 Dany's Physical TherapyColorado Springs, CO 80920 (Briargate area)
## 21 Life Time3.6Colorado Springs, CO 80920 (Briargate area)
## 22 Mateos Salon & Day SpaColorado Springs, CO 80919 (Northwest Colorado Springs area)
## 23 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 24 Indo-Pak Massage TherapyColorado Springs, CO
## 25 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 26 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 27 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 28 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 29 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 30 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 31 Freedom WellnessColorado Springs, CO 80917 (East Colorado Springs area)
## 32 LaVida Massage3.7Colorado Springs, CO 80905 (Central Colorado Springs area)
## 33 100% Chiropractic-East Colorado Springs4.0Colorado Springs, CO 80918 (Northeast Colorado Springs area)
## 34 100% Chiropractic4.0Colorado Springs, CO
## 35 Elements MassageColorado Springs, CO 80923 (Powers area)
## 36 Massage Green Spa - Colorado SpringsColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 37 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 38 Indo-Pak Massage TherapyColorado Springs, CO
## 39 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 40 Hoste LLCColorado Springs, CO 80909 (East Colorado Springs area)
## 41 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 42 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 43 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 44 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 45 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 46 Springs Integrated HealthColorado Springs, CO (Briargate area)
## 47 Natural Therapeutics Massage & WellnessColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 48 100% Chiropractic Monument4.0Monument, CO 80132
## 49 Colorado Accident and InjuryColorado Springs, CO
## 50 Indo-Pak Massage TherapyColorado Springs, CO•Remote work available
## 51 SunWellnessManitou Springs, CO 80829
## 52 Elements3.6Colorado Springs, CO 80920 (Briargate area)
## 53 Dany's Physical TherapyColorado Springs, CO 80920 (Briargate area)
## 54 Life Time3.6Colorado Springs, CO 80920 (Briargate area)
## 55 Mateos Salon & Day SpaColorado Springs, CO 80919 (Northwest Colorado Springs area)
## 56 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 57 Indo-Pak Massage TherapyColorado Springs, CO
## 58 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 59 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 60 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 61 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 62 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 63 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 64 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 65 Indo-Pak Massage TherapyColorado Springs, CO
## 66 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 67 Hoste LLCColorado Springs, CO 80909 (East Colorado Springs area)
## 68 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 69 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 70 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 71 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 72 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 73 Springs Integrated HealthColorado Springs, CO (Briargate area)
## 74 LaVida Massage3.7Colorado Springs, CO 80905 (Central Colorado Springs area)
## 75 Elements MassageColorado Springs, CO 80923 (Powers area)
## 76 Massage Green Spa - Colorado SpringsColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 77 Freedom WellnessColorado Springs, CO 80917 (East Colorado Springs area)
## 78 Natural Therapeutics Massage & WellnessColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 79 100% Chiropractic-East Colorado Springs4.0Colorado Springs, CO 80918 (Northeast Colorado Springs area)
## 80 100% Chiropractic4.0Colorado Springs, CO
## 81 100% Chiropractic Monument4.0Monument, CO 80132
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$22 - $28 an hour $22 - $28 22 28 25
## 2 \n$26 - $30 an hour $26 - $30 26 30 25
## 3 \n$40 - $55 an hour $40 - $55 40 55 25
## 4 \n$25 an hour $25 25 NA 25
## 5 \n$25 - $40 an hour $25 - $40 25 40 25
## 6 \n$18 - $33 an hour $18 - $33 18 33 25
## 7 \n$29 - $45 an hour $29 - $45 29 45 25
## 8 \n$22 - $35 an hour $22 - $35 22 35 25
## 9 \n$25 - $65 an hour $25 - $65 25 65 25
## 10 \n$30 - $45 an hour $30 - $45 30 45 25
## 13 \n$45 - $70 an hour $45 - $70 45 70 25
## 14 \n$25 - $40 an hour $25 - $40 25 40 25
## 15 \n$29 - $45 an hour $29 - $45 29 45 25
## 16 \n$26 - $30 an hour $26 - $30 26 30 25
## 17 \n$25 an hour $25 25 NA 25
## 18 \n$40 - $55 an hour $40 - $55 40 55 25
## 19 \n$45 - $70 an hour $45 - $70 45 70 25
## 20 \n$25 - $65 an hour $25 - $65 25 65 25
## 21 \n$18 - $33 an hour $18 - $33 18 33 25
## 22 \n$22 - $28 an hour $22 - $28 22 28 25
## 24 \n$45 - $70 an hour $45 - $70 45 70 25
## 25 \n$45 - $70 an hour $45 - $70 45 70 25
## 26 \n$25 - $65 an hour $25 - $65 25 65 25
## 27 \n$29 - $45 an hour $29 - $45 29 45 25
## 28 \n$40 - $55 an hour $40 - $55 40 55 25
## 29 \n$25 - $40 an hour $25 - $40 25 40 25
## 30 \n$18 - $33 an hour $18 - $33 18 33 25
## 31 \n$26 - $30 an hour $26 - $30 26 30 25
## 32 \n$25 an hour $25 25 NA 25
## 33 \n$22 - $28 an hour $22 - $28 22 28 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 28.73333 46.22222 18 70
## 2 45 28.73333 46.22222 18 70
## 3 45 28.73333 46.22222 18 70
## 4 45 28.73333 46.22222 18 70
## 5 45 28.73333 46.22222 18 70
## 6 45 28.73333 46.22222 18 70
## 7 45 28.73333 46.22222 18 70
## 8 45 28.73333 46.22222 18 70
## 9 45 28.73333 46.22222 18 70
## 10 45 28.73333 46.22222 18 70
## 13 45 28.73333 46.22222 18 70
## 14 45 28.73333 46.22222 18 70
## 15 45 28.73333 46.22222 18 70
## 16 45 28.73333 46.22222 18 70
## 17 45 28.73333 46.22222 18 70
## 18 45 28.73333 46.22222 18 70
## 19 45 28.73333 46.22222 18 70
## 20 45 28.73333 46.22222 18 70
## 21 45 28.73333 46.22222 18 70
## 22 45 28.73333 46.22222 18 70
## 24 45 28.73333 46.22222 18 70
## 25 45 28.73333 46.22222 18 70
## 26 45 28.73333 46.22222 18 70
## 27 45 28.73333 46.22222 18 70
## 28 45 28.73333 46.22222 18 70
## 29 45 28.73333 46.22222 18 70
## 30 45 28.73333 46.22222 18 70
## 31 45 28.73333 46.22222 18 70
## 32 45 28.73333 46.22222 18 70
## 33 45 28.73333 46.22222 18 70
##
## [[7]]
## city state
## 1 Colorado Springs CO
## 2 Colorado Springs CO
## 3 Colorado Springs CO
## 4 Colorado Springs CO
## 5 Colorado Springs CO
## 6 Colorado Springs CO
## 7 Colorado Springs CO
## 8 Colorado Springs CO
## 9 Colorado Springs CO
## 10 Colorado Springs CO
## 11 Colorado Springs CO
## 12 Colorado Springs CO
## 13 Colorado Springs CO
## 14 Colorado Springs CO
## 15 Colorado Springs CO
## 16 Colorado Springs CO
## 17 Colorado Springs CO
## 18 Colorado Springs CO
## 19 Colorado Springs CO
## 20 Colorado Springs CO
## 21 Colorado Springs CO
## 22 Colorado Springs CO
## 23 Colorado Springs CO
## 24 Colorado Springs CO
## 25 Colorado Springs CO
## 26 Colorado Springs CO
## 27 Colorado Springs CO
## 28 Colorado Springs CO
## 29 Colorado Springs CO
## 30 Colorado Springs CO
## 31 Colorado Springs CO
## 32 Colorado Springs CO
## 33 Colorado Springs CO
## 34 Colorado Springs CO
## 35 Colorado Springs CO
## 36 Colorado Springs CO
## 37 Colorado Springs CO
## 38 Colorado Springs CO
## 39 Colorado Springs CO
## 40 Colorado Springs CO
## 41 Colorado Springs CO
## 42 Colorado Springs CO
## 43 Colorado Springs CO
## 44 Colorado Springs CO
## 45 Colorado Springs CO
## 46 Colorado Springs CO
## 47 Colorado Springs CO
## 48 Colorado Springs CO
## 49 Colorado Springs CO
## 50 Colorado Springs CO
## 51 Colorado Springs CO
## 52 Colorado Springs CO
## 53 Colorado Springs CO
## 54 Colorado Springs CO
## 55 Colorado Springs CO
## 56 Colorado Springs CO
## 57 Colorado Springs CO
## 58 Colorado Springs CO
## 59 Colorado Springs CO
## 60 Colorado Springs CO
## 61 Colorado Springs CO
## 62 Colorado Springs CO
## 63 Colorado Springs CO
## 64 Colorado Springs CO
## 65 Colorado Springs CO
## 66 Colorado Springs CO
## 67 Colorado Springs CO
## 68 Colorado Springs CO
## 69 Colorado Springs CO
## 70 Colorado Springs CO
## 71 Colorado Springs CO
## 72 Colorado Springs CO
## 73 Colorado Springs CO
## 74 Colorado Springs CO
## 75 Colorado Springs CO
## 76 Colorado Springs CO
## 77 Colorado Springs CO
## 78 Colorado Springs CO
## 79 Colorado Springs CO
## 80 Colorado Springs CO
## 81 Colorado Springs CO
## jobTitle
## 1 Licensed Massage Therapist
## 2 Health & Wellness Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist (LMT)
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist/Structural Integration Practitioner
## 11 In-Home Esthetician - Massages, Facials, Mani-Pedi Etc.
## 12 Licensed Massage Therapist
## 13 Medical Massage Therapist
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist
## 16 Medical Massage Therapist
## 17 Massage Therapist - Independent Contractor
## 18 Massage Therapist
## 19 Massage Therapist Jobs
## 20 Licensed Massage Therapist, Independent Contractor
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Mobile Massage Therapist
## 25 Massage Therapist - Independent Contractor
## 26 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 30 Massage Therapist
## 31 Massage Therapist - Independent Contractor
## 32 Licensed Massage Therapist
## 33 Health & Wellness Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist (LMT)
## 36 Massage Therapist
## 37 Licensed Massage Therapist
## 38 Mobile Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 In-Home Esthetician - Massages, Facials, Mani-Pedi Etc.
## 41 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 45 Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist (LMT)
## 48 Licensed Massage Therapist
## 49 Medical Massage Therapist
## 50 Massage Therapist - Independent Contractor
## 51 Massage Therapist
## 52 Massage Therapist Jobs
## 53 Licensed Massage Therapist, Independent Contractor
## 54 Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Mobile Massage Therapist
## 58 Massage Therapist - Independent Contractor
## 59 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 63 Massage Therapist
## 64 Licensed Massage Therapist
## 65 Mobile Massage Therapist
## 66 Massage Therapist - Independent Contractor
## 67 In-Home Esthetician - Massages, Facials, Mani-Pedi Etc.
## 68 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 69 Licensed Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 72 Massage Therapist
## 73 Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist (LMT)
## 76 Massage Therapist
## 77 Massage Therapist - Independent Contractor
## 78 Licensed Massage Therapist (LMT)
## 79 Health & Wellness Massage Therapist
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist
## HiringAgency
## 1 100% Chiropractic Monument4.0Monument, CO 80132
## 2 100% Chiropractic-East Colorado Springs4.0Colorado Springs, CO 80918 (Northeast Colorado Springs area)
## 3 Massage Green Spa - Colorado SpringsColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 4 100% Chiropractic4.0Colorado Springs, CO
## 5 Elements MassageColorado Springs, CO 80923 (Powers area)
## 6 Freedom WellnessColorado Springs, CO 80917 (East Colorado Springs area)
## 7 Natural Therapeutics Massage & WellnessColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 8 LaVida Massage3.7Colorado Springs, CO 80905 (Central Colorado Springs area)
## 9 Springs Integrated HealthColorado Springs, CO (Briargate area)
## 10 Structura Body Therapies3.4Colorado Springs, CO 80923 (Powers area)
## 11 Hoste LLCColorado Springs, CO 80909 (East Colorado Springs area)
## 12 Absolute Body BalanceColorado Springs, CO 80922 (Powers area)
## 13 Colorado Accident and InjuryColorado Springs, CO
## 14 Indo-Pak Massage TherapyColorado Springs, CO•Remote work available
## 15 SunWellnessManitou Springs, CO 80829
## 16 Colorado Accident and InjuryColorado Springs, CO
## 17 Indo-Pak Massage TherapyColorado Springs, CO•Remote work available
## 18 SunWellnessManitou Springs, CO 80829
## 19 Elements3.6Colorado Springs, CO 80920 (Briargate area)
## 20 Dany's Physical TherapyColorado Springs, CO 80920 (Briargate area)
## 21 Life Time3.6Colorado Springs, CO 80920 (Briargate area)
## 22 Mateos Salon & Day SpaColorado Springs, CO 80919 (Northwest Colorado Springs area)
## 23 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 24 Indo-Pak Massage TherapyColorado Springs, CO
## 25 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 26 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 27 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 28 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 29 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 30 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 31 Freedom WellnessColorado Springs, CO 80917 (East Colorado Springs area)
## 32 LaVida Massage3.7Colorado Springs, CO 80905 (Central Colorado Springs area)
## 33 100% Chiropractic-East Colorado Springs4.0Colorado Springs, CO 80918 (Northeast Colorado Springs area)
## 34 100% Chiropractic4.0Colorado Springs, CO
## 35 Elements MassageColorado Springs, CO 80923 (Powers area)
## 36 Massage Green Spa - Colorado SpringsColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 37 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 38 Indo-Pak Massage TherapyColorado Springs, CO
## 39 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 40 Hoste LLCColorado Springs, CO 80909 (East Colorado Springs area)
## 41 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 42 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 43 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 44 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 45 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 46 Springs Integrated HealthColorado Springs, CO (Briargate area)
## 47 Natural Therapeutics Massage & WellnessColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 48 100% Chiropractic Monument4.0Monument, CO 80132
## 49 Colorado Accident and InjuryColorado Springs, CO
## 50 Indo-Pak Massage TherapyColorado Springs, CO•Remote work available
## 51 SunWellnessManitou Springs, CO 80829
## 52 Elements3.6Colorado Springs, CO 80920 (Briargate area)
## 53 Dany's Physical TherapyColorado Springs, CO 80920 (Briargate area)
## 54 Life Time3.6Colorado Springs, CO 80920 (Briargate area)
## 55 Mateos Salon & Day SpaColorado Springs, CO 80919 (Northwest Colorado Springs area)
## 56 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 57 Indo-Pak Massage TherapyColorado Springs, CO
## 58 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 59 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 60 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 61 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 62 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 63 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 64 The Spa at Flying HorseColorado Springs, CO 80921 (Flying Horse area)
## 65 Indo-Pak Massage TherapyColorado Springs, CO
## 66 Regenesis Wellness CenterColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 67 Hoste LLCColorado Springs, CO 80909 (East Colorado Springs area)
## 68 Villasport Athletic Club and Spa3.5Colorado Springs, CO 80923 (Northeast Colorado Springs area)
## 69 Massage Heights - Colorado Springs3.1Colorado Springs, CO 80920 (Briargate area)
## 70 Massage Heights3.1Colorado Springs, CO 80920 (Briargate area)
## 71 Massage Envy3.2Colorado Springs, CO 80922 (Powers area)
## 72 Cheyenne Mountain Colorado Springs, A Dolce ResortColorado Springs, CO (Southwest Colorado Springs area)
## 73 Springs Integrated HealthColorado Springs, CO (Briargate area)
## 74 LaVida Massage3.7Colorado Springs, CO 80905 (Central Colorado Springs area)
## 75 Elements MassageColorado Springs, CO 80923 (Powers area)
## 76 Massage Green Spa - Colorado SpringsColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 77 Freedom WellnessColorado Springs, CO 80917 (East Colorado Springs area)
## 78 Natural Therapeutics Massage & WellnessColorado Springs, CO 80918 (Northeast Colorado Springs area)
## 79 100% Chiropractic-East Colorado Springs4.0Colorado Springs, CO 80918 (Northeast Colorado Springs area)
## 80 100% Chiropractic4.0Colorado Springs, CO
## 81 100% Chiropractic Monument4.0Monument, CO 80132
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 13 18 70 NA NA
## 2 3 18 70 NA NA
## 3 11 18 70 NA NA
## 4 30 18 70 NA NA
## 5 6 18 70 NA NA
## 6 7 18 70 NA NA
## 7 10 18 70 NA NA
## 8 30 18 70 NA NA
## 9 18 18 70 NA NA
## 10 12 18 70 NA NA
## 11 Just posted 18 70 NA NA
## 12 3 18 70 NA NA
## 13 8 18 70 NA NA
## 14 5 18 70 NA NA
## 15 7 18 70 NA NA
## 16 8 18 70 NA NA
## 17 5 18 70 NA NA
## 18 7 18 70 NA NA
## 19 30 18 70 NA NA
## 20 22 18 70 NA NA
## 21 30 18 70 NA NA
## 22 29 18 70 NA NA
## 23 21 18 70 NA NA
## 24 30 18 70 NA NA
## 25 5 18 70 NA NA
## 26 30 18 70 NA NA
## 27 23 18 70 NA NA
## 28 30 18 70 NA NA
## 29 30 18 70 NA NA
## 30 6 18 70 NA NA
## 31 7 18 70 NA NA
## 32 30 18 70 NA NA
## 33 3 18 70 NA NA
## 34 30 18 70 NA NA
## 35 6 18 70 NA NA
## 36 11 18 70 NA NA
## 37 21 18 70 NA NA
## 38 30 18 70 NA NA
## 39 5 18 70 NA NA
## 40 Just posted 18 70 NA NA
## 41 30 18 70 NA NA
## 42 23 18 70 NA NA
## 43 30 18 70 NA NA
## 44 30 18 70 NA NA
## 45 6 18 70 NA NA
## 46 18 18 70 NA NA
## 47 10 18 70 NA NA
## 48 13 18 70 NA NA
## 49 8 18 70 NA NA
## 50 5 18 70 NA NA
## 51 7 18 70 NA NA
## 52 30 18 70 NA NA
## 53 22 18 70 NA NA
## 54 30 18 70 NA NA
## 55 29 18 70 NA NA
## 56 21 18 70 NA NA
## 57 30 18 70 NA NA
## 58 5 18 70 NA NA
## 59 30 18 70 NA NA
## 60 23 18 70 NA NA
## 61 30 18 70 NA NA
## 62 30 18 70 NA NA
## 63 6 18 70 NA NA
## 64 21 18 70 NA NA
## 65 30 18 70 NA NA
## 66 5 18 70 NA NA
## 67 Just posted 18 70 NA NA
## 68 30 18 70 NA NA
## 69 23 18 70 NA NA
## 70 30 18 70 NA NA
## 71 30 18 70 NA NA
## 72 6 18 70 NA NA
## 73 18 18 70 NA NA
## 74 30 18 70 NA NA
## 75 6 18 70 NA NA
## 76 11 18 70 NA NA
## 77 7 18 70 NA NA
## 78 10 18 70 NA NA
## 79 3 18 70 NA NA
## 80 30 18 70 NA NA
## 81 13 18 70 NA NA
getIndeedJobData5pages("massage therapist", "Aurora","CO")
## Warning in getIndeedJobData5pages("massage therapist", "Aurora", "CO"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Aurora", "CO"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Aurora", "CO"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist - Independent Contractor
## 4 Massage Therapist - $32 to $35 per hour, tips included
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 REGISTERED MASSAGE THERAPIST
## 9 Liscensed Massage Therapist
## 10 Massage Therapist- Specialty; Pediatric, Caregiver, & Specia...
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist Needed Highlands Ranch
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Massage Therapist
## 20 Massage Therapist - Independent Contractor
## 21 Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Licensed Massage Therapist (LMT)
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist - Independent Contractor
## 29 Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Licensed Massage Therapist
## 32 Massage Therapist & Esthetician
## 33 Licensed Massage Therapist
## 34 Massage Therapist - $32 to $35 per hour, tips included
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist - Part Time
## 38 Hiring Male or Female Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Massage Therapist
## 42 Massage Therapist
## 43 LifeSpa Massage Therapist - Full-Time
## 44 Massage Therapist
## 45 High Quality Massage Therapist
## 46 Licensed Massage Therapist - Great Compensation and Benefits
## 47 Massage Therapist
## 48 Part-time Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapist- Full or Part Time (Denver, CO)
## 51 Licensed Massage Therapist
## 52 Extraordinary Massage Therapist Needed!!
## 53 Licensed Massage Therapist in COVID Safe Environment
## 54 Licensed Massage Therapist
## 55 Massage Therapist
## 56 Licensed Massage Therapist
## 57 Job Fair Saturday! - Massage Therapist
## 58 Licensed Massage Therapist
## 59 Stretch Practitioner
## 60 Massage Therapy Supervisor
## 61 Massage Therapy / Physical Therapy / Personal Training / Yog...
## 62 Massage Therapist
## 63 Salon Massage Therapist
## 64 Massage Therapist
## 65 Licensed Massage Therapist
## 66 Covid-19 Compliant Massage Studio in Lodo Seeking LMTs!
## 67 Extraordinary Massage Therapist Needed!!
## 68 Massage Therapist Jobs - Elements
## 69 Licensed Massage Therapist in COVID Safe Environment
## 70 Licensed Massage Therapist
## 71 Massage Therapist
## 72 Licensed Massage Therapist
## 73 Licensed Massage Therapist - Guaranteed Pay!
## 74 Job Fair Saturday! - Massage Therapist
## 75 Licensed Massage Therapist
## 76 Stretch Practitioner
## 77 Massage Therapist - $32 to $35 per hour, tips included
## 78 Massage Therapist
## 79 Licensed Massage Therapist (LMT)
## 80 Massage Therapist
## 81 Massage Therapist - Independent Contractor
## 82 Massage Therapist
## 83 Massage Therapist
## 84 Licensed Massage Therapist (LMT)
## 85 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 2 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 3 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 4 \n$32 - $35 an hour $32 - $35 32.00 35.00
## 5 \n$28,000 - $36,000 a year $28000 - $36000 28000.00 36000.00
## 6 \n$3,020 - $4,860 a month $3020 - $4860 3020.00 4860.00
## 7 \n$50 - $80 an hour ++ $50 - $80 50.00 80.00
## 8 \n$40 an hour $40 40.00 NA
## 9 \n$18 - $49 an hour $18 - $49 18.00 49.00
## 10 \n$20 - $26 an hour $20 - $26 20.00 26.00
## 11 \n$18 - $30 an hour $18 - $30 18.00 30.00
## 12 \n$50 - $70 an hour $50 - $70 50.00 70.00
## 13 \n$32 - $40 an hour ++ $32 - $40 32.00 40.00
## 14 \n$62,000 a year $62000 62000.00 NA
## 15 \n$27 - $28 an hour $27 - $28 27.00 28.00
## 16 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 17 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 18 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 19 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 20 \n$28,000 - $36,000 a year $28000 - $36000 28000.00 36000.00
## 21 \n$8.98 an hour $8.98 8.98 NA
## 22 \n$22 - $40 an hour $22 - $40 22.00 40.00
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000.00
## 24 \n$35 - $55 an hour $35 - $55 35.00 55.00
## 25 \n$20 - $40 an hour ++ $20 - $40 20.00 40.00
## 26 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000.00
## 27 \n$32 - $35 an hour $32 - $35 32.00 35.00
## 28 \n$3,020 - $4,860 a month $3020 - $4860 3020.00 4860.00
## 29 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 30 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000.00
## 31 \n$28 - $36 an hour $28 - $36 28.00 36.00
## 32 \n$23 - $27 an hour $23 - $27 23.00 27.00
## 33 \n$17 - $22 an hour $17 - $22 17.00 22.00
## 34 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 35 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 36 \n$28.50 - $32.25 an hour $28.50 - $32.25 28.50 32.25
## 37 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 38 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 39 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000.00
## 40 \n$26 - $30 an hour $26 - $30 26.00 30.00
## 41 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 42 \n$49,000 a year $49000 49000.00 NA
## 43 \n$22 - $26 an hour $22 - $26 22.00 26.00
## 44 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 45 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 46 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 47 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000.00
## 48 \n$26 - $30 an hour $26 - $30 26.00 30.00
## 49 \n$25 - $37 an hour $25 - $37 25.00 37.00
## 50 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 51 \n$32 - $35 an hour $32 - $35 32.00 35.00
## 52 \n$3,020 - $4,860 a month $3020 - $4860 3020.00 4860.00
## 53 \n$28,000 - $36,000 a year $28000 - $36000 28000.00 36000.00
## 54 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 55 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 56 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 57 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 35 7546.342 9082.761 8.98
## 2 30 35 7546.342 9082.761 8.98
## 3 30 35 7546.342 9082.761 8.98
## 4 30 35 7546.342 9082.761 8.98
## 5 30 35 7546.342 9082.761 8.98
## 6 30 35 7546.342 9082.761 8.98
## 7 30 35 7546.342 9082.761 8.98
## 8 30 35 7546.342 9082.761 8.98
## 9 30 35 7546.342 9082.761 8.98
## 10 30 35 7546.342 9082.761 8.98
## 11 30 35 7546.342 9082.761 8.98
## 12 30 35 7546.342 9082.761 8.98
## 13 30 35 7546.342 9082.761 8.98
## 14 30 35 7546.342 9082.761 8.98
## 15 30 35 7546.342 9082.761 8.98
## 16 30 35 7546.342 9082.761 8.98
## 17 30 35 7546.342 9082.761 8.98
## 18 30 35 7546.342 9082.761 8.98
## 19 30 35 7546.342 9082.761 8.98
## 20 30 35 7546.342 9082.761 8.98
## 21 30 35 7546.342 9082.761 8.98
## 22 30 35 7546.342 9082.761 8.98
## 23 30 35 7546.342 9082.761 8.98
## 24 30 35 7546.342 9082.761 8.98
## 25 30 35 7546.342 9082.761 8.98
## 26 30 35 7546.342 9082.761 8.98
## 27 30 35 7546.342 9082.761 8.98
## 28 30 35 7546.342 9082.761 8.98
## 29 30 35 7546.342 9082.761 8.98
## 30 30 35 7546.342 9082.761 8.98
## 31 30 35 7546.342 9082.761 8.98
## 32 30 35 7546.342 9082.761 8.98
## 33 30 35 7546.342 9082.761 8.98
## 34 30 35 7546.342 9082.761 8.98
## 35 30 35 7546.342 9082.761 8.98
## 36 30 35 7546.342 9082.761 8.98
## 37 30 35 7546.342 9082.761 8.98
## 38 30 35 7546.342 9082.761 8.98
## 39 30 35 7546.342 9082.761 8.98
## 40 30 35 7546.342 9082.761 8.98
## 41 30 35 7546.342 9082.761 8.98
## 42 30 35 7546.342 9082.761 8.98
## 43 30 35 7546.342 9082.761 8.98
## 44 30 35 7546.342 9082.761 8.98
## 45 30 35 7546.342 9082.761 8.98
## 46 30 35 7546.342 9082.761 8.98
## 47 30 35 7546.342 9082.761 8.98
## 48 30 35 7546.342 9082.761 8.98
## 49 30 35 7546.342 9082.761 8.98
## 50 30 35 7546.342 9082.761 8.98
## 51 30 35 7546.342 9082.761 8.98
## 52 30 35 7546.342 9082.761 8.98
## 53 30 35 7546.342 9082.761 8.98
## 54 30 35 7546.342 9082.761 8.98
## 55 30 35 7546.342 9082.761 8.98
## 56 30 35 7546.342 9082.761 8.98
## 57 30 35 7546.342 9082.761 8.98
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
## 26 62000
## 27 62000
## 28 62000
## 29 62000
## 30 62000
## 31 62000
## 32 62000
## 33 62000
## 34 62000
## 35 62000
## 36 62000
## 37 62000
## 38 62000
## 39 62000
## 40 62000
## 41 62000
## 42 62000
## 43 62000
## 44 62000
## 45 62000
## 46 62000
## 47 62000
## 48 62000
## 49 62000
## 50 62000
## 51 62000
## 52 62000
## 53 62000
## 54 62000
## 55 62000
## 56 62000
## 57 62000
##
## [[3]]
## date_daysAgo
## 1 18
## 2 30
## 3 30
## 4 30
## 5 8
## 6 30
## 7 15
## 8 30
## 9 4
## 10 6
## 11 11
## 12 2
## 13 27
## 14 Today
## 15 30
## 16 30
## 17 6
## 18 6
## 19 27
## 20 30
## 21 15
## 22 27
## 23 30
## 24 6
## 25 8
## 26 11
## 27 6
## 28 30
## 29 Today
## 30 10
## 31 30
## 32 5
## 33 18
## 34 30
## 35 30
## 36 18
## 37 5
## 38 30
## 39 30
## 40 14
## 41 30
## 42 30
## 43 30
## 44 30
## 45 15
## 46 30
## 47 30
## 48 12
## 49 26
## 50 30
## 51 30
## 52 30
## 53 14
## 54 13
## 55 30
## 56 16
## 57 7
## 58 30
## 59 30
## 60 30
## 61 30
## 62 11
## 63 30
## 64 30
## 65 7
## 66 27
## 67 30
## 68 13
## 69 14
## 70 13
## 71 30
## 72 16
## 73 30
## 74 7
## 75 30
## 76 30
## 77 30
## 78 30
## 79 6
## 80 8
## 81 30
## 82 15
## 83 27
## 84 30
## 85 18
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Parker, CO 80134
## 2 100% Chiropractic4.0Castle Rock, CO 80104
## 3 LoDo Massage StudiosDenver, CO (Five Points area)
## 4 Spavia - WestminsterWestminster, CO 80031
## 5 Horizon Chiropractic5.0Thornton, CO 80602
## 6 Massage HeightsThornton, CO 80023
## 7 Mountain View Pain CenterLone Tree, CO 80124
## 8 Mountainview Health & WellnessWestminster, CO
## 9 Progressive Health Center4.3Denver, CO 80218 (City Park West area)
## 10 Angels Service LLCAurora, CO 80015 (Prides Crossing area)
## 11 Massage Green Spa - SouthlandsAurora, CO 80016
## 12 Bodhi Body StudiosBroomfield, CO 80021
## 13 Reinholtz Family ChiropracticLittleton, CO 80129
## 14 Sage Hospitality3.3Denver, CO (Union Station area)
## 15 Massage Green Spa SouthlandsAurora, CO 80016
## 16 Elements3.6Aurora, CO 80013 (Carriage Place area)+10 locations
## 17 Elevation Chiropractic & WellnessDenver, CO 80246 (Belcaro area)
## 18 Elements MassageDenver, CO 80222 (Hampden South area)
## 19 Elements Massage3.6Aurora, CO 80016
## 20 LoDo Massage StudiosDenver, CO (Five Points area)
## 21 Mountain View Pain CenterLone Tree, CO 80124
## 22 Elements Massage3.6Aurora, CO 80016
## 23 100% Chiropractic4.0Castle Rock, CO 80104
## 24 Elements MassageDenver, CO 80222 (Hampden South area)
## 25 Horizon Chiropractic5.0Thornton, CO 80602
## 26 Omni Hotels & Resorts3.8Broomfield, CO 80021 (Interlocken area)
## 27 Hatch Chiropractic and WellnessParker, CO 80138
## 28 Indo-Pak Massage TherapyDenver, CO•Remote work available
## 29 Massage Envy3.2Castle Rock, CO 80108+4 locations
## 30 Integrated HealthCentennial, CO 80112
## 31 Spavia Day Spa3.3Greenwood Village, CO 80111+3 locations
## 32 The Woodhouse Day Spa - Denver & LittletonDenver, CO 80218 (Central East Denver area)
## 33 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)+1 location
## 34 Spavia - WestminsterWestminster, CO 80031
## 35 Massage HeightsThornton, CO 80023
## 36 Elements Massage3.6Parker, CO 80134
## 37 HEI Hotels3.3Denver, CO 80202 (Central Business District area)
## 38 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 39 Elements3.6Lone Tree, CO 80124+1 location
## 40 Summit Fitness4.4Denver, CO 80222 (Virginia Village area)
## 41 White Lotus TherapeuticsDenver, CO 80211 (Sloan Lake area)
## 42 Stretch Lab3.8Denver, CO
## 43 Life Time3.6Westminster, CO 80020
## 44 Columbine Country Club2.5Littleton, CO 80123
## 45 Intrepid Bodyworks MassageThornton, CO 80229
## 46 Life Time3.6Centennial, CO
## 47 Mind Body Spa Holistic Wellness CenterLittleton, CO 80127
## 48 Healing Solutions Inc.3.6Broomfield, CO 80020
## 49 Selbo TherapeuticsWestminster, CO 80234
## 50 The NOW, LLCDenver, CO 80206 (Central East Denver area)
## 51 Indulgences Day SpaDenver, CO 80211 (Sunnyside area)
## 52 100% Chiropractic4.0Highlands Ranch, CO 80126
## 53 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 54 Connected Health CentersCastle Rock, CO 80104
## 55 Symmetry360Golden, CO 80401+1 location
## 56 Luna Massage And WellnessDenver, CO 80205 (Five Points area)
## 57 WTS International3.3Lakewood, CO 80123
## 58 Kalologie SkincareHighlands Ranch, CO
## 59 Stretch Zone2.7Denver, CO
## 60 The Child and Family Therapy Center of Denver4.6Greenwood Village, CO 80111
## 61 StretchLab3.8Denver, CO
## 62 The Woodhouse Day Spa - Denver & LittletonDenver, CO 80218 (Central East Denver area)
## 63 JCPenney3.7Lone Tree, CO 80124
## 64 Serasana LittletonLittleton, CO 80127
## 65 The Little Massage Shop, LLCNorthglenn, CO 80234
## 66 Elixir Mind Body Massage3.6Denver, CO (Union Station area)
## 67 100% Chiropractic4.0Highlands Ranch, CO 80126
## 68 Elements Massage3.6Westminster, CO 80023
## 69 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 70 Connected Health CentersCastle Rock, CO 80104
## 71 Symmetry360Golden, CO 80401+1 location
## 72 Luna Massage And WellnessDenver, CO 80205 (Five Points area)
## 73 Massage Green Spa3.2Westminster, CO 80023
## 74 WTS International3.3Lakewood, CO 80123
## 75 Kalologie SkincareHighlands Ranch, CO
## 76 Stretch Zone2.7Denver, CO
## 77 Spavia - WestminsterWestminster, CO 80031
## 78 Massage HeightsThornton, CO 80023
## 79 Elements MassageDenver, CO 80222 (Hampden South area)
## 80 Horizon Chiropractic5.0Thornton, CO 80602
## 81 LoDo Massage StudiosDenver, CO (Five Points area)
## 82 Mountain View Pain CenterLone Tree, CO 80124
## 83 Elements Massage3.6Aurora, CO 80016
## 84 100% Chiropractic4.0Castle Rock, CO 80104
## 85 Elements Massage3.6Parker, CO 80134
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 5 \n$28,000 - $36,000 a year $28000 - $36000 28000 36000
## 14 \n$62,000 a year $62000 62000 NA
## 20 \n$28,000 - $36,000 a year $28000 - $36000 28000 36000
## 26 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 29 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 30 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 39 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 42 \n$49,000 a year $49000 49000 NA
## 45 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 47 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 53 \n$28,000 - $36,000 a year $28000 - $36000 28000 36000
## 57 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 28000 50000 31923.08 49181.82 25000
## 5 28000 50000 31923.08 49181.82 25000
## 14 28000 50000 31923.08 49181.82 25000
## 20 28000 50000 31923.08 49181.82 25000
## 26 28000 50000 31923.08 49181.82 25000
## 29 28000 50000 31923.08 49181.82 25000
## 30 28000 50000 31923.08 49181.82 25000
## 39 28000 50000 31923.08 49181.82 25000
## 42 28000 50000 31923.08 49181.82 25000
## 45 28000 50000 31923.08 49181.82 25000
## 47 28000 50000 31923.08 49181.82 25000
## 53 28000 50000 31923.08 49181.82 25000
## 57 28000 50000 31923.08 49181.82 25000
## maximumMaxSalary
## 1 62000
## 5 62000
## 14 62000
## 20 62000
## 26 62000
## 29 62000
## 30 62000
## 39 62000
## 42 62000
## 45 62000
## 47 62000
## 53 62000
## 57 62000
##
## [[6]]
## Salary salary minSalary maxSalary
## 2 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 3 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 4 \n$32 - $35 an hour $32 - $35 32.00 35.00
## 7 \n$50 - $80 an hour ++ $50 - $80 50.00 80.00
## 8 \n$40 an hour $40 40.00 NA
## 9 \n$18 - $49 an hour $18 - $49 18.00 49.00
## 10 \n$20 - $26 an hour $20 - $26 20.00 26.00
## 11 \n$18 - $30 an hour $18 - $30 18.00 30.00
## 12 \n$50 - $70 an hour $50 - $70 50.00 70.00
## 13 \n$32 - $40 an hour ++ $32 - $40 32.00 40.00
## 15 \n$27 - $28 an hour $27 - $28 27.00 28.00
## 16 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 17 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 18 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 19 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 21 \n$8.98 an hour $8.98 8.98 NA
## 22 \n$22 - $40 an hour $22 - $40 22.00 40.00
## 24 \n$35 - $55 an hour $35 - $55 35.00 55.00
## 25 \n$20 - $40 an hour ++ $20 - $40 20.00 40.00
## 27 \n$32 - $35 an hour $32 - $35 32.00 35.00
## 31 \n$28 - $36 an hour $28 - $36 28.00 36.00
## 32 \n$23 - $27 an hour $23 - $27 23.00 27.00
## 33 \n$17 - $22 an hour $17 - $22 17.00 22.00
## 34 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 35 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 36 \n$28.50 - $32.25 an hour $28.50 - $32.25 28.50 32.25
## 37 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 38 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 40 \n$26 - $30 an hour $26 - $30 26.00 30.00
## 41 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 43 \n$22 - $26 an hour $22 - $26 22.00 26.00
## 44 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 46 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 48 \n$26 - $30 an hour $26 - $30 26.00 30.00
## 49 \n$25 - $37 an hour $25 - $37 25.00 37.00
## 50 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 51 \n$32 - $35 an hour $32 - $35 32.00 35.00
## 54 \n$33 - $38 an hour $33 - $38 33.00 38.00
## 55 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 56 \n$30 - $40 an hour $30 - $40 30.00 40.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 25 35 27.037 36.375 8.98
## 3 25 35 27.037 36.375 8.98
## 4 25 35 27.037 36.375 8.98
## 7 25 35 27.037 36.375 8.98
## 8 25 35 27.037 36.375 8.98
## 9 25 35 27.037 36.375 8.98
## 10 25 35 27.037 36.375 8.98
## 11 25 35 27.037 36.375 8.98
## 12 25 35 27.037 36.375 8.98
## 13 25 35 27.037 36.375 8.98
## 15 25 35 27.037 36.375 8.98
## 16 25 35 27.037 36.375 8.98
## 17 25 35 27.037 36.375 8.98
## 18 25 35 27.037 36.375 8.98
## 19 25 35 27.037 36.375 8.98
## 21 25 35 27.037 36.375 8.98
## 22 25 35 27.037 36.375 8.98
## 24 25 35 27.037 36.375 8.98
## 25 25 35 27.037 36.375 8.98
## 27 25 35 27.037 36.375 8.98
## 31 25 35 27.037 36.375 8.98
## 32 25 35 27.037 36.375 8.98
## 33 25 35 27.037 36.375 8.98
## 34 25 35 27.037 36.375 8.98
## 35 25 35 27.037 36.375 8.98
## 36 25 35 27.037 36.375 8.98
## 37 25 35 27.037 36.375 8.98
## 38 25 35 27.037 36.375 8.98
## 40 25 35 27.037 36.375 8.98
## 41 25 35 27.037 36.375 8.98
## 43 25 35 27.037 36.375 8.98
## 44 25 35 27.037 36.375 8.98
## 46 25 35 27.037 36.375 8.98
## 48 25 35 27.037 36.375 8.98
## 49 25 35 27.037 36.375 8.98
## 50 25 35 27.037 36.375 8.98
## 51 25 35 27.037 36.375 8.98
## 54 25 35 27.037 36.375 8.98
## 55 25 35 27.037 36.375 8.98
## 56 25 35 27.037 36.375 8.98
## maximumMaxSalary
## 2 80
## 3 80
## 4 80
## 7 80
## 8 80
## 9 80
## 10 80
## 11 80
## 12 80
## 13 80
## 15 80
## 16 80
## 17 80
## 18 80
## 19 80
## 21 80
## 22 80
## 24 80
## 25 80
## 27 80
## 31 80
## 32 80
## 33 80
## 34 80
## 35 80
## 36 80
## 37 80
## 38 80
## 40 80
## 41 80
## 43 80
## 44 80
## 46 80
## 48 80
## 49 80
## 50 80
## 51 80
## 54 80
## 55 80
## 56 80
##
## [[7]]
## city state jobTitle
## 1 Aurora CO Licensed Massage Therapist
## 2 Aurora CO Licensed Massage Therapist (LMT)
## 3 Aurora CO Massage Therapist - Independent Contractor
## 4 Aurora CO Massage Therapist - $32 to $35 per hour, tips included
## 5 Aurora CO Massage Therapist
## 6 Aurora CO Massage Therapist
## 7 Aurora CO Massage Therapist
## 8 Aurora CO REGISTERED MASSAGE THERAPIST
## 9 Aurora CO Liscensed Massage Therapist
## 10 Aurora CO Massage Therapist- Specialty; Pediatric, Caregiver, & Specia...
## 11 Aurora CO Licensed Massage Therapist
## 12 Aurora CO Massage Therapist
## 13 Aurora CO Massage Therapist Needed Highlands Ranch
## 14 Aurora CO Massage Therapist
## 15 Aurora CO Massage Therapist
## 16 Aurora CO Massage Therapist
## 17 Aurora CO Massage Therapist
## 18 Aurora CO Licensed Massage Therapist (LMT)
## 19 Aurora CO Massage Therapist
## 20 Aurora CO Massage Therapist - Independent Contractor
## 21 Aurora CO Massage Therapist
## 22 Aurora CO Massage Therapist
## 23 Aurora CO Licensed Massage Therapist (LMT)
## 24 Aurora CO Licensed Massage Therapist (LMT)
## 25 Aurora CO Massage Therapist
## 26 Aurora CO Massage Therapist
## 27 Aurora CO Licensed Massage Therapist
## 28 Aurora CO Massage Therapist - Independent Contractor
## 29 Aurora CO Massage Therapist
## 30 Aurora CO Massage Therapist - Independent Contractor
## 31 Aurora CO Licensed Massage Therapist
## 32 Aurora CO Massage Therapist & Esthetician
## 33 Aurora CO Licensed Massage Therapist
## 34 Aurora CO Massage Therapist - $32 to $35 per hour, tips included
## 35 Aurora CO Massage Therapist
## 36 Aurora CO Licensed Massage Therapist
## 37 Aurora CO Massage Therapist - Part Time
## 38 Aurora CO Hiring Male or Female Massage Therapist
## 39 Aurora CO Licensed Massage Therapist
## 40 Aurora CO Massage Therapist
## 41 Aurora CO Massage Therapist
## 42 Aurora CO Massage Therapist
## 43 Aurora CO LifeSpa Massage Therapist - Full-Time
## 44 Aurora CO Massage Therapist
## 45 Aurora CO High Quality Massage Therapist
## 46 Aurora CO Licensed Massage Therapist - Great Compensation and Benefits
## 47 Aurora CO Massage Therapist
## 48 Aurora CO Part-time Massage Therapist
## 49 Aurora CO Licensed Massage Therapist
## 50 Aurora CO Massage Therapist- Full or Part Time (Denver, CO)
## 51 Aurora CO Licensed Massage Therapist
## 52 Aurora CO Extraordinary Massage Therapist Needed!!
## 53 Aurora CO Licensed Massage Therapist in COVID Safe Environment
## 54 Aurora CO Licensed Massage Therapist
## 55 Aurora CO Massage Therapist
## 56 Aurora CO Licensed Massage Therapist
## 57 Aurora CO Job Fair Saturday! - Massage Therapist
## 58 Aurora CO Licensed Massage Therapist
## 59 Aurora CO Stretch Practitioner
## 60 Aurora CO Massage Therapy Supervisor
## 61 Aurora CO Massage Therapy / Physical Therapy / Personal Training / Yog...
## 62 Aurora CO Massage Therapist
## 63 Aurora CO Salon Massage Therapist
## 64 Aurora CO Massage Therapist
## 65 Aurora CO Licensed Massage Therapist
## 66 Aurora CO Covid-19 Compliant Massage Studio in Lodo Seeking LMTs!
## 67 Aurora CO Extraordinary Massage Therapist Needed!!
## 68 Aurora CO Massage Therapist Jobs - Elements
## 69 Aurora CO Licensed Massage Therapist in COVID Safe Environment
## 70 Aurora CO Licensed Massage Therapist
## 71 Aurora CO Massage Therapist
## 72 Aurora CO Licensed Massage Therapist
## 73 Aurora CO Licensed Massage Therapist - Guaranteed Pay!
## 74 Aurora CO Job Fair Saturday! - Massage Therapist
## 75 Aurora CO Licensed Massage Therapist
## 76 Aurora CO Stretch Practitioner
## 77 Aurora CO Massage Therapist - $32 to $35 per hour, tips included
## 78 Aurora CO Massage Therapist
## 79 Aurora CO Licensed Massage Therapist (LMT)
## 80 Aurora CO Massage Therapist
## 81 Aurora CO Massage Therapist - Independent Contractor
## 82 Aurora CO Massage Therapist
## 83 Aurora CO Massage Therapist
## 84 Aurora CO Licensed Massage Therapist (LMT)
## 85 Aurora CO Licensed Massage Therapist
## HiringAgency
## 1 Elements Massage3.6Parker, CO 80134
## 2 100% Chiropractic4.0Castle Rock, CO 80104
## 3 LoDo Massage StudiosDenver, CO (Five Points area)
## 4 Spavia - WestminsterWestminster, CO 80031
## 5 Horizon Chiropractic5.0Thornton, CO 80602
## 6 Massage HeightsThornton, CO 80023
## 7 Mountain View Pain CenterLone Tree, CO 80124
## 8 Mountainview Health & WellnessWestminster, CO
## 9 Progressive Health Center4.3Denver, CO 80218 (City Park West area)
## 10 Angels Service LLCAurora, CO 80015 (Prides Crossing area)
## 11 Massage Green Spa - SouthlandsAurora, CO 80016
## 12 Bodhi Body StudiosBroomfield, CO 80021
## 13 Reinholtz Family ChiropracticLittleton, CO 80129
## 14 Sage Hospitality3.3Denver, CO (Union Station area)
## 15 Massage Green Spa SouthlandsAurora, CO 80016
## 16 Elements3.6Aurora, CO 80013 (Carriage Place area)+10 locations
## 17 Elevation Chiropractic & WellnessDenver, CO 80246 (Belcaro area)
## 18 Elements MassageDenver, CO 80222 (Hampden South area)
## 19 Elements Massage3.6Aurora, CO 80016
## 20 LoDo Massage StudiosDenver, CO (Five Points area)
## 21 Mountain View Pain CenterLone Tree, CO 80124
## 22 Elements Massage3.6Aurora, CO 80016
## 23 100% Chiropractic4.0Castle Rock, CO 80104
## 24 Elements MassageDenver, CO 80222 (Hampden South area)
## 25 Horizon Chiropractic5.0Thornton, CO 80602
## 26 Omni Hotels & Resorts3.8Broomfield, CO 80021 (Interlocken area)
## 27 Hatch Chiropractic and WellnessParker, CO 80138
## 28 Indo-Pak Massage TherapyDenver, CO•Remote work available
## 29 Massage Envy3.2Castle Rock, CO 80108+4 locations
## 30 Integrated HealthCentennial, CO 80112
## 31 Spavia Day Spa3.3Greenwood Village, CO 80111+3 locations
## 32 The Woodhouse Day Spa - Denver & LittletonDenver, CO 80218 (Central East Denver area)
## 33 Ella Bliss Beauty Bar4.1Denver, CO 80203 (Speer area)+1 location
## 34 Spavia - WestminsterWestminster, CO 80031
## 35 Massage HeightsThornton, CO 80023
## 36 Elements Massage3.6Parker, CO 80134
## 37 HEI Hotels3.3Denver, CO 80202 (Central Business District area)
## 38 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 39 Elements3.6Lone Tree, CO 80124+1 location
## 40 Summit Fitness4.4Denver, CO 80222 (Virginia Village area)
## 41 White Lotus TherapeuticsDenver, CO 80211 (Sloan Lake area)
## 42 Stretch Lab3.8Denver, CO
## 43 Life Time3.6Westminster, CO 80020
## 44 Columbine Country Club2.5Littleton, CO 80123
## 45 Intrepid Bodyworks MassageThornton, CO 80229
## 46 Life Time3.6Centennial, CO
## 47 Mind Body Spa Holistic Wellness CenterLittleton, CO 80127
## 48 Healing Solutions Inc.3.6Broomfield, CO 80020
## 49 Selbo TherapeuticsWestminster, CO 80234
## 50 The NOW, LLCDenver, CO 80206 (Central East Denver area)
## 51 Indulgences Day SpaDenver, CO 80211 (Sunnyside area)
## 52 100% Chiropractic4.0Highlands Ranch, CO 80126
## 53 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 54 Connected Health CentersCastle Rock, CO 80104
## 55 Symmetry360Golden, CO 80401+1 location
## 56 Luna Massage And WellnessDenver, CO 80205 (Five Points area)
## 57 WTS International3.3Lakewood, CO 80123
## 58 Kalologie SkincareHighlands Ranch, CO
## 59 Stretch Zone2.7Denver, CO
## 60 The Child and Family Therapy Center of Denver4.6Greenwood Village, CO 80111
## 61 StretchLab3.8Denver, CO
## 62 The Woodhouse Day Spa - Denver & LittletonDenver, CO 80218 (Central East Denver area)
## 63 JCPenney3.7Lone Tree, CO 80124
## 64 Serasana LittletonLittleton, CO 80127
## 65 The Little Massage Shop, LLCNorthglenn, CO 80234
## 66 Elixir Mind Body Massage3.6Denver, CO (Union Station area)
## 67 100% Chiropractic4.0Highlands Ranch, CO 80126
## 68 Elements Massage3.6Westminster, CO 80023
## 69 Hand and Stone3.0Aurora, CO 80016 (Tallyn's Reach area)
## 70 Connected Health CentersCastle Rock, CO 80104
## 71 Symmetry360Golden, CO 80401+1 location
## 72 Luna Massage And WellnessDenver, CO 80205 (Five Points area)
## 73 Massage Green Spa3.2Westminster, CO 80023
## 74 WTS International3.3Lakewood, CO 80123
## 75 Kalologie SkincareHighlands Ranch, CO
## 76 Stretch Zone2.7Denver, CO
## 77 Spavia - WestminsterWestminster, CO 80031
## 78 Massage HeightsThornton, CO 80023
## 79 Elements MassageDenver, CO 80222 (Hampden South area)
## 80 Horizon Chiropractic5.0Thornton, CO 80602
## 81 LoDo Massage StudiosDenver, CO (Five Points area)
## 82 Mountain View Pain CenterLone Tree, CO 80124
## 83 Elements Massage3.6Aurora, CO 80016
## 84 100% Chiropractic4.0Castle Rock, CO 80104
## 85 Elements Massage3.6Parker, CO 80134
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 18 8.98 80 25000 62000
## 2 30 8.98 80 25000 62000
## 3 30 8.98 80 25000 62000
## 4 30 8.98 80 25000 62000
## 5 8 8.98 80 25000 62000
## 6 30 8.98 80 25000 62000
## 7 15 8.98 80 25000 62000
## 8 30 8.98 80 25000 62000
## 9 4 8.98 80 25000 62000
## 10 6 8.98 80 25000 62000
## 11 11 8.98 80 25000 62000
## 12 2 8.98 80 25000 62000
## 13 27 8.98 80 25000 62000
## 14 Today 8.98 80 25000 62000
## 15 30 8.98 80 25000 62000
## 16 30 8.98 80 25000 62000
## 17 6 8.98 80 25000 62000
## 18 6 8.98 80 25000 62000
## 19 27 8.98 80 25000 62000
## 20 30 8.98 80 25000 62000
## 21 15 8.98 80 25000 62000
## 22 27 8.98 80 25000 62000
## 23 30 8.98 80 25000 62000
## 24 6 8.98 80 25000 62000
## 25 8 8.98 80 25000 62000
## 26 11 8.98 80 25000 62000
## 27 6 8.98 80 25000 62000
## 28 30 8.98 80 25000 62000
## 29 Today 8.98 80 25000 62000
## 30 10 8.98 80 25000 62000
## 31 30 8.98 80 25000 62000
## 32 5 8.98 80 25000 62000
## 33 18 8.98 80 25000 62000
## 34 30 8.98 80 25000 62000
## 35 30 8.98 80 25000 62000
## 36 18 8.98 80 25000 62000
## 37 5 8.98 80 25000 62000
## 38 30 8.98 80 25000 62000
## 39 30 8.98 80 25000 62000
## 40 14 8.98 80 25000 62000
## 41 30 8.98 80 25000 62000
## 42 30 8.98 80 25000 62000
## 43 30 8.98 80 25000 62000
## 44 30 8.98 80 25000 62000
## 45 15 8.98 80 25000 62000
## 46 30 8.98 80 25000 62000
## 47 30 8.98 80 25000 62000
## 48 12 8.98 80 25000 62000
## 49 26 8.98 80 25000 62000
## 50 30 8.98 80 25000 62000
## 51 30 8.98 80 25000 62000
## 52 30 8.98 80 25000 62000
## 53 14 8.98 80 25000 62000
## 54 13 8.98 80 25000 62000
## 55 30 8.98 80 25000 62000
## 56 16 8.98 80 25000 62000
## 57 7 8.98 80 25000 62000
## 58 30 8.98 80 25000 62000
## 59 30 8.98 80 25000 62000
## 60 30 8.98 80 25000 62000
## 61 30 8.98 80 25000 62000
## 62 11 8.98 80 25000 62000
## 63 30 8.98 80 25000 62000
## 64 30 8.98 80 25000 62000
## 65 7 8.98 80 25000 62000
## 66 27 8.98 80 25000 62000
## 67 30 8.98 80 25000 62000
## 68 13 8.98 80 25000 62000
## 69 14 8.98 80 25000 62000
## 70 13 8.98 80 25000 62000
## 71 30 8.98 80 25000 62000
## 72 16 8.98 80 25000 62000
## 73 30 8.98 80 25000 62000
## 74 7 8.98 80 25000 62000
## 75 30 8.98 80 25000 62000
## 76 30 8.98 80 25000 62000
## 77 30 8.98 80 25000 62000
## 78 30 8.98 80 25000 62000
## 79 6 8.98 80 25000 62000
## 80 8 8.98 80 25000 62000
## 81 30 8.98 80 25000 62000
## 82 15 8.98 80 25000 62000
## 83 27 8.98 80 25000 62000
## 84 30 8.98 80 25000 62000
## 85 18 8.98 80 25000 62000
Connecticut Bridgeport, Stamford, New Haven
getIndeedJobData5pages("massage therapist", "Bridgeport","CT")
## Warning in getIndeedJobData5pages("massage therapist", "Bridgeport", "CT"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Bridgeport", "CT"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist / Acupuncturist
## 2 Agora Day Spa, Massage Therapist needed!!!
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Stretch Therapist
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Certified Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist, Independent Contractor
## 17 Massage Therapist - Independent Contractor
## 18 Licensed Massage Therapist (LMT)
## 19 Mobile Massage Therapist
## 20 Licensed Massage Therapist
## 21 Stretch Service Provider
## 22 Stretch Therapist / Fitness Professional / Personal Trainer...
## 23 Massage Therapists Waterbury to Danbury
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Certified Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist, Independent Contractor
## 32 Massage Therapist - Independent Contractor
## 33 Licensed Massage Therapist (LMT)
## 34 Licensed Massage Therapist
## 35 Mobile Massage Therapist
## 36 Stretch Service Provider
## 37 Stretch Therapist / Fitness Professional / Personal Trainer...
## 38 Massage Therapists Waterbury to Danbury
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Massage Therapist
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist / Acupuncturist
## 48 Agora Day Spa, Massage Therapist needed!!!
## 49 Massage Therapist
## 50 Licensed Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Certified Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist, Independent Contractor
## 57 Massage Therapist - Independent Contractor
## 58 Licensed Massage Therapist (LMT)
## 59 Licensed Massage Therapist
## 60 Mobile Massage Therapist
## 61 Stretch Service Provider
## 62 Stretch Therapist / Fitness Professional / Personal Trainer...
## 63 Massage Therapists Waterbury to Danbury
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$33 - $51 an hour $33 - $51 33 51
## 2 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 3 \n$50 - $60 an hour $50 - $60 50 60
## 4 \n$62,000 a year $62000 62000 NA
## 5 \n$16 - $18 an hour $16 - $18 16 18
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$38 - $45 an hour $38 - $45 38 45
## 8 \n$30 - $40 an hour $30 - $40 30 40
## 9 \n$50 - $60 an hour $50 - $60 50 60
## 10 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 11 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 12 \n$29 - $42 an hour $29 - $42 29 42
## 13 \n$45 - $70 an hour $45 - $70 45 70
## 14 \n$35 - $45 an hour $35 - $45 35 45
## 15 \n$35 - $40 an hour $35 - $40 35 40
## 16 \n$50 - $60 an hour $50 - $60 50 60
## 17 \n$50 - $60 an hour $50 - $60 50 60
## 18 \n$30 - $40 an hour $30 - $40 30 40
## 19 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 20 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 21 \n$29 - $42 an hour $29 - $42 29 42
## 22 \n$45 - $70 an hour $45 - $70 45 70
## 23 \n$35 - $45 an hour $35 - $45 35 45
## 24 \n$35 - $40 an hour $35 - $40 35 40
## 25 \n$50 - $60 an hour $50 - $60 50 60
## 26 \n$50 - $60 an hour $50 - $60 50 60
## 27 \n$30 - $40 an hour $30 - $40 30 40
## 28 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 29 \n$50 - $60 an hour $50 - $60 50 60
## 30 \n$33 - $51 an hour $33 - $51 33 51
## 31 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 32 \n$50 - $60 an hour $50 - $60 50 60
## 33 \n$25 - $50 an hour $25 - $50 25 50
## 34 \n$30 - $40 an hour $30 - $40 30 40
## 35 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 36 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 37 \n$29 - $42 an hour $29 - $42 29 42
## 38 \n$45 - $70 an hour $45 - $70 45 70
## 39 \n$35 - $45 an hour $35 - $45 35 45
## 40 \n$35 - $40 an hour $35 - $40 35 40
## 41 \n$50 - $60 an hour $50 - $60 50 60
## 42 \n$50 - $60 an hour $50 - $60 50 60
## 43 \n$30 - $40 an hour $30 - $40 30 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 50 8795.977 11198.04 16
## 2 45 50 8795.977 11198.04 16
## 3 45 50 8795.977 11198.04 16
## 4 45 50 8795.977 11198.04 16
## 5 45 50 8795.977 11198.04 16
## 6 45 50 8795.977 11198.04 16
## 7 45 50 8795.977 11198.04 16
## 8 45 50 8795.977 11198.04 16
## 9 45 50 8795.977 11198.04 16
## 10 45 50 8795.977 11198.04 16
## 11 45 50 8795.977 11198.04 16
## 12 45 50 8795.977 11198.04 16
## 13 45 50 8795.977 11198.04 16
## 14 45 50 8795.977 11198.04 16
## 15 45 50 8795.977 11198.04 16
## 16 45 50 8795.977 11198.04 16
## 17 45 50 8795.977 11198.04 16
## 18 45 50 8795.977 11198.04 16
## 19 45 50 8795.977 11198.04 16
## 20 45 50 8795.977 11198.04 16
## 21 45 50 8795.977 11198.04 16
## 22 45 50 8795.977 11198.04 16
## 23 45 50 8795.977 11198.04 16
## 24 45 50 8795.977 11198.04 16
## 25 45 50 8795.977 11198.04 16
## 26 45 50 8795.977 11198.04 16
## 27 45 50 8795.977 11198.04 16
## 28 45 50 8795.977 11198.04 16
## 29 45 50 8795.977 11198.04 16
## 30 45 50 8795.977 11198.04 16
## 31 45 50 8795.977 11198.04 16
## 32 45 50 8795.977 11198.04 16
## 33 45 50 8795.977 11198.04 16
## 34 45 50 8795.977 11198.04 16
## 35 45 50 8795.977 11198.04 16
## 36 45 50 8795.977 11198.04 16
## 37 45 50 8795.977 11198.04 16
## 38 45 50 8795.977 11198.04 16
## 39 45 50 8795.977 11198.04 16
## 40 45 50 8795.977 11198.04 16
## 41 45 50 8795.977 11198.04 16
## 42 45 50 8795.977 11198.04 16
## 43 45 50 8795.977 11198.04 16
## maximumMaxSalary
## 1 70000
## 2 70000
## 3 70000
## 4 70000
## 5 70000
## 6 70000
## 7 70000
## 8 70000
## 9 70000
## 10 70000
## 11 70000
## 12 70000
## 13 70000
## 14 70000
## 15 70000
## 16 70000
## 17 70000
## 18 70000
## 19 70000
## 20 70000
## 21 70000
## 22 70000
## 23 70000
## 24 70000
## 25 70000
## 26 70000
## 27 70000
## 28 70000
## 29 70000
## 30 70000
## 31 70000
## 32 70000
## 33 70000
## 34 70000
## 35 70000
## 36 70000
## 37 70000
## 38 70000
## 39 70000
## 40 70000
## 41 70000
## 42 70000
## 43 70000
##
## [[3]]
## date_daysAgo
## 1 26
## 2 3
## 3 30
## 4 30
## 5 20
## 6 Today
## 7 5
## 8 4
## 9 28
## 10 1
## 11 19
## 12 27
## 13 30
## 14 30
## 15 11
## 16 30
## 17 30
## 18 30
## 19 30
## 20 19
## 21 12
## 22 30
## 23 1
## 24 15
## 25 25
## 26 30
## 27 Today
## 28 13
## 29 30
## 30 11
## 31 30
## 32 30
## 33 30
## 34 19
## 35 30
## 36 12
## 37 30
## 38 1
## 39 15
## 40 25
## 41 30
## 42 Today
## 43 13
## 44 30
## 45 30
## 46 19
## 47 26
## 48 3
## 49 24
## 50 7
## 51 10
## 52 30
## 53 13
## 54 30
## 55 11
## 56 30
## 57 30
## 58 30
## 59 19
## 60 30
## 61 12
## 62 30
## 63 1
## 64 15
## 65 25
## 66 30
## 67 Today
## 68 13
##
## [[4]]
## HiringAgency
## 1 Ridgefield Physical TherapyRidgefield, CT 06877
## 2 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 3 Elements Massage3.6Smithtown, NY 11787 (Village of the Branch area)
## 4 Elements3.6Fairfield, CT 06825+3 locations
## 5 Restore Hyper Wellness + Cryotherapy4.7Westport, CT 06880+1 location
## 6 Phenix Salon Suites | NYNorwalk, CT 06851
## 7 Indo-Pak Massage TherapyGreenwich, CT•Remote work available
## 8 Stamford Sports & Spine4.5Stamford, CT 06901 (Downtown area)
## 9 NefaireWestport, CT 06880
## 10 Susi Laura MassageRidgefield, CT 06877
## 11 Williams & Company4.3Darien, CT 06820
## 12 Round Hill ClubGreenwich, CT 06831
## 13 Massage Green SpaOrange, CT 06477
## 14 Noelle Salon, Spa, BoutiqueStamford, CT 06905 (Turn of River area)
## 15 Massage Envy3.2Shelton, CT 06484
## 16 Cloud 9 Medi Day SpaMilford, CT 06460
## 17 Cloud 9 Medi Day SpaMilford, CT 06460
## 18 Massage Envy Hamden3.2Hamden, CT 06514
## 19 Indo-Pak Massage TherapyNorth Haven, CT
## 20 Evia Medical CenterSmithtown, NY 11787
## 21 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 22 LYMBRDarien, CT 06820
## 23 Massage Envy Southbury3.2Southbury, CT 06488
## 24 Sup Acupuncture PLLCPort Jefferson Station, NY 11776
## 25 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 26 Hand and Stone3.0Huntington, NY 11743
## 27 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 28 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
## 29 Noelle Salon, Spa, BoutiqueStamford, CT 06905 (Turn of River area)
## 30 Massage Envy3.2Shelton, CT 06484
## 31 Cloud 9 Medi Day SpaMilford, CT 06460
## 32 Cloud 9 Medi Day SpaMilford, CT 06460
## 33 Massage Envy Hamden3.2Hamden, CT 06514
## 34 Evia Medical CenterSmithtown, NY 11787
## 35 Indo-Pak Massage TherapyNorth Haven, CT
## 36 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 37 LYMBRDarien, CT 06820
## 38 Massage Envy Southbury3.2Southbury, CT 06488
## 39 Sup Acupuncture PLLCPort Jefferson Station, NY 11776
## 40 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 41 Hand and Stone3.0Huntington, NY 11743
## 42 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 43 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
## 44 LaVida Massage of SmithtownSmithtown, NY 11787 (Village of the Branch area)
## 45 Elements Massage3.6Smithtown, NY 11787 (Village of the Branch area)
## 46 Evia Medical CenterSmithtown, NY 11787
## 47 Ridgefield Physical TherapyRidgefield, CT 06877
## 48 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 49 Round Hill ClubGreenwich, CT 06831
## 50 Hand and Stone Massage and Facial Spa3.0Stony Brook, NY 11790
## 51 MAIA Salon Spa and WellnessSmithtown, NY 11787
## 52 Massage Green SpaNorwalk, CT 06851
## 53 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
## 54 Noelle Salon, Spa, BoutiqueStamford, CT 06905 (Turn of River area)
## 55 Massage Envy3.2Shelton, CT 06484
## 56 Cloud 9 Medi Day SpaMilford, CT 06460
## 57 Cloud 9 Medi Day SpaMilford, CT 06460
## 58 Massage Envy Hamden3.2Hamden, CT 06514
## 59 Evia Medical CenterSmithtown, NY 11787
## 60 Indo-Pak Massage TherapyNorth Haven, CT
## 61 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 62 LYMBRDarien, CT 06820
## 63 Massage Envy Southbury3.2Southbury, CT 06488
## 64 Sup Acupuncture PLLCPort Jefferson Station, NY 11776
## 65 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 66 Hand and Stone3.0Huntington, NY 11743
## 67 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 68 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 4 \n$62,000 a year $62000 62000 NA
## 10 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 11 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 19 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 20 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 28 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 31 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 35 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 36 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 40000 60000 37200 62222.22 20000
## 4 40000 60000 37200 62222.22 20000
## 10 40000 60000 37200 62222.22 20000
## 11 40000 60000 37200 62222.22 20000
## 19 40000 60000 37200 62222.22 20000
## 20 40000 60000 37200 62222.22 20000
## 28 40000 60000 37200 62222.22 20000
## 31 40000 60000 37200 62222.22 20000
## 35 40000 60000 37200 62222.22 20000
## 36 40000 60000 37200 62222.22 20000
## maximumMaxSalary
## 2 70000
## 4 70000
## 10 70000
## 11 70000
## 19 70000
## 20 70000
## 28 70000
## 31 70000
## 35 70000
## 36 70000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$33 - $51 an hour $33 - $51 33 51 35
## 3 \n$50 - $60 an hour $50 - $60 50 60 35
## 5 \n$16 - $18 an hour $16 - $18 16 18 35
## 7 \n$38 - $45 an hour $38 - $45 38 45 35
## 8 \n$30 - $40 an hour $30 - $40 30 40 35
## 9 \n$50 - $60 an hour $50 - $60 50 60 35
## 12 \n$29 - $42 an hour $29 - $42 29 42 35
## 13 \n$45 - $70 an hour $45 - $70 45 70 35
## 14 \n$35 - $45 an hour $35 - $45 35 45 35
## 15 \n$35 - $40 an hour $35 - $40 35 40 35
## 16 \n$50 - $60 an hour $50 - $60 50 60 35
## 17 \n$50 - $60 an hour $50 - $60 50 60 35
## 18 \n$30 - $40 an hour $30 - $40 30 40 35
## 21 \n$29 - $42 an hour $29 - $42 29 42 35
## 22 \n$45 - $70 an hour $45 - $70 45 70 35
## 23 \n$35 - $45 an hour $35 - $45 35 45 35
## 24 \n$35 - $40 an hour $35 - $40 35 40 35
## 25 \n$50 - $60 an hour $50 - $60 50 60 35
## 26 \n$50 - $60 an hour $50 - $60 50 60 35
## 27 \n$30 - $40 an hour $30 - $40 30 40 35
## 29 \n$50 - $60 an hour $50 - $60 50 60 35
## 30 \n$33 - $51 an hour $33 - $51 33 51 35
## 32 \n$50 - $60 an hour $50 - $60 50 60 35
## 33 \n$25 - $50 an hour $25 - $50 25 50 35
## 34 \n$30 - $40 an hour $30 - $40 30 40 35
## 37 \n$29 - $42 an hour $29 - $42 29 42 35
## 38 \n$45 - $70 an hour $45 - $70 45 70 35
## 39 \n$35 - $45 an hour $35 - $45 35 45 35
## 40 \n$35 - $40 an hour $35 - $40 35 40 35
## 41 \n$50 - $60 an hour $50 - $60 50 60 35
## 42 \n$50 - $60 an hour $50 - $60 50 60 35
## 43 \n$30 - $40 an hour $30 - $40 30 40 35
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 47.5 38.34375 50.1875 16 70
## 3 47.5 38.34375 50.1875 16 70
## 5 47.5 38.34375 50.1875 16 70
## 7 47.5 38.34375 50.1875 16 70
## 8 47.5 38.34375 50.1875 16 70
## 9 47.5 38.34375 50.1875 16 70
## 12 47.5 38.34375 50.1875 16 70
## 13 47.5 38.34375 50.1875 16 70
## 14 47.5 38.34375 50.1875 16 70
## 15 47.5 38.34375 50.1875 16 70
## 16 47.5 38.34375 50.1875 16 70
## 17 47.5 38.34375 50.1875 16 70
## 18 47.5 38.34375 50.1875 16 70
## 21 47.5 38.34375 50.1875 16 70
## 22 47.5 38.34375 50.1875 16 70
## 23 47.5 38.34375 50.1875 16 70
## 24 47.5 38.34375 50.1875 16 70
## 25 47.5 38.34375 50.1875 16 70
## 26 47.5 38.34375 50.1875 16 70
## 27 47.5 38.34375 50.1875 16 70
## 29 47.5 38.34375 50.1875 16 70
## 30 47.5 38.34375 50.1875 16 70
## 32 47.5 38.34375 50.1875 16 70
## 33 47.5 38.34375 50.1875 16 70
## 34 47.5 38.34375 50.1875 16 70
## 37 47.5 38.34375 50.1875 16 70
## 38 47.5 38.34375 50.1875 16 70
## 39 47.5 38.34375 50.1875 16 70
## 40 47.5 38.34375 50.1875 16 70
## 41 47.5 38.34375 50.1875 16 70
## 42 47.5 38.34375 50.1875 16 70
## 43 47.5 38.34375 50.1875 16 70
##
## [[7]]
## city state
## 1 Bridgeport CT
## 2 Bridgeport CT
## 3 Bridgeport CT
## 4 Bridgeport CT
## 5 Bridgeport CT
## 6 Bridgeport CT
## 7 Bridgeport CT
## 8 Bridgeport CT
## 9 Bridgeport CT
## 10 Bridgeport CT
## 11 Bridgeport CT
## 12 Bridgeport CT
## 13 Bridgeport CT
## 14 Bridgeport CT
## 15 Bridgeport CT
## 16 Bridgeport CT
## 17 Bridgeport CT
## 18 Bridgeport CT
## 19 Bridgeport CT
## 20 Bridgeport CT
## 21 Bridgeport CT
## 22 Bridgeport CT
## 23 Bridgeport CT
## 24 Bridgeport CT
## 25 Bridgeport CT
## 26 Bridgeport CT
## 27 Bridgeport CT
## 28 Bridgeport CT
## 29 Bridgeport CT
## 30 Bridgeport CT
## 31 Bridgeport CT
## 32 Bridgeport CT
## 33 Bridgeport CT
## 34 Bridgeport CT
## 35 Bridgeport CT
## 36 Bridgeport CT
## 37 Bridgeport CT
## 38 Bridgeport CT
## 39 Bridgeport CT
## 40 Bridgeport CT
## 41 Bridgeport CT
## 42 Bridgeport CT
## 43 Bridgeport CT
## 44 Bridgeport CT
## 45 Bridgeport CT
## 46 Bridgeport CT
## 47 Bridgeport CT
## 48 Bridgeport CT
## 49 Bridgeport CT
## 50 Bridgeport CT
## 51 Bridgeport CT
## 52 Bridgeport CT
## 53 Bridgeport CT
## 54 Bridgeport CT
## 55 Bridgeport CT
## 56 Bridgeport CT
## 57 Bridgeport CT
## 58 Bridgeport CT
## 59 Bridgeport CT
## 60 Bridgeport CT
## 61 Bridgeport CT
## 62 Bridgeport CT
## 63 Bridgeport CT
## 64 Bridgeport CT
## 65 Bridgeport CT
## 66 Bridgeport CT
## 67 Bridgeport CT
## 68 Bridgeport CT
## jobTitle
## 1 Massage Therapist / Acupuncturist
## 2 Agora Day Spa, Massage Therapist needed!!!
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Stretch Therapist
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Certified Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist, Independent Contractor
## 17 Massage Therapist - Independent Contractor
## 18 Licensed Massage Therapist (LMT)
## 19 Mobile Massage Therapist
## 20 Licensed Massage Therapist
## 21 Stretch Service Provider
## 22 Stretch Therapist / Fitness Professional / Personal Trainer...
## 23 Massage Therapists Waterbury to Danbury
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Certified Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist, Independent Contractor
## 32 Massage Therapist - Independent Contractor
## 33 Licensed Massage Therapist (LMT)
## 34 Licensed Massage Therapist
## 35 Mobile Massage Therapist
## 36 Stretch Service Provider
## 37 Stretch Therapist / Fitness Professional / Personal Trainer...
## 38 Massage Therapists Waterbury to Danbury
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Massage Therapist
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist / Acupuncturist
## 48 Agora Day Spa, Massage Therapist needed!!!
## 49 Massage Therapist
## 50 Licensed Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Certified Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist, Independent Contractor
## 57 Massage Therapist - Independent Contractor
## 58 Licensed Massage Therapist (LMT)
## 59 Licensed Massage Therapist
## 60 Mobile Massage Therapist
## 61 Stretch Service Provider
## 62 Stretch Therapist / Fitness Professional / Personal Trainer...
## 63 Massage Therapists Waterbury to Danbury
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist
## HiringAgency
## 1 Ridgefield Physical TherapyRidgefield, CT 06877
## 2 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 3 Elements Massage3.6Smithtown, NY 11787 (Village of the Branch area)
## 4 Elements3.6Fairfield, CT 06825+3 locations
## 5 Restore Hyper Wellness + Cryotherapy4.7Westport, CT 06880+1 location
## 6 Phenix Salon Suites | NYNorwalk, CT 06851
## 7 Indo-Pak Massage TherapyGreenwich, CT•Remote work available
## 8 Stamford Sports & Spine4.5Stamford, CT 06901 (Downtown area)
## 9 NefaireWestport, CT 06880
## 10 Susi Laura MassageRidgefield, CT 06877
## 11 Williams & Company4.3Darien, CT 06820
## 12 Round Hill ClubGreenwich, CT 06831
## 13 Massage Green SpaOrange, CT 06477
## 14 Noelle Salon, Spa, BoutiqueStamford, CT 06905 (Turn of River area)
## 15 Massage Envy3.2Shelton, CT 06484
## 16 Cloud 9 Medi Day SpaMilford, CT 06460
## 17 Cloud 9 Medi Day SpaMilford, CT 06460
## 18 Massage Envy Hamden3.2Hamden, CT 06514
## 19 Indo-Pak Massage TherapyNorth Haven, CT
## 20 Evia Medical CenterSmithtown, NY 11787
## 21 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 22 LYMBRDarien, CT 06820
## 23 Massage Envy Southbury3.2Southbury, CT 06488
## 24 Sup Acupuncture PLLCPort Jefferson Station, NY 11776
## 25 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 26 Hand and Stone3.0Huntington, NY 11743
## 27 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 28 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
## 29 Noelle Salon, Spa, BoutiqueStamford, CT 06905 (Turn of River area)
## 30 Massage Envy3.2Shelton, CT 06484
## 31 Cloud 9 Medi Day SpaMilford, CT 06460
## 32 Cloud 9 Medi Day SpaMilford, CT 06460
## 33 Massage Envy Hamden3.2Hamden, CT 06514
## 34 Evia Medical CenterSmithtown, NY 11787
## 35 Indo-Pak Massage TherapyNorth Haven, CT
## 36 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 37 LYMBRDarien, CT 06820
## 38 Massage Envy Southbury3.2Southbury, CT 06488
## 39 Sup Acupuncture PLLCPort Jefferson Station, NY 11776
## 40 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 41 Hand and Stone3.0Huntington, NY 11743
## 42 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 43 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
## 44 LaVida Massage of SmithtownSmithtown, NY 11787 (Village of the Branch area)
## 45 Elements Massage3.6Smithtown, NY 11787 (Village of the Branch area)
## 46 Evia Medical CenterSmithtown, NY 11787
## 47 Ridgefield Physical TherapyRidgefield, CT 06877
## 48 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 49 Round Hill ClubGreenwich, CT 06831
## 50 Hand and Stone Massage and Facial Spa3.0Stony Brook, NY 11790
## 51 MAIA Salon Spa and WellnessSmithtown, NY 11787
## 52 Massage Green SpaNorwalk, CT 06851
## 53 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
## 54 Noelle Salon, Spa, BoutiqueStamford, CT 06905 (Turn of River area)
## 55 Massage Envy3.2Shelton, CT 06484
## 56 Cloud 9 Medi Day SpaMilford, CT 06460
## 57 Cloud 9 Medi Day SpaMilford, CT 06460
## 58 Massage Envy Hamden3.2Hamden, CT 06514
## 59 Evia Medical CenterSmithtown, NY 11787
## 60 Indo-Pak Massage TherapyNorth Haven, CT
## 61 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 62 LYMBRDarien, CT 06820
## 63 Massage Envy Southbury3.2Southbury, CT 06488
## 64 Sup Acupuncture PLLCPort Jefferson Station, NY 11776
## 65 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 66 Hand and Stone3.0Huntington, NY 11743
## 67 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 68 Panacea Massage and Wellness StudioPort Jefferson, NY 11777
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 26 16 70 20000 70000
## 2 3 16 70 20000 70000
## 3 30 16 70 20000 70000
## 4 30 16 70 20000 70000
## 5 20 16 70 20000 70000
## 6 Today 16 70 20000 70000
## 7 5 16 70 20000 70000
## 8 4 16 70 20000 70000
## 9 28 16 70 20000 70000
## 10 1 16 70 20000 70000
## 11 19 16 70 20000 70000
## 12 27 16 70 20000 70000
## 13 30 16 70 20000 70000
## 14 30 16 70 20000 70000
## 15 11 16 70 20000 70000
## 16 30 16 70 20000 70000
## 17 30 16 70 20000 70000
## 18 30 16 70 20000 70000
## 19 30 16 70 20000 70000
## 20 19 16 70 20000 70000
## 21 12 16 70 20000 70000
## 22 30 16 70 20000 70000
## 23 1 16 70 20000 70000
## 24 15 16 70 20000 70000
## 25 25 16 70 20000 70000
## 26 30 16 70 20000 70000
## 27 Today 16 70 20000 70000
## 28 13 16 70 20000 70000
## 29 30 16 70 20000 70000
## 30 11 16 70 20000 70000
## 31 30 16 70 20000 70000
## 32 30 16 70 20000 70000
## 33 30 16 70 20000 70000
## 34 19 16 70 20000 70000
## 35 30 16 70 20000 70000
## 36 12 16 70 20000 70000
## 37 30 16 70 20000 70000
## 38 1 16 70 20000 70000
## 39 15 16 70 20000 70000
## 40 25 16 70 20000 70000
## 41 30 16 70 20000 70000
## 42 Today 16 70 20000 70000
## 43 13 16 70 20000 70000
## 44 30 16 70 20000 70000
## 45 30 16 70 20000 70000
## 46 19 16 70 20000 70000
## 47 26 16 70 20000 70000
## 48 3 16 70 20000 70000
## 49 24 16 70 20000 70000
## 50 7 16 70 20000 70000
## 51 10 16 70 20000 70000
## 52 30 16 70 20000 70000
## 53 13 16 70 20000 70000
## 54 30 16 70 20000 70000
## 55 11 16 70 20000 70000
## 56 30 16 70 20000 70000
## 57 30 16 70 20000 70000
## 58 30 16 70 20000 70000
## 59 19 16 70 20000 70000
## 60 30 16 70 20000 70000
## 61 12 16 70 20000 70000
## 62 30 16 70 20000 70000
## 63 1 16 70 20000 70000
## 64 15 16 70 20000 70000
## 65 25 16 70 20000 70000
## 66 30 16 70 20000 70000
## 67 Today 16 70 20000 70000
## 68 13 16 70 20000 70000
getIndeedJobData5pages("massage therapist", "Stamford","CT")
## Warning in getIndeedJobData5pages("massage therapist", "Stamford", "CT"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Stamford", "CT"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Agora Day Spa, Massage Therapist needed!!!
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Stretch Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist / Acupuncturist
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Massage Therapist / Acupuncturist
## 20 Agora Day Spa, Massage Therapist needed!!!
## 21 Stretch Practitioner
## 22 Massage Therapist
## 23 Massage Therapist - Licensed LMT, New York
## 24 Stretch Service Provider
## 25 Licensed Massage Therapist (full and part-time)
## 26 Licensed Massage Therapist
## 27 Stretch Therapist / Fitness Professional / Personal Trainer...
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Medical Massage Therapist
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Mobile Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist Part-Time
## 39 Massage Therapist
## 40 Stretch Therapist/Personal Trainer
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist - Full-Time
## 44 Licensed Massage Therapist (LMT)
## 45 Massage Therapist - Full Time
## 46 MASSAGE THERAPIST
## 47 Massage Therapist
## 48 <U+200B>MASSAGE THERAPIST, LMT
## 49 Massage Therapist
## 50 Stretch Therapist/Personal Trainer
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist - Full-Time
## 54 Massage Therapist - Full Time
## 55 MASSAGE THERAPIST
## 56 Massage Therapist
## 57 Massage Therapist
## 58 <U+200B>MASSAGE THERAPIST, LMT
## 59 Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Medical Massage Therapist
## 65 Massage Therapist / Acupuncturist
## 66 Licensed Massage Therapist
## 67 Agora Day Spa, Massage Therapist needed!!!
## 68 Massage Therapist - Full-Time
## 69 Massage Therapist - Full Time
## 70 Licensed Massage Therapist (LMT)
## 71 MASSAGE THERAPIST
## 72 Massage Therapist
## 73 <U+200B>MASSAGE THERAPIST, LMT
## 74 Massage Therapist LMT (Licensed or Awaiting Exam)
## 75 Massage Therapist - Licensed or Limited Permit
## 76 Liscensed Massage Therapist
## 77 Lead Massage Therapist
## 78 Massage Therapist - Part-Time
## 79 Stretch Service Provider (Great Opportunity for Personal Tra...
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist needed for spa nominated BEST of...
## 82 Total Body Stretch Service Provider
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 2 \n$40 - $60 an hour $40 - $60 40 60
## 3 \n$13 - $28 an hour $13 - $28 13 28
## 4 \n$43 - $55 an hour $43 - $55 43 55
## 5 \n$16 - $18 an hour $16 - $18 16 18
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$40,000 - $70,000 a year $40000 - $70000 40000 70000
## 8 \n$50 - $60 an hour $50 - $60 50 60
## 9 \n$50 - $60 an hour $50 - $60 50 60
## 10 \n$33 - $51 an hour $33 - $51 33 51
## 11 \n$50 - $60 an hour $50 - $60 50 60
## 12 \n$25 - $50 an hour $25 - $50 25 50
## 13 \n$33 - $51 an hour $33 - $51 33 51
## 14 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 15 \n$20 - $25 an hour $20 - $25 20 25
## 16 \n$30 - $50 an hour $30 - $50 30 50
## 17 \n$50 - $60 an hour $50 - $60 50 60
## 18 \n$30 - $40 an hour $30 - $40 30 40
## 19 \n$40 - $60 an hour $40 - $60 40 60
## 20 \n$35 - $42 an hour $35 - $42 35 42
## 21 \n$45 - $70 an hour $45 - $70 45 70
## 22 \n$50 - $60 an hour $50 - $60 50 60
## 23 \n$50 - $60 an hour $50 - $60 50 60
## 24 \n$30 - $60 an hour $30 - $60 30 60
## 25 \n$50 - $60 an hour $50 - $60 50 60
## 26 \n$50 - $60 an hour $50 - $60 50 60
## 27 \n$30 - $60 an hour $30 - $60 30 60
## 28 \n$35,532 - $69,186 a year $35532 - $69186 35532 69186
## 29 \n$50 - $60 an hour $50 - $60 50 60
## 30 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 31 \n$50 - $60 an hour $50 - $60 50 60
## 32 \n$25 - $50 an hour $25 - $50 25 50
## 33 \n$40 - $60 an hour $40 - $60 40 60
## 34 \n$30 - $40 an hour $30 - $40 30 40
## 35 \n$33 - $51 an hour $33 - $51 33 51
## 36 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 37 \nUp to $50,000 a year $50000 50000 NA
## 38 \n$25 - $30 an hour $25 - $30 25 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 44 50 5832.842 8591.8 13
## 2 44 50 5832.842 8591.8 13
## 3 44 50 5832.842 8591.8 13
## 4 44 50 5832.842 8591.8 13
## 5 44 50 5832.842 8591.8 13
## 6 44 50 5832.842 8591.8 13
## 7 44 50 5832.842 8591.8 13
## 8 44 50 5832.842 8591.8 13
## 9 44 50 5832.842 8591.8 13
## 10 44 50 5832.842 8591.8 13
## 11 44 50 5832.842 8591.8 13
## 12 44 50 5832.842 8591.8 13
## 13 44 50 5832.842 8591.8 13
## 14 44 50 5832.842 8591.8 13
## 15 44 50 5832.842 8591.8 13
## 16 44 50 5832.842 8591.8 13
## 17 44 50 5832.842 8591.8 13
## 18 44 50 5832.842 8591.8 13
## 19 44 50 5832.842 8591.8 13
## 20 44 50 5832.842 8591.8 13
## 21 44 50 5832.842 8591.8 13
## 22 44 50 5832.842 8591.8 13
## 23 44 50 5832.842 8591.8 13
## 24 44 50 5832.842 8591.8 13
## 25 44 50 5832.842 8591.8 13
## 26 44 50 5832.842 8591.8 13
## 27 44 50 5832.842 8591.8 13
## 28 44 50 5832.842 8591.8 13
## 29 44 50 5832.842 8591.8 13
## 30 44 50 5832.842 8591.8 13
## 31 44 50 5832.842 8591.8 13
## 32 44 50 5832.842 8591.8 13
## 33 44 50 5832.842 8591.8 13
## 34 44 50 5832.842 8591.8 13
## 35 44 50 5832.842 8591.8 13
## 36 44 50 5832.842 8591.8 13
## 37 44 50 5832.842 8591.8 13
## 38 44 50 5832.842 8591.8 13
## maximumMaxSalary
## 1 70000
## 2 70000
## 3 70000
## 4 70000
## 5 70000
## 6 70000
## 7 70000
## 8 70000
## 9 70000
## 10 70000
## 11 70000
## 12 70000
## 13 70000
## 14 70000
## 15 70000
## 16 70000
## 17 70000
## 18 70000
## 19 70000
## 20 70000
## 21 70000
## 22 70000
## 23 70000
## 24 70000
## 25 70000
## 26 70000
## 27 70000
## 28 70000
## 29 70000
## 30 70000
## 31 70000
## 32 70000
## 33 70000
## 34 70000
## 35 70000
## 36 70000
## 37 70000
## 38 70000
##
## [[3]]
## date_daysAgo
## 1 3
## 2 30
## 3 24
## 4 1
## 5 30
## 6 4
## 7 18
## 8 20
## 9 5
## 10 18
## 11 7
## 12 19
## 13 Today
## 14 24
## 15 27
## 16 26
## 17 27
## 18 10
## 19 26
## 20 3
## 21 13
## 22 30
## 23 14
## 24 12
## 25 30
## 26 24
## 27 30
## 28 19
## 29 Today
## 30 6
## 31 6
## 32 1
## 33 30
## 34 14
## 35 14
## 36 30
## 37 25
## 38 12
## 39 30
## 40 30
## 41 Today
## 42 27
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 4
## 49 30
## 50 30
## 51 Today
## 52 27
## 53 30
## 54 30
## 55 30
## 56 3
## 57 30
## 58 4
## 59 30
## 60 30
## 61 27
## 62 10
## 63 1
## 64 6
## 65 26
## 66 30
## 67 3
## 68 30
## 69 30
## 70 30
## 71 30
## 72 30
## 73 4
## 74 5
## 75 30
## 76 7
## 77 30
## 78 30
## 79 12
## 80 19
## 81 30
## 82 30
##
## [[4]]
## HiringAgency
## 1 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 2 Massage Green SpaNorwalk, CT 06851
## 3 Soothe3.7Westchester, NY
## 4 Blackbird Yoga StudioHaworth, NJ 07641
## 5 StretchLab Woodbury3.8Woodbury, NY 11797
## 6 Stamford Sports & Spine4.5Stamford, CT 06901 (Downtown area)
## 7 Spavia Day Spa3.3Stamford, CT 06901 (Downtown area)
## 8 Restore Hyper Wellness + Cryotherapy4.7Stamford, CT 06905 (Newfield area)+2 locations
## 9 Indo-Pak Massage TherapyGreenwich, CT+4 locations•Remote work available
## 10 spavia StamfordStamford, CT 06901 (Downtown area)
## 11 Stamford Sports & Spine4.5Stamford, CT 06901 (Downtown area)
## 12 Williams & Company4.3Darien, CT 06820
## 13 Phenix Salon Suites | NYNorwalk, CT 06851
## 14 Round Hill ClubGreenwich, CT 06831
## 15 Round Hill ClubGreenwich, CT 06831
## 16 Ridgefield Physical TherapyRidgefield, CT 06877
## 17 Round Hill ClubGreenwich, CT 06831
## 18 MAIA Salon Spa and WellnessSmithtown, NY 11787
## 19 Ridgefield Physical TherapyRidgefield, CT 06877
## 20 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 21 Stretch Zone2.7Westport, CT 06880
## 22 StretchLab3.8Westport, CT 06880+2 locations
## 23 ProClinix Sports Physical Therapy Chiropractic PLL...Armonk, NY 10504
## 24 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 25 Elements3.6Ridgefield, CT 06877
## 26 Timeless Glow Aesthetic ClinicFairfield, CT
## 27 LYMBRDarien, CT 06820
## 28 Putnam Physical Medicine & RehabilitationMahopac, NY 10541
## 29 Hand and Stone3.0Huntington, NY 11743+7 locations
## 30 StretchLab - White Plains3.8White Plains, NY 10601
## 31 Bella Vita SpaDeer Park, NY 11729
## 32 Blackbird Yoga StudioHaworth, NJ 07641
## 33 Massage Green SpaNorwalk, CT 06851
## 34 Spavia Day Spa3.3Thornwood, NY 10594
## 35 Lighthouse Wellness Center4.0East Meadow, NY 11554
## 36 Indo-Pak Massage TherapyWhite Plains, NY
## 37 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 38 Massage Envy3.2Fairfield, CT 06825
## 39 Hand and Stone3.0Huntington, NY 11743
## 40 StretchLab North New Hyde ParkNorth New Hyde Park, NY
## 41 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 42 Thrive Chiropractic and WellnessCommack, NY 11725
## 43 Life Time3.6Syosset, NY 11791
## 44 Massage Envy of BaysideBayside, NY 11361
## 45 Life Time3.6Garden City, NY 11530
## 46 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 47 Deldor Day SpaTenafly, NJ 07670
## 48 West Hills + Mountain ParkWest Hills, NY
## 49 Hand and Stone3.0Huntington, NY 11743
## 50 StretchLab North New Hyde ParkNorth New Hyde Park, NY
## 51 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 52 Thrive Chiropractic and WellnessCommack, NY 11725
## 53 Life Time3.6Syosset, NY 11791
## 54 Life Time3.6Garden City, NY 11530
## 55 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 56 Elements Massage3.6Northport, NY 11768
## 57 Deldor Day SpaTenafly, NJ 07670
## 58 West Hills + Mountain ParkWest Hills, NY
## 59 Elements Massage3.6Smithtown, NY 11787 (Village of the Branch area)
## 60 LaVida Massage of SmithtownSmithtown, NY 11787 (Village of the Branch area)
## 61 Round Hill ClubGreenwich, CT 06831
## 62 MAIA Salon Spa and WellnessSmithtown, NY 11787
## 63 Blackbird Yoga StudioHaworth, NJ 07641
## 64 Bella Vita SpaDeer Park, NY 11729
## 65 Ridgefield Physical TherapyRidgefield, CT 06877
## 66 Massage Green SpaNorwalk, CT 06851
## 67 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 68 Life Time3.6Syosset, NY 11791
## 69 Life Time3.6Garden City, NY 11530
## 70 Massage Envy of BaysideBayside, NY 11361
## 71 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 72 Deldor Day SpaTenafly, NJ 07670
## 73 West Hills + Mountain ParkWest Hills, NY
## 74 Hand and Stone Massage and Facial Spa in Port Wash...3.0Port Washington, NY 11050
## 75 Massage Envy3.2Scarsdale, NY 10583
## 76 NYC and LI SPA ServiceFranklin Square, NY
## 77 Hand and Stone3.0Yonkers, NY 10710
## 78 Life Time3.6Syosset, NY 11791
## 79 Massage Envy3.2Garden City, NY 11530+1 location
## 80 Femina Beauty Salons and Ayurvedic SpaHicksville, NY 11801
## 81 Hand and Stone3.0Levittown, NY 11756
## 82 Massage Envy3.2Nanuet, NY 10954
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 7 \n$40,000 - $70,000 a year $40000 - $70000 40000 70000
## 14 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 28 \n$35,532 - $69,186 a year $35532 - $69186 35532 69186
## 30 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 36 \n$20,000 - $70,000 a year $20000 - $70000 20000 70000
## 37 \nUp to $50,000 a year $50000 50000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30000 70000 30790.29 68197.67 20000
## 7 30000 70000 30790.29 68197.67 20000
## 14 30000 70000 30790.29 68197.67 20000
## 28 30000 70000 30790.29 68197.67 20000
## 30 30000 70000 30790.29 68197.67 20000
## 36 30000 70000 30790.29 68197.67 20000
## 37 30000 70000 30790.29 68197.67 20000
## maximumMaxSalary
## 1 70000
## 7 70000
## 14 70000
## 28 70000
## 30 70000
## 36 70000
## 37 70000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$40 - $60 an hour $40 - $60 40 60 37.5
## 3 \n$13 - $28 an hour $13 - $28 13 28 37.5
## 4 \n$43 - $55 an hour $43 - $55 43 55 37.5
## 5 \n$16 - $18 an hour $16 - $18 16 18 37.5
## 8 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 9 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 10 \n$33 - $51 an hour $33 - $51 33 51 37.5
## 11 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 12 \n$25 - $50 an hour $25 - $50 25 50 37.5
## 13 \n$33 - $51 an hour $33 - $51 33 51 37.5
## 15 \n$20 - $25 an hour $20 - $25 20 25 37.5
## 16 \n$30 - $50 an hour $30 - $50 30 50 37.5
## 17 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 18 \n$30 - $40 an hour $30 - $40 30 40 37.5
## 19 \n$40 - $60 an hour $40 - $60 40 60 37.5
## 20 \n$35 - $42 an hour $35 - $42 35 42 37.5
## 21 \n$45 - $70 an hour $45 - $70 45 70 37.5
## 22 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 23 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 24 \n$30 - $60 an hour $30 - $60 30 60 37.5
## 25 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 26 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 27 \n$30 - $60 an hour $30 - $60 30 60 37.5
## 29 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 31 \n$50 - $60 an hour $50 - $60 50 60 37.5
## 32 \n$25 - $50 an hour $25 - $50 25 50 37.5
## 33 \n$40 - $60 an hour $40 - $60 40 60 37.5
## 34 \n$30 - $40 an hour $30 - $40 30 40 37.5
## 35 \n$33 - $51 an hour $33 - $51 33 51 37.5
## 38 \n$25 - $30 an hour $25 - $30 25 30 37.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 60 37.2 51.7 13 70
## 3 60 37.2 51.7 13 70
## 4 60 37.2 51.7 13 70
## 5 60 37.2 51.7 13 70
## 8 60 37.2 51.7 13 70
## 9 60 37.2 51.7 13 70
## 10 60 37.2 51.7 13 70
## 11 60 37.2 51.7 13 70
## 12 60 37.2 51.7 13 70
## 13 60 37.2 51.7 13 70
## 15 60 37.2 51.7 13 70
## 16 60 37.2 51.7 13 70
## 17 60 37.2 51.7 13 70
## 18 60 37.2 51.7 13 70
## 19 60 37.2 51.7 13 70
## 20 60 37.2 51.7 13 70
## 21 60 37.2 51.7 13 70
## 22 60 37.2 51.7 13 70
## 23 60 37.2 51.7 13 70
## 24 60 37.2 51.7 13 70
## 25 60 37.2 51.7 13 70
## 26 60 37.2 51.7 13 70
## 27 60 37.2 51.7 13 70
## 29 60 37.2 51.7 13 70
## 31 60 37.2 51.7 13 70
## 32 60 37.2 51.7 13 70
## 33 60 37.2 51.7 13 70
## 34 60 37.2 51.7 13 70
## 35 60 37.2 51.7 13 70
## 38 60 37.2 51.7 13 70
##
## [[7]]
## city state
## 1 Stamford CT
## 2 Stamford CT
## 3 Stamford CT
## 4 Stamford CT
## 5 Stamford CT
## 6 Stamford CT
## 7 Stamford CT
## 8 Stamford CT
## 9 Stamford CT
## 10 Stamford CT
## 11 Stamford CT
## 12 Stamford CT
## 13 Stamford CT
## 14 Stamford CT
## 15 Stamford CT
## 16 Stamford CT
## 17 Stamford CT
## 18 Stamford CT
## 19 Stamford CT
## 20 Stamford CT
## 21 Stamford CT
## 22 Stamford CT
## 23 Stamford CT
## 24 Stamford CT
## 25 Stamford CT
## 26 Stamford CT
## 27 Stamford CT
## 28 Stamford CT
## 29 Stamford CT
## 30 Stamford CT
## 31 Stamford CT
## 32 Stamford CT
## 33 Stamford CT
## 34 Stamford CT
## 35 Stamford CT
## 36 Stamford CT
## 37 Stamford CT
## 38 Stamford CT
## 39 Stamford CT
## 40 Stamford CT
## 41 Stamford CT
## 42 Stamford CT
## 43 Stamford CT
## 44 Stamford CT
## 45 Stamford CT
## 46 Stamford CT
## 47 Stamford CT
## 48 Stamford CT
## 49 Stamford CT
## 50 Stamford CT
## 51 Stamford CT
## 52 Stamford CT
## 53 Stamford CT
## 54 Stamford CT
## 55 Stamford CT
## 56 Stamford CT
## 57 Stamford CT
## 58 Stamford CT
## 59 Stamford CT
## 60 Stamford CT
## 61 Stamford CT
## 62 Stamford CT
## 63 Stamford CT
## 64 Stamford CT
## 65 Stamford CT
## 66 Stamford CT
## 67 Stamford CT
## 68 Stamford CT
## 69 Stamford CT
## 70 Stamford CT
## 71 Stamford CT
## 72 Stamford CT
## 73 Stamford CT
## 74 Stamford CT
## 75 Stamford CT
## 76 Stamford CT
## 77 Stamford CT
## 78 Stamford CT
## 79 Stamford CT
## 80 Stamford CT
## 81 Stamford CT
## 82 Stamford CT
## jobTitle
## 1 Agora Day Spa, Massage Therapist needed!!!
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Stretch Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist / Acupuncturist
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Massage Therapist / Acupuncturist
## 20 Agora Day Spa, Massage Therapist needed!!!
## 21 Stretch Practitioner
## 22 Massage Therapist
## 23 Massage Therapist - Licensed LMT, New York
## 24 Stretch Service Provider
## 25 Licensed Massage Therapist (full and part-time)
## 26 Licensed Massage Therapist
## 27 Stretch Therapist / Fitness Professional / Personal Trainer...
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Medical Massage Therapist
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Mobile Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist Part-Time
## 39 Massage Therapist
## 40 Stretch Therapist/Personal Trainer
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist - Full-Time
## 44 Licensed Massage Therapist (LMT)
## 45 Massage Therapist - Full Time
## 46 MASSAGE THERAPIST
## 47 Massage Therapist
## 48 <U+200B>MASSAGE THERAPIST, LMT
## 49 Massage Therapist
## 50 Stretch Therapist/Personal Trainer
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist - Full-Time
## 54 Massage Therapist - Full Time
## 55 MASSAGE THERAPIST
## 56 Massage Therapist
## 57 Massage Therapist
## 58 <U+200B>MASSAGE THERAPIST, LMT
## 59 Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Medical Massage Therapist
## 65 Massage Therapist / Acupuncturist
## 66 Licensed Massage Therapist
## 67 Agora Day Spa, Massage Therapist needed!!!
## 68 Massage Therapist - Full-Time
## 69 Massage Therapist - Full Time
## 70 Licensed Massage Therapist (LMT)
## 71 MASSAGE THERAPIST
## 72 Massage Therapist
## 73 <U+200B>MASSAGE THERAPIST, LMT
## 74 Massage Therapist LMT (Licensed or Awaiting Exam)
## 75 Massage Therapist - Licensed or Limited Permit
## 76 Liscensed Massage Therapist
## 77 Lead Massage Therapist
## 78 Massage Therapist - Part-Time
## 79 Stretch Service Provider (Great Opportunity for Personal Tra...
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist needed for spa nominated BEST of...
## 82 Total Body Stretch Service Provider
## HiringAgency
## 1 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 2 Massage Green SpaNorwalk, CT 06851
## 3 Soothe3.7Westchester, NY
## 4 Blackbird Yoga StudioHaworth, NJ 07641
## 5 StretchLab Woodbury3.8Woodbury, NY 11797
## 6 Stamford Sports & Spine4.5Stamford, CT 06901 (Downtown area)
## 7 Spavia Day Spa3.3Stamford, CT 06901 (Downtown area)
## 8 Restore Hyper Wellness + Cryotherapy4.7Stamford, CT 06905 (Newfield area)+2 locations
## 9 Indo-Pak Massage TherapyGreenwich, CT+4 locations•Remote work available
## 10 spavia StamfordStamford, CT 06901 (Downtown area)
## 11 Stamford Sports & Spine4.5Stamford, CT 06901 (Downtown area)
## 12 Williams & Company4.3Darien, CT 06820
## 13 Phenix Salon Suites | NYNorwalk, CT 06851
## 14 Round Hill ClubGreenwich, CT 06831
## 15 Round Hill ClubGreenwich, CT 06831
## 16 Ridgefield Physical TherapyRidgefield, CT 06877
## 17 Round Hill ClubGreenwich, CT 06831
## 18 MAIA Salon Spa and WellnessSmithtown, NY 11787
## 19 Ridgefield Physical TherapyRidgefield, CT 06877
## 20 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 21 Stretch Zone2.7Westport, CT 06880
## 22 StretchLab3.8Westport, CT 06880+2 locations
## 23 ProClinix Sports Physical Therapy Chiropractic PLL...Armonk, NY 10504
## 24 Massage Envy3.2Stamford, CT 06905 (Turn of River area)
## 25 Elements3.6Ridgefield, CT 06877
## 26 Timeless Glow Aesthetic ClinicFairfield, CT
## 27 LYMBRDarien, CT 06820
## 28 Putnam Physical Medicine & RehabilitationMahopac, NY 10541
## 29 Hand and Stone3.0Huntington, NY 11743+7 locations
## 30 StretchLab - White Plains3.8White Plains, NY 10601
## 31 Bella Vita SpaDeer Park, NY 11729
## 32 Blackbird Yoga StudioHaworth, NJ 07641
## 33 Massage Green SpaNorwalk, CT 06851
## 34 Spavia Day Spa3.3Thornwood, NY 10594
## 35 Lighthouse Wellness Center4.0East Meadow, NY 11554
## 36 Indo-Pak Massage TherapyWhite Plains, NY
## 37 Barbara Colao, LMTHuntington, NY 11743 (Halesite area)
## 38 Massage Envy3.2Fairfield, CT 06825
## 39 Hand and Stone3.0Huntington, NY 11743
## 40 StretchLab North New Hyde ParkNorth New Hyde Park, NY
## 41 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 42 Thrive Chiropractic and WellnessCommack, NY 11725
## 43 Life Time3.6Syosset, NY 11791
## 44 Massage Envy of BaysideBayside, NY 11361
## 45 Life Time3.6Garden City, NY 11530
## 46 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 47 Deldor Day SpaTenafly, NJ 07670
## 48 West Hills + Mountain ParkWest Hills, NY
## 49 Hand and Stone3.0Huntington, NY 11743
## 50 StretchLab North New Hyde ParkNorth New Hyde Park, NY
## 51 Hand & Stone Massage and Facial Spa3.0Huntington, NY 11743
## 52 Thrive Chiropractic and WellnessCommack, NY 11725
## 53 Life Time3.6Syosset, NY 11791
## 54 Life Time3.6Garden City, NY 11530
## 55 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 56 Elements Massage3.6Northport, NY 11768
## 57 Deldor Day SpaTenafly, NJ 07670
## 58 West Hills + Mountain ParkWest Hills, NY
## 59 Elements Massage3.6Smithtown, NY 11787 (Village of the Branch area)
## 60 LaVida Massage of SmithtownSmithtown, NY 11787 (Village of the Branch area)
## 61 Round Hill ClubGreenwich, CT 06831
## 62 MAIA Salon Spa and WellnessSmithtown, NY 11787
## 63 Blackbird Yoga StudioHaworth, NJ 07641
## 64 Bella Vita SpaDeer Park, NY 11729
## 65 Ridgefield Physical TherapyRidgefield, CT 06877
## 66 Massage Green SpaNorwalk, CT 06851
## 67 Agora Day Spa StamfordStamford, CT 06901 (Downtown area)
## 68 Life Time3.6Syosset, NY 11791
## 69 Life Time3.6Garden City, NY 11530
## 70 Massage Envy of BaysideBayside, NY 11361
## 71 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 72 Deldor Day SpaTenafly, NJ 07670
## 73 West Hills + Mountain ParkWest Hills, NY
## 74 Hand and Stone Massage and Facial Spa in Port Wash...3.0Port Washington, NY 11050
## 75 Massage Envy3.2Scarsdale, NY 10583
## 76 NYC and LI SPA ServiceFranklin Square, NY
## 77 Hand and Stone3.0Yonkers, NY 10710
## 78 Life Time3.6Syosset, NY 11791
## 79 Massage Envy3.2Garden City, NY 11530+1 location
## 80 Femina Beauty Salons and Ayurvedic SpaHicksville, NY 11801
## 81 Hand and Stone3.0Levittown, NY 11756
## 82 Massage Envy3.2Nanuet, NY 10954
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 3 13 70 20000 70000
## 2 30 13 70 20000 70000
## 3 24 13 70 20000 70000
## 4 1 13 70 20000 70000
## 5 30 13 70 20000 70000
## 6 4 13 70 20000 70000
## 7 18 13 70 20000 70000
## 8 20 13 70 20000 70000
## 9 5 13 70 20000 70000
## 10 18 13 70 20000 70000
## 11 7 13 70 20000 70000
## 12 19 13 70 20000 70000
## 13 Today 13 70 20000 70000
## 14 24 13 70 20000 70000
## 15 27 13 70 20000 70000
## 16 26 13 70 20000 70000
## 17 27 13 70 20000 70000
## 18 10 13 70 20000 70000
## 19 26 13 70 20000 70000
## 20 3 13 70 20000 70000
## 21 13 13 70 20000 70000
## 22 30 13 70 20000 70000
## 23 14 13 70 20000 70000
## 24 12 13 70 20000 70000
## 25 30 13 70 20000 70000
## 26 24 13 70 20000 70000
## 27 30 13 70 20000 70000
## 28 19 13 70 20000 70000
## 29 Today 13 70 20000 70000
## 30 6 13 70 20000 70000
## 31 6 13 70 20000 70000
## 32 1 13 70 20000 70000
## 33 30 13 70 20000 70000
## 34 14 13 70 20000 70000
## 35 14 13 70 20000 70000
## 36 30 13 70 20000 70000
## 37 25 13 70 20000 70000
## 38 12 13 70 20000 70000
## 39 30 13 70 20000 70000
## 40 30 13 70 20000 70000
## 41 Today 13 70 20000 70000
## 42 27 13 70 20000 70000
## 43 30 13 70 20000 70000
## 44 30 13 70 20000 70000
## 45 30 13 70 20000 70000
## 46 30 13 70 20000 70000
## 47 30 13 70 20000 70000
## 48 4 13 70 20000 70000
## 49 30 13 70 20000 70000
## 50 30 13 70 20000 70000
## 51 Today 13 70 20000 70000
## 52 27 13 70 20000 70000
## 53 30 13 70 20000 70000
## 54 30 13 70 20000 70000
## 55 30 13 70 20000 70000
## 56 3 13 70 20000 70000
## 57 30 13 70 20000 70000
## 58 4 13 70 20000 70000
## 59 30 13 70 20000 70000
## 60 30 13 70 20000 70000
## 61 27 13 70 20000 70000
## 62 10 13 70 20000 70000
## 63 1 13 70 20000 70000
## 64 6 13 70 20000 70000
## 65 26 13 70 20000 70000
## 66 30 13 70 20000 70000
## 67 3 13 70 20000 70000
## 68 30 13 70 20000 70000
## 69 30 13 70 20000 70000
## 70 30 13 70 20000 70000
## 71 30 13 70 20000 70000
## 72 30 13 70 20000 70000
## 73 4 13 70 20000 70000
## 74 5 13 70 20000 70000
## 75 30 13 70 20000 70000
## 76 7 13 70 20000 70000
## 77 30 13 70 20000 70000
## 78 30 13 70 20000 70000
## 79 12 13 70 20000 70000
## 80 19 13 70 20000 70000
## 81 30 13 70 20000 70000
## 82 30 13 70 20000 70000
getIndeedJobData5pages("massage therapist", "New Haven","CT")
## Warning in getIndeedJobData5pages("massage therapist", "New Haven", "CT"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "New Haven", "CT"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "New Haven", "CT"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Stretch Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Mobile Massage Therapist
## 8 Licensed Massage Therapist, Independent Contractor
## 9 Massage Therapist Full Time
## 10 Massage Therapist - Independent Contractor
## 11 Stretch Practitioner
## 12 Licensed Massage Therapist
## 13 Massage Therapists Waterbury to Danbury
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist (LMT)
## 17 Mobile Massage Therapist
## 18 Licensed Massage Therapist, Independent Contractor
## 19 Massage Therapist Full Time
## 20 Massage Therapist - Independent Contractor
## 21 Stretch Practitioner
## 22 Licensed Massage Therapist
## 23 Massage Therapists Waterbury to Danbury
## 24 Licensed Massage Therapist
## 25 Massage Therapist Part-Time
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist (LMT)
## 28 Mobile Massage Therapist
## 29 Licensed Massage Therapist, Independent Contractor
## 30 Massage Therapist Full Time
## 31 Massage Therapist - Independent Contractor
## 32 Stretch Practitioner
## 33 Licensed Massage Therapist
## 34 Massage Therapists Waterbury to Danbury
## 35 Licensed Massage Therapist
## 36 Massage Therapist Part-Time
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Mobile Massage Therapist
## 40 Licensed Massage Therapist, Independent Contractor
## 41 Massage Therapist Full Time
## 42 Massage Therapist - Independent Contractor
## 43 Stretch Practitioner
## 44 Licensed Massage Therapist
## 45 Massage Therapists Waterbury to Danbury
## 46 Licensed Massage Therapist
## 47 Massage Therapist Part-Time
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist (LMT)
## 50 Mobile Massage Therapist
## 51 Licensed Massage Therapist, Independent Contractor
## 52 Massage Therapist Full Time
## 53 Massage Therapist - Independent Contractor
## 54 Stretch Practitioner
## 55 Licensed Massage Therapist
## 56 Massage Therapists Waterbury to Danbury
## 57 Licensed Massage Therapist
## 58 Massage Therapist Part-Time
## 59 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$45 - $50 an hour $45 - $50 45 50
## 2 \n$62,000 a year $62000 62000 NA
## 3 \n$29 - $42 an hour $29 - $42 29 42
## 4 \n$16 - $18 an hour $16 - $18 16 18
## 5 \n$25 an hour $25 25 NA
## 6 \n$45 - $70 an hour $45 - $70 45 70
## 7 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 8 \n$30 - $40 an hour $30 - $40 30 40
## 9 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 10 \n$20 - $25 an hour $20 - $25 20 25
## 11 \n$35 - $45 an hour $35 - $45 35 45
## 12 \n$45 - $70 an hour $45 - $70 45 70
## 13 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 14 \n$30 - $40 an hour $30 - $40 30 40
## 15 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 16 \n$20 - $25 an hour $20 - $25 20 25
## 17 \n$35 - $45 an hour $35 - $45 35 45
## 18 \n$45 - $70 an hour $45 - $70 45 70
## 19 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 20 \n$30 - $40 an hour $30 - $40 30 40
## 21 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 22 \n$20 - $25 an hour $20 - $25 20 25
## 23 \n$35 - $45 an hour $35 - $45 35 45
## 24 \n$45 - $70 an hour $45 - $70 45 70
## 25 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 26 \n$30 - $40 an hour $30 - $40 30 40
## 27 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 28 \n$20 - $25 an hour $20 - $25 20 25
## 29 \n$35 - $45 an hour $35 - $45 35 45
## 30 \n$45 - $70 an hour $45 - $70 45 70
## 31 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 32 \n$30 - $40 an hour $30 - $40 30 40
## 33 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 34 \n$20 - $25 an hour $20 - $25 20 25
## 35 \n$35 - $45 an hour $35 - $45 35 45
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 45 13221.86 15643.75 16
## 2 35 45 13221.86 15643.75 16
## 3 35 45 13221.86 15643.75 16
## 4 35 45 13221.86 15643.75 16
## 5 35 45 13221.86 15643.75 16
## 6 35 45 13221.86 15643.75 16
## 7 35 45 13221.86 15643.75 16
## 8 35 45 13221.86 15643.75 16
## 9 35 45 13221.86 15643.75 16
## 10 35 45 13221.86 15643.75 16
## 11 35 45 13221.86 15643.75 16
## 12 35 45 13221.86 15643.75 16
## 13 35 45 13221.86 15643.75 16
## 14 35 45 13221.86 15643.75 16
## 15 35 45 13221.86 15643.75 16
## 16 35 45 13221.86 15643.75 16
## 17 35 45 13221.86 15643.75 16
## 18 35 45 13221.86 15643.75 16
## 19 35 45 13221.86 15643.75 16
## 20 35 45 13221.86 15643.75 16
## 21 35 45 13221.86 15643.75 16
## 22 35 45 13221.86 15643.75 16
## 23 35 45 13221.86 15643.75 16
## 24 35 45 13221.86 15643.75 16
## 25 35 45 13221.86 15643.75 16
## 26 35 45 13221.86 15643.75 16
## 27 35 45 13221.86 15643.75 16
## 28 35 45 13221.86 15643.75 16
## 29 35 45 13221.86 15643.75 16
## 30 35 45 13221.86 15643.75 16
## 31 35 45 13221.86 15643.75 16
## 32 35 45 13221.86 15643.75 16
## 33 35 45 13221.86 15643.75 16
## 34 35 45 13221.86 15643.75 16
## 35 35 45 13221.86 15643.75 16
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
## 26 62000
## 27 62000
## 28 62000
## 29 62000
## 30 62000
## 31 62000
## 32 62000
## 33 62000
## 34 62000
## 35 62000
##
## [[3]]
## date_daysAgo
## 1 19
## 2 30
## 3 30
## 4 20
## 5 15
## 6 22
## 7 30
## 8 30
## 9 30
## 10 30
## 11 13
## 12 11
## 13 1
## 14 24
## 15 30
## 16 22
## 17 30
## 18 30
## 19 30
## 20 30
## 21 13
## 22 11
## 23 1
## 24 24
## 25 12
## 26 30
## 27 22
## 28 30
## 29 30
## 30 30
## 31 30
## 32 13
## 33 11
## 34 1
## 35 24
## 36 12
## 37 30
## 38 22
## 39 30
## 40 30
## 41 30
## 42 30
## 43 13
## 44 11
## 45 1
## 46 24
## 47 12
## 48 30
## 49 22
## 50 30
## 51 30
## 52 30
## 53 30
## 54 13
## 55 11
## 56 1
## 57 24
## 58 12
## 59 30
##
## [[4]]
## HiringAgency
## 1 GRIND HEALTH CLUB LLCWaterbury, CT 06708 (Bunker Hill area)
## 2 Elements3.6Branford, CT 06405 (Branford Center area)+2 locations
## 3 Massage Envy Hamden3.2Hamden, CT 06514
## 4 Restore Hyper Wellness + Cryotherapy4.7Westport, CT 06880
## 5 Cheshire MassageCheshire, CT 06410
## 6 The Center For Higher LivingBerlin, CT 06037
## 7 Indo-Pak Massage TherapyNorth Haven, CT
## 8 Cloud 9 Medi Day SpaMilford, CT 06460
## 9 Massage Envy3.2Hamden, CT 06514+6 locations
## 10 Cloud 9 Medi Day SpaMilford, CT 06460
## 11 Stretch Zone2.7Westport, CT 06880
## 12 Massage Envy3.2Shelton, CT 06484
## 13 Massage Envy Southbury3.2Southbury, CT 06488
## 14 Timeless Glow Aesthetic ClinicFairfield, CT
## 15 Massage Green SpaOrange, CT 06477
## 16 The Center For Higher LivingBerlin, CT 06037
## 17 Indo-Pak Massage TherapyNorth Haven, CT
## 18 Cloud 9 Medi Day SpaMilford, CT 06460
## 19 Massage Envy3.2Hamden, CT 06514+6 locations
## 20 Cloud 9 Medi Day SpaMilford, CT 06460
## 21 Stretch Zone2.7Westport, CT 06880
## 22 Massage Envy3.2Shelton, CT 06484
## 23 Massage Envy Southbury3.2Southbury, CT 06488
## 24 Timeless Glow Aesthetic ClinicFairfield, CT
## 25 Massage Envy3.2Fairfield, CT 06825
## 26 Massage Green SpaOrange, CT 06477
## 27 The Center For Higher LivingBerlin, CT 06037
## 28 Indo-Pak Massage TherapyNorth Haven, CT
## 29 Cloud 9 Medi Day SpaMilford, CT 06460
## 30 Massage Envy3.2Hamden, CT 06514+6 locations
## 31 Cloud 9 Medi Day SpaMilford, CT 06460
## 32 Stretch Zone2.7Westport, CT 06880
## 33 Massage Envy3.2Shelton, CT 06484
## 34 Massage Envy Southbury3.2Southbury, CT 06488
## 35 Timeless Glow Aesthetic ClinicFairfield, CT
## 36 Massage Envy3.2Fairfield, CT 06825
## 37 Massage Green SpaOrange, CT 06477
## 38 The Center For Higher LivingBerlin, CT 06037
## 39 Indo-Pak Massage TherapyNorth Haven, CT
## 40 Cloud 9 Medi Day SpaMilford, CT 06460
## 41 Massage Envy3.2Hamden, CT 06514+6 locations
## 42 Cloud 9 Medi Day SpaMilford, CT 06460
## 43 Stretch Zone2.7Westport, CT 06880
## 44 Massage Envy3.2Shelton, CT 06484
## 45 Massage Envy Southbury3.2Southbury, CT 06488
## 46 Timeless Glow Aesthetic ClinicFairfield, CT
## 47 Massage Envy3.2Fairfield, CT 06825
## 48 Massage Green SpaOrange, CT 06477
## 49 The Center For Higher LivingBerlin, CT 06037
## 50 Indo-Pak Massage TherapyNorth Haven, CT
## 51 Cloud 9 Medi Day SpaMilford, CT 06460
## 52 Massage Envy3.2Hamden, CT 06514+6 locations
## 53 Cloud 9 Medi Day SpaMilford, CT 06460
## 54 Stretch Zone2.7Westport, CT 06880
## 55 Massage Envy3.2Shelton, CT 06484
## 56 Massage Envy Southbury3.2Southbury, CT 06488
## 57 Timeless Glow Aesthetic ClinicFairfield, CT
## 58 Massage Envy3.2Fairfield, CT 06825
## 59 Massage Green SpaOrange, CT 06477
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$62,000 a year $62000 62000 NA
## 7 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 9 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 13 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 15 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 19 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 21 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 25 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 27 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 31 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 33 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 40000 60000 42000 60000 40000
## 7 40000 60000 42000 60000 40000
## 9 40000 60000 42000 60000 40000
## 13 40000 60000 42000 60000 40000
## 15 40000 60000 42000 60000 40000
## 19 40000 60000 42000 60000 40000
## 21 40000 60000 42000 60000 40000
## 25 40000 60000 42000 60000 40000
## 27 40000 60000 42000 60000 40000
## 31 40000 60000 42000 60000 40000
## 33 40000 60000 42000 60000 40000
## maximumMaxSalary
## 2 60000
## 7 60000
## 9 60000
## 13 60000
## 15 60000
## 19 60000
## 21 60000
## 25 60000
## 27 60000
## 31 60000
## 33 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$45 - $50 an hour $45 - $50 45 50 30
## 3 \n$29 - $42 an hour $29 - $42 29 42 30
## 4 \n$16 - $18 an hour $16 - $18 16 18 30
## 5 \n$25 an hour $25 25 NA 30
## 6 \n$45 - $70 an hour $45 - $70 45 70 30
## 8 \n$30 - $40 an hour $30 - $40 30 40 30
## 10 \n$20 - $25 an hour $20 - $25 20 25 30
## 11 \n$35 - $45 an hour $35 - $45 35 45 30
## 12 \n$45 - $70 an hour $45 - $70 45 70 30
## 14 \n$30 - $40 an hour $30 - $40 30 40 30
## 16 \n$20 - $25 an hour $20 - $25 20 25 30
## 17 \n$35 - $45 an hour $35 - $45 35 45 30
## 18 \n$45 - $70 an hour $45 - $70 45 70 30
## 20 \n$30 - $40 an hour $30 - $40 30 40 30
## 22 \n$20 - $25 an hour $20 - $25 20 25 30
## 23 \n$35 - $45 an hour $35 - $45 35 45 30
## 24 \n$45 - $70 an hour $45 - $70 45 70 30
## 26 \n$30 - $40 an hour $30 - $40 30 40 30
## 28 \n$20 - $25 an hour $20 - $25 20 25 30
## 29 \n$35 - $45 an hour $35 - $45 35 45 30
## 30 \n$45 - $70 an hour $45 - $70 45 70 30
## 32 \n$30 - $40 an hour $30 - $40 30 40 30
## 34 \n$20 - $25 an hour $20 - $25 20 25 30
## 35 \n$35 - $45 an hour $35 - $45 35 45 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 42 31.875 43.91304 16 70
## 3 42 31.875 43.91304 16 70
## 4 42 31.875 43.91304 16 70
## 5 42 31.875 43.91304 16 70
## 6 42 31.875 43.91304 16 70
## 8 42 31.875 43.91304 16 70
## 10 42 31.875 43.91304 16 70
## 11 42 31.875 43.91304 16 70
## 12 42 31.875 43.91304 16 70
## 14 42 31.875 43.91304 16 70
## 16 42 31.875 43.91304 16 70
## 17 42 31.875 43.91304 16 70
## 18 42 31.875 43.91304 16 70
## 20 42 31.875 43.91304 16 70
## 22 42 31.875 43.91304 16 70
## 23 42 31.875 43.91304 16 70
## 24 42 31.875 43.91304 16 70
## 26 42 31.875 43.91304 16 70
## 28 42 31.875 43.91304 16 70
## 29 42 31.875 43.91304 16 70
## 30 42 31.875 43.91304 16 70
## 32 42 31.875 43.91304 16 70
## 34 42 31.875 43.91304 16 70
## 35 42 31.875 43.91304 16 70
##
## [[7]]
## city state jobTitle
## 1 New Haven CT Massage Therapist - Independent Contractor
## 2 New Haven CT Massage Therapist
## 3 New Haven CT Licensed Massage Therapist (LMT)
## 4 New Haven CT Stretch Therapist
## 5 New Haven CT Licensed Massage Therapist
## 6 New Haven CT Licensed Massage Therapist (LMT)
## 7 New Haven CT Mobile Massage Therapist
## 8 New Haven CT Licensed Massage Therapist, Independent Contractor
## 9 New Haven CT Massage Therapist Full Time
## 10 New Haven CT Massage Therapist - Independent Contractor
## 11 New Haven CT Stretch Practitioner
## 12 New Haven CT Licensed Massage Therapist
## 13 New Haven CT Massage Therapists Waterbury to Danbury
## 14 New Haven CT Licensed Massage Therapist
## 15 New Haven CT Licensed Massage Therapist
## 16 New Haven CT Licensed Massage Therapist (LMT)
## 17 New Haven CT Mobile Massage Therapist
## 18 New Haven CT Licensed Massage Therapist, Independent Contractor
## 19 New Haven CT Massage Therapist Full Time
## 20 New Haven CT Massage Therapist - Independent Contractor
## 21 New Haven CT Stretch Practitioner
## 22 New Haven CT Licensed Massage Therapist
## 23 New Haven CT Massage Therapists Waterbury to Danbury
## 24 New Haven CT Licensed Massage Therapist
## 25 New Haven CT Massage Therapist Part-Time
## 26 New Haven CT Licensed Massage Therapist
## 27 New Haven CT Licensed Massage Therapist (LMT)
## 28 New Haven CT Mobile Massage Therapist
## 29 New Haven CT Licensed Massage Therapist, Independent Contractor
## 30 New Haven CT Massage Therapist Full Time
## 31 New Haven CT Massage Therapist - Independent Contractor
## 32 New Haven CT Stretch Practitioner
## 33 New Haven CT Licensed Massage Therapist
## 34 New Haven CT Massage Therapists Waterbury to Danbury
## 35 New Haven CT Licensed Massage Therapist
## 36 New Haven CT Massage Therapist Part-Time
## 37 New Haven CT Licensed Massage Therapist
## 38 New Haven CT Licensed Massage Therapist (LMT)
## 39 New Haven CT Mobile Massage Therapist
## 40 New Haven CT Licensed Massage Therapist, Independent Contractor
## 41 New Haven CT Massage Therapist Full Time
## 42 New Haven CT Massage Therapist - Independent Contractor
## 43 New Haven CT Stretch Practitioner
## 44 New Haven CT Licensed Massage Therapist
## 45 New Haven CT Massage Therapists Waterbury to Danbury
## 46 New Haven CT Licensed Massage Therapist
## 47 New Haven CT Massage Therapist Part-Time
## 48 New Haven CT Licensed Massage Therapist
## 49 New Haven CT Licensed Massage Therapist (LMT)
## 50 New Haven CT Mobile Massage Therapist
## 51 New Haven CT Licensed Massage Therapist, Independent Contractor
## 52 New Haven CT Massage Therapist Full Time
## 53 New Haven CT Massage Therapist - Independent Contractor
## 54 New Haven CT Stretch Practitioner
## 55 New Haven CT Licensed Massage Therapist
## 56 New Haven CT Massage Therapists Waterbury to Danbury
## 57 New Haven CT Licensed Massage Therapist
## 58 New Haven CT Massage Therapist Part-Time
## 59 New Haven CT Licensed Massage Therapist
## HiringAgency
## 1 GRIND HEALTH CLUB LLCWaterbury, CT 06708 (Bunker Hill area)
## 2 Elements3.6Branford, CT 06405 (Branford Center area)+2 locations
## 3 Massage Envy Hamden3.2Hamden, CT 06514
## 4 Restore Hyper Wellness + Cryotherapy4.7Westport, CT 06880
## 5 Cheshire MassageCheshire, CT 06410
## 6 The Center For Higher LivingBerlin, CT 06037
## 7 Indo-Pak Massage TherapyNorth Haven, CT
## 8 Cloud 9 Medi Day SpaMilford, CT 06460
## 9 Massage Envy3.2Hamden, CT 06514+6 locations
## 10 Cloud 9 Medi Day SpaMilford, CT 06460
## 11 Stretch Zone2.7Westport, CT 06880
## 12 Massage Envy3.2Shelton, CT 06484
## 13 Massage Envy Southbury3.2Southbury, CT 06488
## 14 Timeless Glow Aesthetic ClinicFairfield, CT
## 15 Massage Green SpaOrange, CT 06477
## 16 The Center For Higher LivingBerlin, CT 06037
## 17 Indo-Pak Massage TherapyNorth Haven, CT
## 18 Cloud 9 Medi Day SpaMilford, CT 06460
## 19 Massage Envy3.2Hamden, CT 06514+6 locations
## 20 Cloud 9 Medi Day SpaMilford, CT 06460
## 21 Stretch Zone2.7Westport, CT 06880
## 22 Massage Envy3.2Shelton, CT 06484
## 23 Massage Envy Southbury3.2Southbury, CT 06488
## 24 Timeless Glow Aesthetic ClinicFairfield, CT
## 25 Massage Envy3.2Fairfield, CT 06825
## 26 Massage Green SpaOrange, CT 06477
## 27 The Center For Higher LivingBerlin, CT 06037
## 28 Indo-Pak Massage TherapyNorth Haven, CT
## 29 Cloud 9 Medi Day SpaMilford, CT 06460
## 30 Massage Envy3.2Hamden, CT 06514+6 locations
## 31 Cloud 9 Medi Day SpaMilford, CT 06460
## 32 Stretch Zone2.7Westport, CT 06880
## 33 Massage Envy3.2Shelton, CT 06484
## 34 Massage Envy Southbury3.2Southbury, CT 06488
## 35 Timeless Glow Aesthetic ClinicFairfield, CT
## 36 Massage Envy3.2Fairfield, CT 06825
## 37 Massage Green SpaOrange, CT 06477
## 38 The Center For Higher LivingBerlin, CT 06037
## 39 Indo-Pak Massage TherapyNorth Haven, CT
## 40 Cloud 9 Medi Day SpaMilford, CT 06460
## 41 Massage Envy3.2Hamden, CT 06514+6 locations
## 42 Cloud 9 Medi Day SpaMilford, CT 06460
## 43 Stretch Zone2.7Westport, CT 06880
## 44 Massage Envy3.2Shelton, CT 06484
## 45 Massage Envy Southbury3.2Southbury, CT 06488
## 46 Timeless Glow Aesthetic ClinicFairfield, CT
## 47 Massage Envy3.2Fairfield, CT 06825
## 48 Massage Green SpaOrange, CT 06477
## 49 The Center For Higher LivingBerlin, CT 06037
## 50 Indo-Pak Massage TherapyNorth Haven, CT
## 51 Cloud 9 Medi Day SpaMilford, CT 06460
## 52 Massage Envy3.2Hamden, CT 06514+6 locations
## 53 Cloud 9 Medi Day SpaMilford, CT 06460
## 54 Stretch Zone2.7Westport, CT 06880
## 55 Massage Envy3.2Shelton, CT 06484
## 56 Massage Envy Southbury3.2Southbury, CT 06488
## 57 Timeless Glow Aesthetic ClinicFairfield, CT
## 58 Massage Envy3.2Fairfield, CT 06825
## 59 Massage Green SpaOrange, CT 06477
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 19 16 70 40000 60000
## 2 30 16 70 40000 60000
## 3 30 16 70 40000 60000
## 4 20 16 70 40000 60000
## 5 15 16 70 40000 60000
## 6 22 16 70 40000 60000
## 7 30 16 70 40000 60000
## 8 30 16 70 40000 60000
## 9 30 16 70 40000 60000
## 10 30 16 70 40000 60000
## 11 13 16 70 40000 60000
## 12 11 16 70 40000 60000
## 13 1 16 70 40000 60000
## 14 24 16 70 40000 60000
## 15 30 16 70 40000 60000
## 16 22 16 70 40000 60000
## 17 30 16 70 40000 60000
## 18 30 16 70 40000 60000
## 19 30 16 70 40000 60000
## 20 30 16 70 40000 60000
## 21 13 16 70 40000 60000
## 22 11 16 70 40000 60000
## 23 1 16 70 40000 60000
## 24 24 16 70 40000 60000
## 25 12 16 70 40000 60000
## 26 30 16 70 40000 60000
## 27 22 16 70 40000 60000
## 28 30 16 70 40000 60000
## 29 30 16 70 40000 60000
## 30 30 16 70 40000 60000
## 31 30 16 70 40000 60000
## 32 13 16 70 40000 60000
## 33 11 16 70 40000 60000
## 34 1 16 70 40000 60000
## 35 24 16 70 40000 60000
## 36 12 16 70 40000 60000
## 37 30 16 70 40000 60000
## 38 22 16 70 40000 60000
## 39 30 16 70 40000 60000
## 40 30 16 70 40000 60000
## 41 30 16 70 40000 60000
## 42 30 16 70 40000 60000
## 43 13 16 70 40000 60000
## 44 11 16 70 40000 60000
## 45 1 16 70 40000 60000
## 46 24 16 70 40000 60000
## 47 12 16 70 40000 60000
## 48 30 16 70 40000 60000
## 49 22 16 70 40000 60000
## 50 30 16 70 40000 60000
## 51 30 16 70 40000 60000
## 52 30 16 70 40000 60000
## 53 30 16 70 40000 60000
## 54 13 16 70 40000 60000
## 55 11 16 70 40000 60000
## 56 1 16 70 40000 60000
## 57 24 16 70 40000 60000
## 58 12 16 70 40000 60000
## 59 30 16 70 40000 60000
Delaware Wilmington, Dover, Newark
getIndeedJobData5pages("massage therapist", "Wilmington","DE")
## Warning in getIndeedJobData5pages("massage therapist", "Wilmington", "DE"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Wilmington", "DE"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Program Specialist -Massage Therapist
## 5 Massage Therapist Instructor
## 6 Certified Massage Therapist
## 7 Licensed Massage Therapist-Part Time
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist/CMT
## 10 Licensed Massage Therapist
## 11 Certified Massage Therapist
## 12 Licensed Massage Therapist or Certified Massage Technician
## 13 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 14 Stretch Practitioner
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Massage Therapist Assistant Manager
## 28 Licensed Massage Therapist (LMT)
## 29 Licensed Massage Therapist - Full-Time
## 30 Lead Massage Therapist NEW HIRE BONUS AVAILABLE
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 33 Licensed Massage Therapist
## 34 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 35 Massage Therapist Full-Time
## 36 Lead Massage Therapist plus Healthcare
## 37 Licensed Massage Therapist (LMT)
## 38 Licensed Massage Therapist - Full-Time
## 39 Mobile Massage Therapist
## 40 Lead Massage Therapist NEW HIRE BONUS AVAILABLE
## 41 Massage Therapist Tuition Reimbursement plus Healthcare!!!
## 42 Licensed Massage Therapist LMT
## 43 Total Body Stretch Service Provider
## 44 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 45 Massage Therapist Full-Time
## 46 Lead Massage Therapist plus Healthcare
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 49 Licensed Massage Therapist (LMT)
## 50 Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist
## 54 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist (LMT)
## 57 Licensed Massage Therapist - Full-Time
## 58 Lead Massage Therapist NEW HIRE BONUS AVAILABLE
## 59 Mobile Massage Therapist
## 60 Massage Therapist Tuition Reimbursement plus Healthcare!!!
## 61 Licensed Massage Therapist LMT
## 62 Total Body Stretch Service Provider
## 63 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 64 Massage Therapist Full-Time
## 65 Lead Massage Therapist plus Healthcare
## 66 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist (LMT)
## 69 Massage Therapist
## 70 Massage Therapist
## 71 Licensed Massage Therapist
## 72 Massage Therapist
## 73 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 74 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 2 \n$25 an hour $25 25 NA
## 3 \n$21 - $28 an hour $21 - $28 21 28
## 4 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 5 \n$20 - $25 an hour $20 - $25 20 25
## 6 \n$20 - $22 an hour $20 - $22 20 22
## 7 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 8 \n$25 an hour $25 25 NA
## 9 \n$50 - $65 an hour $50 - $65 50 65
## 10 \n$23 - $28 an hour $23 - $28 23 28
## 11 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 12 \n$25 - $35 an hour $25 - $35 25 35
## 13 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 14 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 15 \n$45 - $70 an hour $45 - $70 45 70
## 16 \n$25 - $35 an hour $25 - $35 25 35
## 17 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 18 \n$25 an hour $25 25 NA
## 19 \n$20 - $22 an hour $20 - $22 20 22
## 20 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 21 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 22 \n$45 - $70 an hour $45 - $70 45 70
## 23 \n$25 - $35 an hour $25 - $35 25 35
## 24 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 25 \n$25 an hour $25 25 NA
## 26 \n$20 - $22 an hour $20 - $22 20 22
## 27 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 57.5 17719.96 21597.92 20
## 2 45 57.5 17719.96 21597.92 20
## 3 45 57.5 17719.96 21597.92 20
## 4 45 57.5 17719.96 21597.92 20
## 5 45 57.5 17719.96 21597.92 20
## 6 45 57.5 17719.96 21597.92 20
## 7 45 57.5 17719.96 21597.92 20
## 8 45 57.5 17719.96 21597.92 20
## 9 45 57.5 17719.96 21597.92 20
## 10 45 57.5 17719.96 21597.92 20
## 11 45 57.5 17719.96 21597.92 20
## 12 45 57.5 17719.96 21597.92 20
## 13 45 57.5 17719.96 21597.92 20
## 14 45 57.5 17719.96 21597.92 20
## 15 45 57.5 17719.96 21597.92 20
## 16 45 57.5 17719.96 21597.92 20
## 17 45 57.5 17719.96 21597.92 20
## 18 45 57.5 17719.96 21597.92 20
## 19 45 57.5 17719.96 21597.92 20
## 20 45 57.5 17719.96 21597.92 20
## 21 45 57.5 17719.96 21597.92 20
## 22 45 57.5 17719.96 21597.92 20
## 23 45 57.5 17719.96 21597.92 20
## 24 45 57.5 17719.96 21597.92 20
## 25 45 57.5 17719.96 21597.92 20
## 26 45 57.5 17719.96 21597.92 20
## 27 45 57.5 17719.96 21597.92 20
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 4
## 3 4
## 4 30
## 5 6
## 6 30
## 7 30
## 8 18
## 9 30
## 10 15
## 11 15
## 12 30
## 13 28
## 14 7
## 15 28
## 16 11
## 17 18
## 18 4
## 19 10
## 20 7
## 21 4
## 22 1
## 23 30
## 24 7
## 25 6
## 26 27
## 27 30
## 28 8
## 29 30
## 30 30
## 31 30
## 32 30
## 33 30
## 34 30
## 35 30
## 36 30
## 37 8
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 30
## 49 7
## 50 4
## 51 11
## 52 18
## 53 4
## 54 10
## 55 30
## 56 8
## 57 30
## 58 30
## 59 30
## 60 30
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
## 66 30
## 67 30
## 68 7
## 69 4
## 70 11
## 71 18
## 72 4
## 73 10
## 74 30
##
## [[4]]
## HiringAgency
## 1 Harmony SpaNewark, DE 19713
## 2 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 3 Broomall Total Health CenterBroomall, PA 19008
## 4 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 5 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 6 Hand and Stone3.0Wilmington, DE 19803+1 location
## 7 Spa at Montchanin VillageWilmington, DE
## 8 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 9 Hand and Stone3.0Middletown, DE 19709
## 10 FGG Spa, LLCWilmington, DE 19803+2 locations
## 11 FGG Spa, LLCWilmington, DE 19803+1 location
## 12 Hand and Stone3.0Bear, DE 19701
## 13 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 14 Stretch Zone2.7Devon, PA+2 locations
## 15 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 16 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 17 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 18 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 19 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 20 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 21 Broomall Total Health CenterBroomall, PA 19008
## 22 Platoon FitnessBryn Mawr, PA 19010
## 23 Life Time3.6Wayne, PA 19087+1 location
## 24 Masterpiece Hair StudioElkton, MD 21921
## 25 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 26 Mellow Massage and YogaPhiladelphia, PA
## 27 Hand and Stone3.0Glassboro, NJ 08028
## 28 Massage Envy3.2Chesterbrook, PA 19087
## 29 Hand and Stone3.0Wayne, PA 19087
## 30 Hand and Stone3.0Glassboro, NJ 08028
## 31 The cottage retreat day spaPennsville, NJ 08070
## 32 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 33 Harmony SpaNewark, DE 19713
## 34 Hand and Stone3.0Glassboro, NJ 08028
## 35 Massage Envy3.2Wayne, PA 19087+1 location
## 36 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 37 Massage Envy3.2Chesterbrook, PA 19087
## 38 Hand and Stone3.0Wayne, PA 19087
## 39 Indo-Pak Massage TherapyPhiladelphia, PA
## 40 Hand and Stone3.0Glassboro, NJ 08028
## 41 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 42 Hand and Stone3.0Philadelphia, PA 19147 (Wharton-Hawthorne-Bella Vista area)+1 location
## 43 Massage Envy3.2West Chester, PA 19382+2 locations
## 44 Hand and Stone3.0Glassboro, NJ 08028
## 45 Massage Envy3.2Wayne, PA 19087+1 location
## 46 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 47 The cottage retreat day spaPennsville, NJ 08070
## 48 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 49 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 50 Broomall Total Health CenterBroomall, PA 19008
## 51 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 52 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 53 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 54 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 55 Harmony SpaNewark, DE 19713
## 56 Massage Envy3.2Chesterbrook, PA 19087
## 57 Hand and Stone3.0Wayne, PA 19087
## 58 Hand and Stone3.0Glassboro, NJ 08028
## 59 Indo-Pak Massage TherapyPhiladelphia, PA
## 60 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 61 Hand and Stone3.0Philadelphia, PA 19147 (Wharton-Hawthorne-Bella Vista area)+1 location
## 62 Massage Envy3.2West Chester, PA 19382+2 locations
## 63 Hand and Stone3.0Glassboro, NJ 08028
## 64 Massage Envy3.2Wayne, PA 19087+1 location
## 65 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 66 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 67 The cottage retreat day spaPennsville, NJ 08070
## 68 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 69 Broomall Total Health CenterBroomall, PA 19008
## 70 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 71 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 72 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 73 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 74 Harmony SpaNewark, DE 19713
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 4 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 7 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 11 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 13 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 14 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 17 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 20 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 21 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 24 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 27 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 40000 58000 43454.55 54636.36 34000
## 4 40000 58000 43454.55 54636.36 34000
## 7 40000 58000 43454.55 54636.36 34000
## 11 40000 58000 43454.55 54636.36 34000
## 13 40000 58000 43454.55 54636.36 34000
## 14 40000 58000 43454.55 54636.36 34000
## 17 40000 58000 43454.55 54636.36 34000
## 20 40000 58000 43454.55 54636.36 34000
## 21 40000 58000 43454.55 54636.36 34000
## 24 40000 58000 43454.55 54636.36 34000
## 27 40000 58000 43454.55 54636.36 34000
## maximumMaxSalary
## 1 60000
## 4 60000
## 7 60000
## 11 60000
## 13 60000
## 14 60000
## 17 60000
## 20 60000
## 21 60000
## 24 60000
## 27 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$25 an hour $25 25 NA 25
## 3 \n$21 - $28 an hour $21 - $28 21 28 25
## 5 \n$20 - $25 an hour $20 - $25 20 25 25
## 6 \n$20 - $22 an hour $20 - $22 20 22 25
## 8 \n$25 an hour $25 25 NA 25
## 9 \n$50 - $65 an hour $50 - $65 50 65 25
## 10 \n$23 - $28 an hour $23 - $28 23 28 25
## 12 \n$25 - $35 an hour $25 - $35 25 35 25
## 15 \n$45 - $70 an hour $45 - $70 45 70 25
## 16 \n$25 - $35 an hour $25 - $35 25 35 25
## 18 \n$25 an hour $25 25 NA 25
## 19 \n$20 - $22 an hour $20 - $22 20 22 25
## 22 \n$45 - $70 an hour $45 - $70 45 70 25
## 23 \n$25 - $35 an hour $25 - $35 25 35 25
## 25 \n$25 an hour $25 25 NA 25
## 26 \n$20 - $22 an hour $20 - $22 20 22 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 31.5 27.4375 38.08333 20 70
## 3 31.5 27.4375 38.08333 20 70
## 5 31.5 27.4375 38.08333 20 70
## 6 31.5 27.4375 38.08333 20 70
## 8 31.5 27.4375 38.08333 20 70
## 9 31.5 27.4375 38.08333 20 70
## 10 31.5 27.4375 38.08333 20 70
## 12 31.5 27.4375 38.08333 20 70
## 15 31.5 27.4375 38.08333 20 70
## 16 31.5 27.4375 38.08333 20 70
## 18 31.5 27.4375 38.08333 20 70
## 19 31.5 27.4375 38.08333 20 70
## 22 31.5 27.4375 38.08333 20 70
## 23 31.5 27.4375 38.08333 20 70
## 25 31.5 27.4375 38.08333 20 70
## 26 31.5 27.4375 38.08333 20 70
##
## [[7]]
## city state
## 1 Wilmington DE
## 2 Wilmington DE
## 3 Wilmington DE
## 4 Wilmington DE
## 5 Wilmington DE
## 6 Wilmington DE
## 7 Wilmington DE
## 8 Wilmington DE
## 9 Wilmington DE
## 10 Wilmington DE
## 11 Wilmington DE
## 12 Wilmington DE
## 13 Wilmington DE
## 14 Wilmington DE
## 15 Wilmington DE
## 16 Wilmington DE
## 17 Wilmington DE
## 18 Wilmington DE
## 19 Wilmington DE
## 20 Wilmington DE
## 21 Wilmington DE
## 22 Wilmington DE
## 23 Wilmington DE
## 24 Wilmington DE
## 25 Wilmington DE
## 26 Wilmington DE
## 27 Wilmington DE
## 28 Wilmington DE
## 29 Wilmington DE
## 30 Wilmington DE
## 31 Wilmington DE
## 32 Wilmington DE
## 33 Wilmington DE
## 34 Wilmington DE
## 35 Wilmington DE
## 36 Wilmington DE
## 37 Wilmington DE
## 38 Wilmington DE
## 39 Wilmington DE
## 40 Wilmington DE
## 41 Wilmington DE
## 42 Wilmington DE
## 43 Wilmington DE
## 44 Wilmington DE
## 45 Wilmington DE
## 46 Wilmington DE
## 47 Wilmington DE
## 48 Wilmington DE
## 49 Wilmington DE
## 50 Wilmington DE
## 51 Wilmington DE
## 52 Wilmington DE
## 53 Wilmington DE
## 54 Wilmington DE
## 55 Wilmington DE
## 56 Wilmington DE
## 57 Wilmington DE
## 58 Wilmington DE
## 59 Wilmington DE
## 60 Wilmington DE
## 61 Wilmington DE
## 62 Wilmington DE
## 63 Wilmington DE
## 64 Wilmington DE
## 65 Wilmington DE
## 66 Wilmington DE
## 67 Wilmington DE
## 68 Wilmington DE
## 69 Wilmington DE
## 70 Wilmington DE
## 71 Wilmington DE
## 72 Wilmington DE
## 73 Wilmington DE
## 74 Wilmington DE
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Program Specialist -Massage Therapist
## 5 Massage Therapist Instructor
## 6 Certified Massage Therapist
## 7 Licensed Massage Therapist-Part Time
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist/CMT
## 10 Licensed Massage Therapist
## 11 Certified Massage Therapist
## 12 Licensed Massage Therapist or Certified Massage Technician
## 13 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 14 Stretch Practitioner
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Massage Therapist Assistant Manager
## 28 Licensed Massage Therapist (LMT)
## 29 Licensed Massage Therapist - Full-Time
## 30 Lead Massage Therapist NEW HIRE BONUS AVAILABLE
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 33 Licensed Massage Therapist
## 34 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 35 Massage Therapist Full-Time
## 36 Lead Massage Therapist plus Healthcare
## 37 Licensed Massage Therapist (LMT)
## 38 Licensed Massage Therapist - Full-Time
## 39 Mobile Massage Therapist
## 40 Lead Massage Therapist NEW HIRE BONUS AVAILABLE
## 41 Massage Therapist Tuition Reimbursement plus Healthcare!!!
## 42 Licensed Massage Therapist LMT
## 43 Total Body Stretch Service Provider
## 44 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 45 Massage Therapist Full-Time
## 46 Lead Massage Therapist plus Healthcare
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 49 Licensed Massage Therapist (LMT)
## 50 Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist
## 54 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist (LMT)
## 57 Licensed Massage Therapist - Full-Time
## 58 Lead Massage Therapist NEW HIRE BONUS AVAILABLE
## 59 Mobile Massage Therapist
## 60 Massage Therapist Tuition Reimbursement plus Healthcare!!!
## 61 Licensed Massage Therapist LMT
## 62 Total Body Stretch Service Provider
## 63 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 64 Massage Therapist Full-Time
## 65 Lead Massage Therapist plus Healthcare
## 66 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist (LMT)
## 69 Massage Therapist
## 70 Massage Therapist
## 71 Licensed Massage Therapist
## 72 Massage Therapist
## 73 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 74 Licensed Massage Therapist
## HiringAgency
## 1 Harmony SpaNewark, DE 19713
## 2 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 3 Broomall Total Health CenterBroomall, PA 19008
## 4 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 5 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 6 Hand and Stone3.0Wilmington, DE 19803+1 location
## 7 Spa at Montchanin VillageWilmington, DE
## 8 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 9 Hand and Stone3.0Middletown, DE 19709
## 10 FGG Spa, LLCWilmington, DE 19803+2 locations
## 11 FGG Spa, LLCWilmington, DE 19803+1 location
## 12 Hand and Stone3.0Bear, DE 19701
## 13 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 14 Stretch Zone2.7Devon, PA+2 locations
## 15 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 16 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 17 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 18 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 19 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 20 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 21 Broomall Total Health CenterBroomall, PA 19008
## 22 Platoon FitnessBryn Mawr, PA 19010
## 23 Life Time3.6Wayne, PA 19087+1 location
## 24 Masterpiece Hair StudioElkton, MD 21921
## 25 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 26 Mellow Massage and YogaPhiladelphia, PA
## 27 Hand and Stone3.0Glassboro, NJ 08028
## 28 Massage Envy3.2Chesterbrook, PA 19087
## 29 Hand and Stone3.0Wayne, PA 19087
## 30 Hand and Stone3.0Glassboro, NJ 08028
## 31 The cottage retreat day spaPennsville, NJ 08070
## 32 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 33 Harmony SpaNewark, DE 19713
## 34 Hand and Stone3.0Glassboro, NJ 08028
## 35 Massage Envy3.2Wayne, PA 19087+1 location
## 36 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 37 Massage Envy3.2Chesterbrook, PA 19087
## 38 Hand and Stone3.0Wayne, PA 19087
## 39 Indo-Pak Massage TherapyPhiladelphia, PA
## 40 Hand and Stone3.0Glassboro, NJ 08028
## 41 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 42 Hand and Stone3.0Philadelphia, PA 19147 (Wharton-Hawthorne-Bella Vista area)+1 location
## 43 Massage Envy3.2West Chester, PA 19382+2 locations
## 44 Hand and Stone3.0Glassboro, NJ 08028
## 45 Massage Envy3.2Wayne, PA 19087+1 location
## 46 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 47 The cottage retreat day spaPennsville, NJ 08070
## 48 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 49 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 50 Broomall Total Health CenterBroomall, PA 19008
## 51 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 52 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 53 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 54 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 55 Harmony SpaNewark, DE 19713
## 56 Massage Envy3.2Chesterbrook, PA 19087
## 57 Hand and Stone3.0Wayne, PA 19087
## 58 Hand and Stone3.0Glassboro, NJ 08028
## 59 Indo-Pak Massage TherapyPhiladelphia, PA
## 60 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 61 Hand and Stone3.0Philadelphia, PA 19147 (Wharton-Hawthorne-Bella Vista area)+1 location
## 62 Massage Envy3.2West Chester, PA 19382+2 locations
## 63 Hand and Stone3.0Glassboro, NJ 08028
## 64 Massage Envy3.2Wayne, PA 19087+1 location
## 65 Hand and Stone3.0Philadelphia, PA 19102 (City Center West area)
## 66 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 67 The cottage retreat day spaPennsville, NJ 08070
## 68 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 69 Broomall Total Health CenterBroomall, PA 19008
## 70 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 71 In The Village-- a fine salon & day spaMullica Hill, NJ 08062
## 72 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 73 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 74 Harmony SpaNewark, DE 19713
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 20 70 34000 60000
## 2 4 20 70 34000 60000
## 3 4 20 70 34000 60000
## 4 30 20 70 34000 60000
## 5 6 20 70 34000 60000
## 6 30 20 70 34000 60000
## 7 30 20 70 34000 60000
## 8 18 20 70 34000 60000
## 9 30 20 70 34000 60000
## 10 15 20 70 34000 60000
## 11 15 20 70 34000 60000
## 12 30 20 70 34000 60000
## 13 28 20 70 34000 60000
## 14 7 20 70 34000 60000
## 15 28 20 70 34000 60000
## 16 11 20 70 34000 60000
## 17 18 20 70 34000 60000
## 18 4 20 70 34000 60000
## 19 10 20 70 34000 60000
## 20 7 20 70 34000 60000
## 21 4 20 70 34000 60000
## 22 1 20 70 34000 60000
## 23 30 20 70 34000 60000
## 24 7 20 70 34000 60000
## 25 6 20 70 34000 60000
## 26 27 20 70 34000 60000
## 27 30 20 70 34000 60000
## 28 8 20 70 34000 60000
## 29 30 20 70 34000 60000
## 30 30 20 70 34000 60000
## 31 30 20 70 34000 60000
## 32 30 20 70 34000 60000
## 33 30 20 70 34000 60000
## 34 30 20 70 34000 60000
## 35 30 20 70 34000 60000
## 36 30 20 70 34000 60000
## 37 8 20 70 34000 60000
## 38 30 20 70 34000 60000
## 39 30 20 70 34000 60000
## 40 30 20 70 34000 60000
## 41 30 20 70 34000 60000
## 42 30 20 70 34000 60000
## 43 30 20 70 34000 60000
## 44 30 20 70 34000 60000
## 45 30 20 70 34000 60000
## 46 30 20 70 34000 60000
## 47 30 20 70 34000 60000
## 48 30 20 70 34000 60000
## 49 7 20 70 34000 60000
## 50 4 20 70 34000 60000
## 51 11 20 70 34000 60000
## 52 18 20 70 34000 60000
## 53 4 20 70 34000 60000
## 54 10 20 70 34000 60000
## 55 30 20 70 34000 60000
## 56 8 20 70 34000 60000
## 57 30 20 70 34000 60000
## 58 30 20 70 34000 60000
## 59 30 20 70 34000 60000
## 60 30 20 70 34000 60000
## 61 30 20 70 34000 60000
## 62 30 20 70 34000 60000
## 63 30 20 70 34000 60000
## 64 30 20 70 34000 60000
## 65 30 20 70 34000 60000
## 66 30 20 70 34000 60000
## 67 30 20 70 34000 60000
## 68 7 20 70 34000 60000
## 69 4 20 70 34000 60000
## 70 11 20 70 34000 60000
## 71 18 20 70 34000 60000
## 72 4 20 70 34000 60000
## 73 10 20 70 34000 60000
## 74 30 20 70 34000 60000
getIndeedJobData5pages("massage therapist", "Dover","DE")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Message Therapy Instructor
## 3 Licensed Massage Therapist/CMT
## 4 Licensed Massage Therapist
## 5 Message Therapy Instructor
## 6 Licensed Massage Therapist/CMT
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Message Therapy Instructor
## 10 Licensed Massage Therapist/CMT
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist
## 13 Message Therapy Instructor
## 14 Licensed Massage Therapist/CMT
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Message Therapy Instructor
## 18 Licensed Massage Therapist/CMT
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 30
## 2 7
## 3 30
## 4 28
## 5 7
## 6 30
## 7 30
## 8 28
## 9 7
## 10 30
## 11 28
## 12 30
## 13 7
## 14 30
## 15 30
## 16 28
## 17 7
## 18 30
## 19 30
## 20 28
##
## [[4]]
## HiringAgency
## 1 Heather's Holistic HealthDover, DE 19904
## 2 Branford Hall Career Institute - Dover CampusDover, DE 19904
## 3 Hand and Stone3.0Middletown, DE 19709
## 4 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 5 Branford Hall Career Institute - Dover CampusDover, DE 19904
## 6 Hand and Stone3.0Middletown, DE 19709
## 7 Heather's Holistic HealthDover, DE 19904
## 8 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 9 Branford Hall Career Institute - Dover CampusDover, DE 19904
## 10 Hand and Stone3.0Middletown, DE 19709
## 11 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 12 Heather's Holistic HealthDover, DE 19904
## 13 Branford Hall Career Institute - Dover CampusDover, DE 19904
## 14 Hand and Stone3.0Middletown, DE 19709
## 15 Heather's Holistic HealthDover, DE 19904
## 16 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 17 Branford Hall Career Institute - Dover CampusDover, DE 19904
## 18 Hand and Stone3.0Middletown, DE 19709
## 19 Heather's Holistic HealthDover, DE 19904
## 20 La Dolce Vita Spa for WellnessMiddletown, DE 19709
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Dover DE Licensed Massage Therapist
## 2 Dover DE Message Therapy Instructor
## 3 Dover DE Licensed Massage Therapist/CMT
## 4 Dover DE Licensed Massage Therapist
## 5 Dover DE Message Therapy Instructor
## 6 Dover DE Licensed Massage Therapist/CMT
## 7 Dover DE Licensed Massage Therapist
## 8 Dover DE Licensed Massage Therapist
## 9 Dover DE Message Therapy Instructor
## 10 Dover DE Licensed Massage Therapist/CMT
## 11 Dover DE Licensed Massage Therapist
## 12 Dover DE Licensed Massage Therapist
## 13 Dover DE Message Therapy Instructor
## 14 Dover DE Licensed Massage Therapist/CMT
## 15 Dover DE Licensed Massage Therapist
## 16 Dover DE Licensed Massage Therapist
## 17 Dover DE Message Therapy Instructor
## 18 Dover DE Licensed Massage Therapist/CMT
## 19 Dover DE Licensed Massage Therapist
## 20 Dover DE Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Heather's Holistic HealthDover, DE 19904 30
## 2 Branford Hall Career Institute - Dover CampusDover, DE 19904 7
## 3 Hand and Stone3.0Middletown, DE 19709 30
## 4 La Dolce Vita Spa for WellnessMiddletown, DE 19709 28
## 5 Branford Hall Career Institute - Dover CampusDover, DE 19904 7
## 6 Hand and Stone3.0Middletown, DE 19709 30
## 7 Heather's Holistic HealthDover, DE 19904 30
## 8 La Dolce Vita Spa for WellnessMiddletown, DE 19709 28
## 9 Branford Hall Career Institute - Dover CampusDover, DE 19904 7
## 10 Hand and Stone3.0Middletown, DE 19709 30
## 11 La Dolce Vita Spa for WellnessMiddletown, DE 19709 28
## 12 Heather's Holistic HealthDover, DE 19904 30
## 13 Branford Hall Career Institute - Dover CampusDover, DE 19904 7
## 14 Hand and Stone3.0Middletown, DE 19709 30
## 15 Heather's Holistic HealthDover, DE 19904 30
## 16 La Dolce Vita Spa for WellnessMiddletown, DE 19709 28
## 17 Branford Hall Career Institute - Dover CampusDover, DE 19904 7
## 18 Hand and Stone3.0Middletown, DE 19709 30
## 19 Heather's Holistic HealthDover, DE 19904 30
## 20 La Dolce Vita Spa for WellnessMiddletown, DE 19709 28
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
## 6 NA NA NA NA
## 7 NA NA NA NA
## 8 NA NA NA NA
## 9 NA NA NA NA
## 10 NA NA NA NA
## 11 NA NA NA NA
## 12 NA NA NA NA
## 13 NA NA NA NA
## 14 NA NA NA NA
## 15 NA NA NA NA
## 16 NA NA NA NA
## 17 NA NA NA NA
## 18 NA NA NA NA
## 19 NA NA NA NA
## 20 NA NA NA NA
getIndeedJobData5pages("massage therapist", "Newark","DE")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Certified Massage Therapist
## 5 Licensed Massage Therapist
## 6 Certified Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist Instructor
## 9 Program Specialist -Massage Therapist
## 10 Licensed Massage Therapist/CMT
## 11 Licensed Massage Therapist or Certified Massage Technician
## 12 Licensed Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Licensed Massage Therapist-Part Time
## 15 Massage Therapist - LMT
## 16 Licensed Massage Therapist
## 17 Massage Therapist Instructor
## 18 Program Specialist -Massage Therapist
## 19 Licensed Massage Therapist/CMT
## 20 Licensed Massage Therapist or Certified Massage Technician
## 21 Licensed Massage Therapist
## 22 Massage Therapist - Independent Contractor
## 23 Licensed Massage Therapist-Part Time
## 24 Massage Therapist - LMT
## 25 Licensed Massage Therapist
## 26 Massage Therapist (Full Time)
## 27 Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 28 Stretch Practitioner
## 29 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 30 Total Body Stretch Service Provider
## 31 Licensed Massage Therapist
## 32 Massage Therapist Instructor
## 33 Program Specialist -Massage Therapist
## 34 Licensed Massage Therapist/CMT
## 35 Licensed Massage Therapist or Certified Massage Technician
## 36 Licensed Massage Therapist
## 37 Massage Therapist - Independent Contractor
## 38 Licensed Massage Therapist-Part Time
## 39 Massage Therapist - LMT
## 40 Licensed Massage Therapist
## 41 Massage Therapist (Full Time)
## 42 Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 43 Stretch Practitioner
## 44 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 45 Total Body Stretch Service Provider
## 46 Licensed Massage Therapist
## 47 Massage Therapist Instructor
## 48 Program Specialist -Massage Therapist
## 49 Licensed Massage Therapist/CMT
## 50 Licensed Massage Therapist or Certified Massage Technician
## 51 Licensed Massage Therapist
## 52 Massage Therapist - Independent Contractor
## 53 Licensed Massage Therapist-Part Time
## 54 Massage Therapist - LMT
## 55 Licensed Massage Therapist
## 56 Massage Therapist (Full Time)
## 57 Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 58 Stretch Practitioner
## 59 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 60 Total Body Stretch Service Provider
## 61 Licensed Massage Therapist
## 62 Massage Therapist Instructor
## 63 Program Specialist -Massage Therapist
## 64 Licensed Massage Therapist/CMT
## 65 Licensed Massage Therapist or Certified Massage Technician
## 66 Licensed Massage Therapist
## 67 Massage Therapist - Independent Contractor
## 68 Licensed Massage Therapist-Part Time
## 69 Massage Therapist - LMT
## 70 Licensed Massage Therapist
## 71 Massage Therapist (Full Time)
## 72 Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 73 Stretch Practitioner
## 74 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 75 Total Body Stretch Service Provider
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 2 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 3 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 4 \n$21 - $28 an hour $21 - $28 21 28
## 5 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 6 \n$21 - $28 an hour $21 - $28 21 28
## 7 \n$20 - $25 an hour $20 - $25 20 25
## 8 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 9 \n$21 - $28 an hour $21 - $28 21 28
## 10 \n$20 - $25 an hour $20 - $25 20 25
## 11 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 12 \n$21 - $28 an hour $21 - $28 21 28
## 13 \n$20 - $25 an hour $20 - $25 20 25
## 14 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 15 \n$21 - $28 an hour $21 - $28 21 28
## 16 \n$20 - $25 an hour $20 - $25 20 25
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 21 28 16324.06 17638.28 20
## 2 21 28 16324.06 17638.28 20
## 3 21 28 16324.06 17638.28 20
## 4 21 28 16324.06 17638.28 20
## 5 21 28 16324.06 17638.28 20
## 6 21 28 16324.06 17638.28 20
## 7 21 28 16324.06 17638.28 20
## 8 21 28 16324.06 17638.28 20
## 9 21 28 16324.06 17638.28 20
## 10 21 28 16324.06 17638.28 20
## 11 21 28 16324.06 17638.28 20
## 12 21 28 16324.06 17638.28 20
## 13 21 28 16324.06 17638.28 20
## 14 21 28 16324.06 17638.28 20
## 15 21 28 16324.06 17638.28 20
## 16 21 28 16324.06 17638.28 20
## maximumMaxSalary
## 1 58000
## 2 58000
## 3 58000
## 4 58000
## 5 58000
## 6 58000
## 7 58000
## 8 58000
## 9 58000
## 10 58000
## 11 58000
## 12 58000
## 13 58000
## 14 58000
## 15 58000
## 16 58000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 4
## 3 7
## 4 7
## 5 7
## 6 30
## 7 30
## 8 6
## 9 30
## 10 30
## 11 30
## 12 28
## 13 18
## 14 30
## 15 30
## 16 30
## 17 6
## 18 30
## 19 30
## 20 30
## 21 28
## 22 18
## 23 30
## 24 30
## 25 30
## 26 30
## 27 7
## 28 7
## 29 28
## 30 30
## 31 30
## 32 6
## 33 30
## 34 30
## 35 30
## 36 28
## 37 18
## 38 30
## 39 30
## 40 30
## 41 30
## 42 7
## 43 7
## 44 28
## 45 30
## 46 30
## 47 6
## 48 30
## 49 30
## 50 30
## 51 28
## 52 18
## 53 30
## 54 30
## 55 30
## 56 30
## 57 7
## 58 7
## 59 28
## 60 30
## 61 30
## 62 6
## 63 30
## 64 30
## 65 30
## 66 28
## 67 18
## 68 30
## 69 30
## 70 30
## 71 30
## 72 7
## 73 7
## 74 28
## 75 30
##
## [[4]]
## HiringAgency
## 1 Harmony SpaNewark, DE 19713
## 2 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 3 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 4 FGG Spa, LLCWilmington, DE 19894
## 5 FGG Spa, LLCWilmington, DE 19894
## 6 Hand and Stone3.0Newark, DE 19711+1 location
## 7 Hand and Stone3.0Newark, DE 19711+4 locations
## 8 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 9 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 10 Hand and Stone3.0Middletown, DE 19709
## 11 Hand and Stone3.0Bear, DE 19701
## 12 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 13 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 14 Spa at Montchanin VillageWilmington, DE
## 15 Massage Envy3.2Newark, DE 19702
## 16 Hand and Stone3.0Newark, DE 19711+4 locations
## 17 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 18 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 19 Hand and Stone3.0Middletown, DE 19709
## 20 Hand and Stone3.0Bear, DE 19701
## 21 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 22 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 23 Spa at Montchanin VillageWilmington, DE
## 24 Massage Envy3.2Newark, DE 19702
## 25 Massage Envy3.2Newark, DE 19702
## 26 Massage Envy3.2Wilmington, DE 19803+2 locations
## 27 Masterpiece Hair StudioElkton, MD 21921
## 28 Stretch Zone2.7Exton, PA
## 29 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 30 Massage Envy3.2West Chester, PA 19382
## 31 Hand and Stone3.0Newark, DE 19711+4 locations
## 32 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 33 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 34 Hand and Stone3.0Middletown, DE 19709
## 35 Hand and Stone3.0Bear, DE 19701
## 36 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 37 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 38 Spa at Montchanin VillageWilmington, DE
## 39 Massage Envy3.2Newark, DE 19702
## 40 Massage Envy3.2Newark, DE 19702
## 41 Massage Envy3.2Wilmington, DE 19803+2 locations
## 42 Masterpiece Hair StudioElkton, MD 21921
## 43 Stretch Zone2.7Exton, PA
## 44 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 45 Massage Envy3.2West Chester, PA 19382
## 46 Hand and Stone3.0Newark, DE 19711+4 locations
## 47 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 48 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 49 Hand and Stone3.0Middletown, DE 19709
## 50 Hand and Stone3.0Bear, DE 19701
## 51 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 52 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 53 Spa at Montchanin VillageWilmington, DE
## 54 Massage Envy3.2Newark, DE 19702
## 55 Massage Envy3.2Newark, DE 19702
## 56 Massage Envy3.2Wilmington, DE 19803+2 locations
## 57 Masterpiece Hair StudioElkton, MD 21921
## 58 Stretch Zone2.7Exton, PA
## 59 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 60 Massage Envy3.2West Chester, PA 19382
## 61 Hand and Stone3.0Newark, DE 19711+4 locations
## 62 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 63 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 64 Hand and Stone3.0Middletown, DE 19709
## 65 Hand and Stone3.0Bear, DE 19701
## 66 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 67 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 68 Spa at Montchanin VillageWilmington, DE
## 69 Massage Envy3.2Newark, DE 19702
## 70 Massage Envy3.2Newark, DE 19702
## 71 Massage Envy3.2Wilmington, DE 19803+2 locations
## 72 Masterpiece Hair StudioElkton, MD 21921
## 73 Stretch Zone2.7Exton, PA
## 74 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 75 Massage Envy3.2West Chester, PA 19382
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$51,000 - $58,000 a year $51000 - $58000 51000 58000
## 2 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 3 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 5 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 8 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 11 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 14 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 34000 39000 37285.71 43285.71 34000
## 2 34000 39000 37285.71 43285.71 34000
## 3 34000 39000 37285.71 43285.71 34000
## 5 34000 39000 37285.71 43285.71 34000
## 8 34000 39000 37285.71 43285.71 34000
## 11 34000 39000 37285.71 43285.71 34000
## 14 34000 39000 37285.71 43285.71 34000
## maximumMaxSalary
## 1 58000
## 2 58000
## 3 58000
## 5 58000
## 8 58000
## 11 58000
## 14 58000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 4 \n$21 - $28 an hour $21 - $28 21 28 21
## 6 \n$21 - $28 an hour $21 - $28 21 28 21
## 7 \n$20 - $25 an hour $20 - $25 20 25 21
## 9 \n$21 - $28 an hour $21 - $28 21 28 21
## 10 \n$20 - $25 an hour $20 - $25 20 25 21
## 12 \n$21 - $28 an hour $21 - $28 21 28 21
## 13 \n$20 - $25 an hour $20 - $25 20 25 21
## 15 \n$21 - $28 an hour $21 - $28 21 28 21
## 16 \n$20 - $25 an hour $20 - $25 20 25 21
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 4 28 20.55556 26.66667 20 28
## 6 28 20.55556 26.66667 20 28
## 7 28 20.55556 26.66667 20 28
## 9 28 20.55556 26.66667 20 28
## 10 28 20.55556 26.66667 20 28
## 12 28 20.55556 26.66667 20 28
## 13 28 20.55556 26.66667 20 28
## 15 28 20.55556 26.66667 20 28
## 16 28 20.55556 26.66667 20 28
##
## [[7]]
## city state jobTitle
## 1 Newark DE Licensed Massage Therapist
## 2 Newark DE Massage Therapist
## 3 Newark DE Licensed Massage Therapist (LMT)
## 4 Newark DE Certified Massage Therapist
## 5 Newark DE Licensed Massage Therapist
## 6 Newark DE Certified Massage Therapist
## 7 Newark DE Licensed Massage Therapist
## 8 Newark DE Massage Therapist Instructor
## 9 Newark DE Program Specialist -Massage Therapist
## 10 Newark DE Licensed Massage Therapist/CMT
## 11 Newark DE Licensed Massage Therapist or Certified Massage Technician
## 12 Newark DE Licensed Massage Therapist
## 13 Newark DE Massage Therapist - Independent Contractor
## 14 Newark DE Licensed Massage Therapist-Part Time
## 15 Newark DE Massage Therapist - LMT
## 16 Newark DE Licensed Massage Therapist
## 17 Newark DE Massage Therapist Instructor
## 18 Newark DE Program Specialist -Massage Therapist
## 19 Newark DE Licensed Massage Therapist/CMT
## 20 Newark DE Licensed Massage Therapist or Certified Massage Technician
## 21 Newark DE Licensed Massage Therapist
## 22 Newark DE Massage Therapist - Independent Contractor
## 23 Newark DE Licensed Massage Therapist-Part Time
## 24 Newark DE Massage Therapist - LMT
## 25 Newark DE Licensed Massage Therapist
## 26 Newark DE Massage Therapist (Full Time)
## 27 Newark DE Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 28 Newark DE Stretch Practitioner
## 29 Newark DE Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 30 Newark DE Total Body Stretch Service Provider
## 31 Newark DE Licensed Massage Therapist
## 32 Newark DE Massage Therapist Instructor
## 33 Newark DE Program Specialist -Massage Therapist
## 34 Newark DE Licensed Massage Therapist/CMT
## 35 Newark DE Licensed Massage Therapist or Certified Massage Technician
## 36 Newark DE Licensed Massage Therapist
## 37 Newark DE Massage Therapist - Independent Contractor
## 38 Newark DE Licensed Massage Therapist-Part Time
## 39 Newark DE Massage Therapist - LMT
## 40 Newark DE Licensed Massage Therapist
## 41 Newark DE Massage Therapist (Full Time)
## 42 Newark DE Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 43 Newark DE Stretch Practitioner
## 44 Newark DE Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 45 Newark DE Total Body Stretch Service Provider
## 46 Newark DE Licensed Massage Therapist
## 47 Newark DE Massage Therapist Instructor
## 48 Newark DE Program Specialist -Massage Therapist
## 49 Newark DE Licensed Massage Therapist/CMT
## 50 Newark DE Licensed Massage Therapist or Certified Massage Technician
## 51 Newark DE Licensed Massage Therapist
## 52 Newark DE Massage Therapist - Independent Contractor
## 53 Newark DE Licensed Massage Therapist-Part Time
## 54 Newark DE Massage Therapist - LMT
## 55 Newark DE Licensed Massage Therapist
## 56 Newark DE Massage Therapist (Full Time)
## 57 Newark DE Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 58 Newark DE Stretch Practitioner
## 59 Newark DE Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 60 Newark DE Total Body Stretch Service Provider
## 61 Newark DE Licensed Massage Therapist
## 62 Newark DE Massage Therapist Instructor
## 63 Newark DE Program Specialist -Massage Therapist
## 64 Newark DE Licensed Massage Therapist/CMT
## 65 Newark DE Licensed Massage Therapist or Certified Massage Technician
## 66 Newark DE Licensed Massage Therapist
## 67 Newark DE Massage Therapist - Independent Contractor
## 68 Newark DE Licensed Massage Therapist-Part Time
## 69 Newark DE Massage Therapist - LMT
## 70 Newark DE Licensed Massage Therapist
## 71 Newark DE Massage Therapist (Full Time)
## 72 Newark DE Hair Stylist/Barber/Estheticians/Nail tech/Massage Therapist
## 73 Newark DE Stretch Practitioner
## 74 Newark DE Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 75 Newark DE Total Body Stretch Service Provider
## HiringAgency
## 1 Harmony SpaNewark, DE 19713
## 2 Hand & Stone - Wilmington3.0Wilmington, DE 19808
## 3 Hand and Stone Massage & Facial Spa Exton/West ChesterExton, PA 19341
## 4 FGG Spa, LLCWilmington, DE 19894
## 5 FGG Spa, LLCWilmington, DE 19894
## 6 Hand and Stone3.0Newark, DE 19711+1 location
## 7 Hand and Stone3.0Newark, DE 19711+4 locations
## 8 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 9 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 10 Hand and Stone3.0Middletown, DE 19709
## 11 Hand and Stone3.0Bear, DE 19701
## 12 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 13 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 14 Spa at Montchanin VillageWilmington, DE
## 15 Massage Envy3.2Newark, DE 19702
## 16 Hand and Stone3.0Newark, DE 19711+4 locations
## 17 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 18 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 19 Hand and Stone3.0Middletown, DE 19709
## 20 Hand and Stone3.0Bear, DE 19701
## 21 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 22 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 23 Spa at Montchanin VillageWilmington, DE
## 24 Massage Envy3.2Newark, DE 19702
## 25 Massage Envy3.2Newark, DE 19702
## 26 Massage Envy3.2Wilmington, DE 19803+2 locations
## 27 Masterpiece Hair StudioElkton, MD 21921
## 28 Stretch Zone2.7Exton, PA
## 29 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 30 Massage Envy3.2West Chester, PA 19382
## 31 Hand and Stone3.0Newark, DE 19711+4 locations
## 32 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 33 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 34 Hand and Stone3.0Middletown, DE 19709
## 35 Hand and Stone3.0Bear, DE 19701
## 36 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 37 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 38 Spa at Montchanin VillageWilmington, DE
## 39 Massage Envy3.2Newark, DE 19702
## 40 Massage Envy3.2Newark, DE 19702
## 41 Massage Envy3.2Wilmington, DE 19803+2 locations
## 42 Masterpiece Hair StudioElkton, MD 21921
## 43 Stretch Zone2.7Exton, PA
## 44 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 45 Massage Envy3.2West Chester, PA 19382
## 46 Hand and Stone3.0Newark, DE 19711+4 locations
## 47 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 48 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 49 Hand and Stone3.0Middletown, DE 19709
## 50 Hand and Stone3.0Bear, DE 19701
## 51 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 52 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 53 Spa at Montchanin VillageWilmington, DE
## 54 Massage Envy3.2Newark, DE 19702
## 55 Massage Envy3.2Newark, DE 19702
## 56 Massage Envy3.2Wilmington, DE 19803+2 locations
## 57 Masterpiece Hair StudioElkton, MD 21921
## 58 Stretch Zone2.7Exton, PA
## 59 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 60 Massage Envy3.2West Chester, PA 19382
## 61 Hand and Stone3.0Newark, DE 19711+4 locations
## 62 Harris School of Business - Wilmington CampusWilmington, DE 19803
## 63 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 64 Hand and Stone3.0Middletown, DE 19709
## 65 Hand and Stone3.0Bear, DE 19701
## 66 La Dolce Vita Spa for WellnessMiddletown, DE 19709
## 67 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 68 Spa at Montchanin VillageWilmington, DE
## 69 Massage Envy3.2Newark, DE 19702
## 70 Massage Envy3.2Newark, DE 19702
## 71 Massage Envy3.2Wilmington, DE 19803+2 locations
## 72 Masterpiece Hair StudioElkton, MD 21921
## 73 Stretch Zone2.7Exton, PA
## 74 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 75 Massage Envy3.2West Chester, PA 19382
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 20 28 34000 58000
## 2 4 20 28 34000 58000
## 3 7 20 28 34000 58000
## 4 7 20 28 34000 58000
## 5 7 20 28 34000 58000
## 6 30 20 28 34000 58000
## 7 30 20 28 34000 58000
## 8 6 20 28 34000 58000
## 9 30 20 28 34000 58000
## 10 30 20 28 34000 58000
## 11 30 20 28 34000 58000
## 12 28 20 28 34000 58000
## 13 18 20 28 34000 58000
## 14 30 20 28 34000 58000
## 15 30 20 28 34000 58000
## 16 30 20 28 34000 58000
## 17 6 20 28 34000 58000
## 18 30 20 28 34000 58000
## 19 30 20 28 34000 58000
## 20 30 20 28 34000 58000
## 21 28 20 28 34000 58000
## 22 18 20 28 34000 58000
## 23 30 20 28 34000 58000
## 24 30 20 28 34000 58000
## 25 30 20 28 34000 58000
## 26 30 20 28 34000 58000
## 27 7 20 28 34000 58000
## 28 7 20 28 34000 58000
## 29 28 20 28 34000 58000
## 30 30 20 28 34000 58000
## 31 30 20 28 34000 58000
## 32 6 20 28 34000 58000
## 33 30 20 28 34000 58000
## 34 30 20 28 34000 58000
## 35 30 20 28 34000 58000
## 36 28 20 28 34000 58000
## 37 18 20 28 34000 58000
## 38 30 20 28 34000 58000
## 39 30 20 28 34000 58000
## 40 30 20 28 34000 58000
## 41 30 20 28 34000 58000
## 42 7 20 28 34000 58000
## 43 7 20 28 34000 58000
## 44 28 20 28 34000 58000
## 45 30 20 28 34000 58000
## 46 30 20 28 34000 58000
## 47 6 20 28 34000 58000
## 48 30 20 28 34000 58000
## 49 30 20 28 34000 58000
## 50 30 20 28 34000 58000
## 51 28 20 28 34000 58000
## 52 18 20 28 34000 58000
## 53 30 20 28 34000 58000
## 54 30 20 28 34000 58000
## 55 30 20 28 34000 58000
## 56 30 20 28 34000 58000
## 57 7 20 28 34000 58000
## 58 7 20 28 34000 58000
## 59 28 20 28 34000 58000
## 60 30 20 28 34000 58000
## 61 30 20 28 34000 58000
## 62 6 20 28 34000 58000
## 63 30 20 28 34000 58000
## 64 30 20 28 34000 58000
## 65 30 20 28 34000 58000
## 66 28 20 28 34000 58000
## 67 18 20 28 34000 58000
## 68 30 20 28 34000 58000
## 69 30 20 28 34000 58000
## 70 30 20 28 34000 58000
## 71 30 20 28 34000 58000
## 72 7 20 28 34000 58000
## 73 7 20 28 34000 58000
## 74 28 20 28 34000 58000
## 75 30 20 28 34000 58000
Florida Jacksonville, Miami, Tampa
getIndeedJobData5pages("massage therapist","Jacksonville","FL")
## Warning in getIndeedJobData5pages("massage therapist", "Jacksonville", "FL"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Jacksonville", "FL"):
## NAs introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Experienced Massage Therapist
## 3 Licensed Massage Therapist
## 4 Liscensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Massage Therapist - Will Train, No Experience Neccessary
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 LICENSED MASSAGE THERAPIST (LMT)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Licensed Massage Therapist
## 16 Reflexologist
## 17 Full and Part Time Massage Therapist
## 18 Licensed Massage Therapist and Coordinator
## 19 Massage Therapist
## 20 Massage Therapist - Independent Cont. , One Ocean Reso
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist (LMT) for DAY SPA
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist LMT New Durbin Spa
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Flexologist (Stretch Professional)- Mandarin Studio
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Reflexologist
## 32 Full and Part Time Massage Therapist
## 33 Licensed Massage Therapist and Coordinator
## 34 Massage Therapist
## 35 Massage Therapist - Independent Cont. , One Ocean Reso
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist (LMT) for DAY SPA
## 38 Massage Therapist - Independent Contractor
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist LMT New Durbin Spa
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Flexologist (Stretch Professional)- Mandarin Studio
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Reflexologist
## 47 Full and Part Time Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist LMT New Durbin Spa
## 51 Licensed Massage Therapist
## 52 Flexologist (Stretch Professional)- Mandarin Studio
## 53 Licensed Massage Therapist
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Reflexologist
## 57 Full and Part Time Massage Therapist
## 58 Liscensed Massage Therapist
## 59 Licensed Massage Therapist (LMT)
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Massage Therapist - Will Train, No Experience Neccessary
## 64 Licensed Massage Therapist (LMT)
## 65 Experienced Massage Therapist
## 66 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 an hour $20 20.0 NA
## 2 \n$34,662 - $65,000 a year $34662 - $65000 34662.0 65000
## 3 \n$21 - $30 an hour $21 - $30 21.0 30
## 4 \n$17.50 - $33.00 an hour $17.50 - $33.00 17.5 33
## 5 \n$18 - $30 an hour $18 - $30 18.0 30
## 6 \n$30 - $40 an hour $30 - $40 30.0 40
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 8 \n$20 - $28 an hour $20 - $28 20.0 28
## 9 \n$20 - $25 an hour $20 - $25 20.0 25
## 10 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 11 \n$30 - $35 an hour $30 - $35 30.0 35
## 12 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 13 \n$30,000 - $65,000 a year $30000 - $65000 30000.0 65000
## 14 \n$100 - $150 a day $100 - $150 100.0 150
## 15 \n$15 an hour $15 15.0 NA
## 16 \n$30 - $35 an hour $30 - $35 30.0 35
## 17 \n$18 - $24 an hour $18 - $24 18.0 24
## 18 \n$100 - $150 a day $100 - $150 100.0 150
## 19 \n$15 an hour $15 15.0 NA
## 20 \n$30 - $35 an hour $30 - $35 30.0 35
## 21 \n$18 - $24 an hour $18 - $24 18.0 24
## 22 \n$100 - $150 a day $100 - $150 100.0 150
## 23 \n$15 an hour $15 15.0 NA
## 24 \n$15 - $38 an hour $15 - $38 15.0 38
## 25 \n$100 - $150 a day $100 - $150 100.0 150
## 26 \n$15 an hour $15 15.0 NA
## 27 \n$17.50 - $33.00 an hour $17.50 - $33.00 17.5 33
## 28 \n$18 - $30 an hour $18 - $30 18.0 30
## 29 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 30 \n$21 - $30 an hour $21 - $30 21.0 30
## 31 \n$30 - $40 an hour $30 - $40 30.0 40
## 32 \n$30,000 - $65,000 a year $30000 - $65000 30000.0 65000
## 33 \n$34,662 - $65,000 a year $34662 - $65000 34662.0 65000
## 34 \n$20 an hour $20 20.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 21 31.5 6035.235 9812.387 15
## 2 21 31.5 6035.235 9812.387 15
## 3 21 31.5 6035.235 9812.387 15
## 4 21 31.5 6035.235 9812.387 15
## 5 21 31.5 6035.235 9812.387 15
## 6 21 31.5 6035.235 9812.387 15
## 7 21 31.5 6035.235 9812.387 15
## 8 21 31.5 6035.235 9812.387 15
## 9 21 31.5 6035.235 9812.387 15
## 10 21 31.5 6035.235 9812.387 15
## 11 21 31.5 6035.235 9812.387 15
## 12 21 31.5 6035.235 9812.387 15
## 13 21 31.5 6035.235 9812.387 15
## 14 21 31.5 6035.235 9812.387 15
## 15 21 31.5 6035.235 9812.387 15
## 16 21 31.5 6035.235 9812.387 15
## 17 21 31.5 6035.235 9812.387 15
## 18 21 31.5 6035.235 9812.387 15
## 19 21 31.5 6035.235 9812.387 15
## 20 21 31.5 6035.235 9812.387 15
## 21 21 31.5 6035.235 9812.387 15
## 22 21 31.5 6035.235 9812.387 15
## 23 21 31.5 6035.235 9812.387 15
## 24 21 31.5 6035.235 9812.387 15
## 25 21 31.5 6035.235 9812.387 15
## 26 21 31.5 6035.235 9812.387 15
## 27 21 31.5 6035.235 9812.387 15
## 28 21 31.5 6035.235 9812.387 15
## 29 21 31.5 6035.235 9812.387 15
## 30 21 31.5 6035.235 9812.387 15
## 31 21 31.5 6035.235 9812.387 15
## 32 21 31.5 6035.235 9812.387 15
## 33 21 31.5 6035.235 9812.387 15
## 34 21 31.5 6035.235 9812.387 15
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 28 65000
## 29 65000
## 30 65000
## 31 65000
## 32 65000
## 33 65000
## 34 65000
##
## [[3]]
## date_daysAgo
## 1 6
## 2 30
## 3 4
## 4 10
## 5 30
## 6 7
## 7 6
## 8 5
## 9 18
## 10 Today
## 11 30
## 12 6
## 13 30
## 14 22
## 15 30
## 16 30
## 17 30
## 18 22
## 19 17
## 20 23
## 21 Today
## 22 21
## 23 23
## 24 29
## 25 30
## 26 30
## 27 3
## 28 30
## 29 30
## 30 30
## 31 30
## 32 30
## 33 22
## 34 17
## 35 23
## 36 Today
## 37 21
## 38 23
## 39 29
## 40 30
## 41 30
## 42 3
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 30
## 49 30
## 50 30
## 51 3
## 52 30
## 53 30
## 54 Today
## 55 30
## 56 30
## 57 30
## 58 10
## 59 7
## 60 30
## 61 30
## 62 4
## 63 6
## 64 22
## 65 30
## 66 6
##
## [[4]]
## HiringAgency
## 1 Chiropractic Injury SolutionsJacksonville, FL 32210 (Cedar Hills area)
## 2 Unify Health Services LLCJacksonville, FL 32223 (Mandarin area)
## 3 Castelli Chiropractic CenterJacksonville, FL 32246 (Park Ridge area)
## 4 Essentials Massage & Facial of BaymeadowsJacksonville, FL 32256 (Baymeadows area)
## 5 Morris ChiropracticJacksonville, FL 32250
## 6 Hand & Stone Massage and Facial Spa Jacksonville3.0Jacksonville, FL 32246 (Windy Hill area)
## 7 Alpha School of MassageJacksonville, FL 32210 (Lakeshore area)
## 8 Indo-Pak Massage TherapyJacksonville, FL•Remote work available
## 9 Talton ChiropracticJacksonville, FL 32250
## 10 Integrative Healthcare SolutionsJacksonville, FL 32250
## 11 Massage Envy3.2Fleming Island, FL 32003+1 location
## 12 Moroccan Hammam & Day SPAJacksonville, FL 32250
## 13 Massage Green SpaJacksonville, FL 32224 (Beach Haven area)
## 14 Massage Green Spa3.2Fruit Cove, FL 32259
## 15 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 16 East foot spaJacksonville, FL 32250
## 17 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 18 American Care Medical CentersJacksonville, FL 32211 (Arlington area)
## 19 YMCA of Florida's First Coast4.0Jacksonville, FL 32256 (Deerwood area)
## 20 Remington3.2Atlantic Beach, FL 32233 (Holly Oaks area)
## 21 Hand and Stone Spa3.0Fleming Island, FL 32006
## 22 Moroccan Hammam & Day SPAJacksonville, FL 32250
## 23 One Ocean Resort & SpaAtlantic Beach, FL 32233 (Holly Oaks area)
## 24 Massage Heights - US3.1Jacksonville, FL 32246
## 25 Hand and Stone3.0Saint Johns, FL
## 26 Massage Heights3.1Jacksonville, FL 32246 (Windy Hill area)
## 27 Hand & Stone - Fleming Island & GainesvilleFleming Island, FL 32003
## 28 StretchLab3.8Jacksonville, FL 32225 (Girvin area)
## 29 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 30 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 31 East foot spaJacksonville, FL 32250
## 32 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 33 American Care Medical CentersJacksonville, FL 32211 (Arlington area)
## 34 YMCA of Florida's First Coast4.0Jacksonville, FL 32256 (Deerwood area)
## 35 Remington3.2Atlantic Beach, FL 32233 (Holly Oaks area)
## 36 Hand and Stone Spa3.0Fleming Island, FL 32006
## 37 Moroccan Hammam & Day SPAJacksonville, FL 32250
## 38 One Ocean Resort & SpaAtlantic Beach, FL 32233 (Holly Oaks area)
## 39 Massage Heights - US3.1Jacksonville, FL 32246
## 40 Hand and Stone3.0Saint Johns, FL
## 41 Massage Heights3.1Jacksonville, FL 32246 (Windy Hill area)
## 42 Hand & Stone - Fleming Island & GainesvilleFleming Island, FL 32003
## 43 StretchLab3.8Jacksonville, FL 32225 (Girvin area)
## 44 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 45 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 46 East foot spaJacksonville, FL 32250
## 47 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 48 Hand and Stone3.0Fleming Island, FL 32003
## 49 Massage Heights3.1Jacksonville, FL 32246 (Windy Hill area)
## 50 Hand and Stone3.0Saint Johns, FL
## 51 Hand & Stone - Fleming Island & GainesvilleFleming Island, FL 32003
## 52 StretchLab3.8Jacksonville, FL 32225 (Girvin area)
## 53 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 54 Yoga Den OakleafJacksonville, FL 32244 (Chimney Lakes area)
## 55 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 56 East foot spaJacksonville, FL 32250
## 57 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 58 Essentials Massage & Facial of BaymeadowsJacksonville, FL 32256 (Baymeadows area)
## 59 Hand & Stone Massage and Facial Spa Jacksonville3.0Jacksonville, FL 32246 (Windy Hill area)
## 60 Massage Green SpaJacksonville, FL 32224 (Beach Haven area)
## 61 Morris ChiropracticJacksonville, FL 32250
## 62 Castelli Chiropractic CenterJacksonville, FL 32246 (Park Ridge area)
## 63 Alpha School of MassageJacksonville, FL 32210 (Lakeshore area)
## 64 Massage Green Spa3.2Fruit Cove, FL 32259
## 65 Unify Health Services LLCJacksonville, FL 32223 (Mandarin area)
## 66 Chiropractic Injury SolutionsJacksonville, FL 32210 (Cedar Hills area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$34,662 - $65,000 a year $34662 - $65000 34662 65000
## 12 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 13 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 29 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 32 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 33 \n$34,662 - $65,000 a year $34662 - $65000 34662 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 34662 65000 33220.67 65000 30000
## 12 34662 65000 33220.67 65000 30000
## 13 34662 65000 33220.67 65000 30000
## 29 34662 65000 33220.67 65000 30000
## 32 34662 65000 33220.67 65000 30000
## 33 34662 65000 33220.67 65000 30000
## maximumMaxSalary
## 2 65000
## 12 65000
## 13 65000
## 29 65000
## 32 65000
## 33 65000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$20 an hour $20 20.0 NA
## 3 \n$21 - $30 an hour $21 - $30 21.0 30
## 4 \n$17.50 - $33.00 an hour $17.50 - $33.00 17.5 33
## 5 \n$18 - $30 an hour $18 - $30 18.0 30
## 6 \n$30 - $40 an hour $30 - $40 30.0 40
## 8 \n$20 - $28 an hour $20 - $28 20.0 28
## 9 \n$20 - $25 an hour $20 - $25 20.0 25
## 10 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 11 \n$30 - $35 an hour $30 - $35 30.0 35
## 15 \n$15 an hour $15 15.0 NA
## 16 \n$30 - $35 an hour $30 - $35 30.0 35
## 17 \n$18 - $24 an hour $18 - $24 18.0 24
## 19 \n$15 an hour $15 15.0 NA
## 20 \n$30 - $35 an hour $30 - $35 30.0 35
## 21 \n$18 - $24 an hour $18 - $24 18.0 24
## 23 \n$15 an hour $15 15.0 NA
## 24 \n$15 - $38 an hour $15 - $38 15.0 38
## 26 \n$15 an hour $15 15.0 NA
## 27 \n$17.50 - $33.00 an hour $17.50 - $33.00 17.5 33
## 28 \n$18 - $30 an hour $18 - $30 18.0 30
## 30 \n$21 - $30 an hour $21 - $30 21.0 30
## 31 \n$30 - $40 an hour $30 - $40 30.0 40
## 34 \n$20 an hour $20 20.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 20 33 20.6087 33.52941 15
## 3 20 33 20.6087 33.52941 15
## 4 20 33 20.6087 33.52941 15
## 5 20 33 20.6087 33.52941 15
## 6 20 33 20.6087 33.52941 15
## 8 20 33 20.6087 33.52941 15
## 9 20 33 20.6087 33.52941 15
## 10 20 33 20.6087 33.52941 15
## 11 20 33 20.6087 33.52941 15
## 15 20 33 20.6087 33.52941 15
## 16 20 33 20.6087 33.52941 15
## 17 20 33 20.6087 33.52941 15
## 19 20 33 20.6087 33.52941 15
## 20 20 33 20.6087 33.52941 15
## 21 20 33 20.6087 33.52941 15
## 23 20 33 20.6087 33.52941 15
## 24 20 33 20.6087 33.52941 15
## 26 20 33 20.6087 33.52941 15
## 27 20 33 20.6087 33.52941 15
## 28 20 33 20.6087 33.52941 15
## 30 20 33 20.6087 33.52941 15
## 31 20 33 20.6087 33.52941 15
## 34 20 33 20.6087 33.52941 15
## maximumMaxSalary
## 1 60
## 3 60
## 4 60
## 5 60
## 6 60
## 8 60
## 9 60
## 10 60
## 11 60
## 15 60
## 16 60
## 17 60
## 19 60
## 20 60
## 21 60
## 23 60
## 24 60
## 26 60
## 27 60
## 28 60
## 30 60
## 31 60
## 34 60
##
## [[7]]
## city state jobTitle
## 1 Jacksonville FL Licensed Massage Therapist (LMT)
## 2 Jacksonville FL Experienced Massage Therapist
## 3 Jacksonville FL Licensed Massage Therapist
## 4 Jacksonville FL Liscensed Massage Therapist
## 5 Jacksonville FL Licensed Massage Therapist
## 6 Jacksonville FL Licensed Massage Therapist (LMT)
## 7 Jacksonville FL Massage Therapist - Will Train, No Experience Neccessary
## 8 Jacksonville FL Massage Therapist - Independent Contractor
## 9 Jacksonville FL Massage Therapist
## 10 Jacksonville FL Licensed Massage Therapist
## 11 Jacksonville FL Massage Therapist
## 12 Jacksonville FL LICENSED MASSAGE THERAPIST (LMT)
## 13 Jacksonville FL Licensed Massage Therapist
## 14 Jacksonville FL Licensed Massage Therapist (LMT)
## 15 Jacksonville FL Licensed Massage Therapist
## 16 Jacksonville FL Reflexologist
## 17 Jacksonville FL Full and Part Time Massage Therapist
## 18 Jacksonville FL Licensed Massage Therapist and Coordinator
## 19 Jacksonville FL Massage Therapist
## 20 Jacksonville FL Massage Therapist - Independent Cont. , One Ocean Reso
## 21 Jacksonville FL Licensed Massage Therapist
## 22 Jacksonville FL Licensed Massage Therapist (LMT) for DAY SPA
## 23 Jacksonville FL Massage Therapist - Independent Contractor
## 24 Jacksonville FL Licensed Massage Therapist
## 25 Jacksonville FL Licensed Massage Therapist LMT New Durbin Spa
## 26 Jacksonville FL Licensed Massage Therapist
## 27 Jacksonville FL Licensed Massage Therapist
## 28 Jacksonville FL Flexologist (Stretch Professional)- Mandarin Studio
## 29 Jacksonville FL Licensed Massage Therapist
## 30 Jacksonville FL Licensed Massage Therapist
## 31 Jacksonville FL Reflexologist
## 32 Jacksonville FL Full and Part Time Massage Therapist
## 33 Jacksonville FL Licensed Massage Therapist and Coordinator
## 34 Jacksonville FL Massage Therapist
## 35 Jacksonville FL Massage Therapist - Independent Cont. , One Ocean Reso
## 36 Jacksonville FL Licensed Massage Therapist
## 37 Jacksonville FL Licensed Massage Therapist (LMT) for DAY SPA
## 38 Jacksonville FL Massage Therapist - Independent Contractor
## 39 Jacksonville FL Licensed Massage Therapist
## 40 Jacksonville FL Licensed Massage Therapist LMT New Durbin Spa
## 41 Jacksonville FL Licensed Massage Therapist
## 42 Jacksonville FL Licensed Massage Therapist
## 43 Jacksonville FL Flexologist (Stretch Professional)- Mandarin Studio
## 44 Jacksonville FL Licensed Massage Therapist
## 45 Jacksonville FL Licensed Massage Therapist
## 46 Jacksonville FL Reflexologist
## 47 Jacksonville FL Full and Part Time Massage Therapist
## 48 Jacksonville FL Licensed Massage Therapist
## 49 Jacksonville FL Licensed Massage Therapist
## 50 Jacksonville FL Licensed Massage Therapist LMT New Durbin Spa
## 51 Jacksonville FL Licensed Massage Therapist
## 52 Jacksonville FL Flexologist (Stretch Professional)- Mandarin Studio
## 53 Jacksonville FL Licensed Massage Therapist
## 54 Jacksonville FL Licensed Massage Therapist
## 55 Jacksonville FL Licensed Massage Therapist
## 56 Jacksonville FL Reflexologist
## 57 Jacksonville FL Full and Part Time Massage Therapist
## 58 Jacksonville FL Liscensed Massage Therapist
## 59 Jacksonville FL Licensed Massage Therapist (LMT)
## 60 Jacksonville FL Licensed Massage Therapist
## 61 Jacksonville FL Licensed Massage Therapist
## 62 Jacksonville FL Licensed Massage Therapist
## 63 Jacksonville FL Massage Therapist - Will Train, No Experience Neccessary
## 64 Jacksonville FL Licensed Massage Therapist (LMT)
## 65 Jacksonville FL Experienced Massage Therapist
## 66 Jacksonville FL Licensed Massage Therapist (LMT)
## HiringAgency
## 1 Chiropractic Injury SolutionsJacksonville, FL 32210 (Cedar Hills area)
## 2 Unify Health Services LLCJacksonville, FL 32223 (Mandarin area)
## 3 Castelli Chiropractic CenterJacksonville, FL 32246 (Park Ridge area)
## 4 Essentials Massage & Facial of BaymeadowsJacksonville, FL 32256 (Baymeadows area)
## 5 Morris ChiropracticJacksonville, FL 32250
## 6 Hand & Stone Massage and Facial Spa Jacksonville3.0Jacksonville, FL 32246 (Windy Hill area)
## 7 Alpha School of MassageJacksonville, FL 32210 (Lakeshore area)
## 8 Indo-Pak Massage TherapyJacksonville, FL•Remote work available
## 9 Talton ChiropracticJacksonville, FL 32250
## 10 Integrative Healthcare SolutionsJacksonville, FL 32250
## 11 Massage Envy3.2Fleming Island, FL 32003+1 location
## 12 Moroccan Hammam & Day SPAJacksonville, FL 32250
## 13 Massage Green SpaJacksonville, FL 32224 (Beach Haven area)
## 14 Massage Green Spa3.2Fruit Cove, FL 32259
## 15 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 16 East foot spaJacksonville, FL 32250
## 17 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 18 American Care Medical CentersJacksonville, FL 32211 (Arlington area)
## 19 YMCA of Florida's First Coast4.0Jacksonville, FL 32256 (Deerwood area)
## 20 Remington3.2Atlantic Beach, FL 32233 (Holly Oaks area)
## 21 Hand and Stone Spa3.0Fleming Island, FL 32006
## 22 Moroccan Hammam & Day SPAJacksonville, FL 32250
## 23 One Ocean Resort & SpaAtlantic Beach, FL 32233 (Holly Oaks area)
## 24 Massage Heights - US3.1Jacksonville, FL 32246
## 25 Hand and Stone3.0Saint Johns, FL
## 26 Massage Heights3.1Jacksonville, FL 32246 (Windy Hill area)
## 27 Hand & Stone - Fleming Island & GainesvilleFleming Island, FL 32003
## 28 StretchLab3.8Jacksonville, FL 32225 (Girvin area)
## 29 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 30 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 31 East foot spaJacksonville, FL 32250
## 32 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 33 American Care Medical CentersJacksonville, FL 32211 (Arlington area)
## 34 YMCA of Florida's First Coast4.0Jacksonville, FL 32256 (Deerwood area)
## 35 Remington3.2Atlantic Beach, FL 32233 (Holly Oaks area)
## 36 Hand and Stone Spa3.0Fleming Island, FL 32006
## 37 Moroccan Hammam & Day SPAJacksonville, FL 32250
## 38 One Ocean Resort & SpaAtlantic Beach, FL 32233 (Holly Oaks area)
## 39 Massage Heights - US3.1Jacksonville, FL 32246
## 40 Hand and Stone3.0Saint Johns, FL
## 41 Massage Heights3.1Jacksonville, FL 32246 (Windy Hill area)
## 42 Hand & Stone - Fleming Island & GainesvilleFleming Island, FL 32003
## 43 StretchLab3.8Jacksonville, FL 32225 (Girvin area)
## 44 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 45 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 46 East foot spaJacksonville, FL 32250
## 47 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 48 Hand and Stone3.0Fleming Island, FL 32003
## 49 Massage Heights3.1Jacksonville, FL 32246 (Windy Hill area)
## 50 Hand and Stone3.0Saint Johns, FL
## 51 Hand & Stone - Fleming Island & GainesvilleFleming Island, FL 32003
## 52 StretchLab3.8Jacksonville, FL 32225 (Girvin area)
## 53 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 54 Yoga Den OakleafJacksonville, FL 32244 (Chimney Lakes area)
## 55 Temple Builders Fitness CenterJacksonville, FL 32205 (Normandy area)
## 56 East foot spaJacksonville, FL 32250
## 57 Massage Envy3.2Jacksonville, FL 32222 (Chimney Lakes area)
## 58 Essentials Massage & Facial of BaymeadowsJacksonville, FL 32256 (Baymeadows area)
## 59 Hand & Stone Massage and Facial Spa Jacksonville3.0Jacksonville, FL 32246 (Windy Hill area)
## 60 Massage Green SpaJacksonville, FL 32224 (Beach Haven area)
## 61 Morris ChiropracticJacksonville, FL 32250
## 62 Castelli Chiropractic CenterJacksonville, FL 32246 (Park Ridge area)
## 63 Alpha School of MassageJacksonville, FL 32210 (Lakeshore area)
## 64 Massage Green Spa3.2Fruit Cove, FL 32259
## 65 Unify Health Services LLCJacksonville, FL 32223 (Mandarin area)
## 66 Chiropractic Injury SolutionsJacksonville, FL 32210 (Cedar Hills area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 15 60 30000 65000
## 2 30 15 60 30000 65000
## 3 4 15 60 30000 65000
## 4 10 15 60 30000 65000
## 5 30 15 60 30000 65000
## 6 7 15 60 30000 65000
## 7 6 15 60 30000 65000
## 8 5 15 60 30000 65000
## 9 18 15 60 30000 65000
## 10 Today 15 60 30000 65000
## 11 30 15 60 30000 65000
## 12 6 15 60 30000 65000
## 13 30 15 60 30000 65000
## 14 22 15 60 30000 65000
## 15 30 15 60 30000 65000
## 16 30 15 60 30000 65000
## 17 30 15 60 30000 65000
## 18 22 15 60 30000 65000
## 19 17 15 60 30000 65000
## 20 23 15 60 30000 65000
## 21 Today 15 60 30000 65000
## 22 21 15 60 30000 65000
## 23 23 15 60 30000 65000
## 24 29 15 60 30000 65000
## 25 30 15 60 30000 65000
## 26 30 15 60 30000 65000
## 27 3 15 60 30000 65000
## 28 30 15 60 30000 65000
## 29 30 15 60 30000 65000
## 30 30 15 60 30000 65000
## 31 30 15 60 30000 65000
## 32 30 15 60 30000 65000
## 33 22 15 60 30000 65000
## 34 17 15 60 30000 65000
## 35 23 15 60 30000 65000
## 36 Today 15 60 30000 65000
## 37 21 15 60 30000 65000
## 38 23 15 60 30000 65000
## 39 29 15 60 30000 65000
## 40 30 15 60 30000 65000
## 41 30 15 60 30000 65000
## 42 3 15 60 30000 65000
## 43 30 15 60 30000 65000
## 44 30 15 60 30000 65000
## 45 30 15 60 30000 65000
## 46 30 15 60 30000 65000
## 47 30 15 60 30000 65000
## 48 30 15 60 30000 65000
## 49 30 15 60 30000 65000
## 50 30 15 60 30000 65000
## 51 3 15 60 30000 65000
## 52 30 15 60 30000 65000
## 53 30 15 60 30000 65000
## 54 Today 15 60 30000 65000
## 55 30 15 60 30000 65000
## 56 30 15 60 30000 65000
## 57 30 15 60 30000 65000
## 58 10 15 60 30000 65000
## 59 7 15 60 30000 65000
## 60 30 15 60 30000 65000
## 61 30 15 60 30000 65000
## 62 4 15 60 30000 65000
## 63 6 15 60 30000 65000
## 64 22 15 60 30000 65000
## 65 30 15 60 30000 65000
## 66 6 15 60 30000 65000
getIndeedJobData5pages("massage therapist","Miami","FL")
## Warning in getIndeedJobData5pages("massage therapist", "Miami", "FL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Miami", "FL"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist/Hiring Bonus
## 2 Liscensed Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist Full Time or Part Time
## 5 Massage Therapist/Hiring Bonus
## 6 Licensed Massage Therapist (LMT)
## 7 Licensed Massage Therapist
## 8 Endospheres Technician (Preferred massage therapist, aesthet...
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist (LMT)
## 13 Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist - Independent Contractor
## 16 Licensed Massage Therapist
## 17 Massage Therapist/Hiring Bonus
## 18 Licensed Massage Therapist
## 19 Massage Therapist
## 20 Stretch Practitioner
## 21 Dual Therapist (Massage / Esthetics)
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Licensed Massage Therapist (LMT) & Licensed Esthetician
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Massage Therapist
## 28 Massage Therapist
## 29 Massage Therapist - Independent Contractor
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 ON CALL Licensed Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist/Hiring Bonus
## 36 Liscensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist/Hiring Bonus
## 39 Licensed Massage Therapist (LMT) & Licensed Esthetician
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Massage Therapist
## 44 Massage Therapist - Independent Contractor
## 45 Massage Therapist
## 46 Licensed Massage Therapist
## 47 ON CALL Licensed Massage Therapist
## 48 Massage Therapist
## 49 Massage Therapist Full Time or Part Time
## 50 Licensed Massage Therapist
## 51 Massage Therapist/Hiring Bonus
## 52 Massage Therapist
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Massage Therapist
## 56 Massage Therapist - Independent Contractor
## 57 Massage Therapist
## 58 Licensed Massage Therapist
## 59 ON CALL Licensed Massage Therapist
## 60 Massage Therapist
## 61 Licensed Massage therapist
## 62 Seeking A Licensed Massage Therapist
## 63 Massage Therapist for VERY BUSY CLINIC!!
## 64 Massage Therapist Full Time or Part Time
## 65 Licensed Massage Therapist
## 66 LMT Massage Therapist- Part time & Full Time
## 67 Massage Therapist
## 68 Licensed Massage Therapist
## 69 ON CALL Licensed Massage Therapist
## 70 Massage Therapist
## 71 Licensed Massage therapist
## 72 Seeking A Licensed Massage Therapist
## 73 Massage Therapist for VERY BUSY CLINIC!!
## 74 Massage Therapist Full Time or Part Time
## 75 Licensed Massage Therapist
## 76 LMT Massage Therapist- Part time & Full Time
## 77 Massage Therapist Full Time or Part Time
## 78 Licensed Massage Therapist (LMT)
## 79 Licensed Massage Therapist
## 80 Massage Therapist/Hiring Bonus
## 81 Massage Therapist
## 82 Licensed Massage Therapist
## 83 Massage Therapist/Hiring Bonus
## 84 Liscensed Massage Therapist
## 85 Massage Therapist/Hiring Bonus
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$40,846 - $53,806 a year $40846 - $53806 40846.0 53806
## 2 \n$20 an hour $20 20.0 NA
## 3 \n$20 - $26 an hour $20 - $26 20.0 26
## 4 \n$45,000 - $60,000 a year $45000 - $60000 45000.0 60000
## 5 \n$37,808 - $50,512 a year $37808 - $50512 37808.0 50512
## 6 \n$16 an hour $16 16.0 NA
## 7 \n$16 - $18 an hour $16 - $18 16.0 18
## 8 \n$30 - $40 an hour $30 - $40 30.0 40
## 9 \n$45 - $75 an hour $45 - $75 45.0 75
## 10 \n$25 - $30 an hour $25 - $30 25.0 30
## 11 \n$3,500 - $5,500 a month $3500 - $5500 3500.0 5500
## 12 \n$15 - $18 an hour $15 - $18 15.0 18
## 13 \n$17 - $18 an hour $17 - $18 17.0 18
## 14 \n$18 - $20 an hour $18 - $20 18.0 20
## 15 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 16 \n$20 - $25 an hour $20 - $25 20.0 25
## 17 \nUp to $32.50 an hour $32.50 32.5 NA
## 18 \n$40,000 - $45,000 a year $40000 - $45000 40000.0 45000
## 19 \n$40 - $65 an hour $40 - $65 40.0 65
## 20 \n$30 - $35 an hour $30 - $35 30.0 35
## 21 \n$20 - $26 an hour $20 - $26 20.0 26
## 22 \n$16 an hour $16 16.0 NA
## 23 \n$20 an hour $20 20.0 NA
## 24 \n$37,808 - $50,512 a year $37808 - $50512 37808.0 50512
## 25 \nUp to $32.50 an hour $32.50 32.5 NA
## 26 \n$40,000 - $45,000 a year $40000 - $45000 40000.0 45000
## 27 \n$40 - $65 an hour $40 - $65 40.0 65
## 28 \n$30 - $35 an hour $30 - $35 30.0 35
## 29 \n$45,000 - $60,000 a year $45000 - $60000 45000.0 60000
## 30 \n$16 - $18 an hour $16 - $18 16.0 18
## 31 \n$40,846 - $53,806 a year $40846 - $53806 40846.0 53806
## 32 \n$40,000 - $45,000 a year $40000 - $45000 40000.0 45000
## 33 \n$40 - $65 an hour $40 - $65 40.0 65
## 34 \n$30 - $35 an hour $30 - $35 30.0 35
## 35 \n$32,932 - $50,329 a year $32932 - $50329 32932.0 50329
## 36 \n$16 an hour $16 16.0 NA
## 37 \n$30 - $35 an hour $30 - $35 30.0 35
## 38 \n$32,932 - $50,329 a year $32932 - $50329 32932.0 50329
## 39 \n$16 an hour $16 16.0 NA
## 40 \n$45,000 - $60,000 a year $45000 - $60000 45000.0 60000
## 41 \n$16 an hour $16 16.0 NA
## 42 \n$37,808 - $50,512 a year $37808 - $50512 37808.0 50512
## 43 \n$20 - $26 an hour $20 - $26 20.0 26
## 44 \n$16 - $18 an hour $16 - $18 16.0 18
## 45 \n$20 an hour $20 20.0 NA
## 46 \n$40,846 - $53,806 a year $40846 - $53806 40846.0 53806
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 37.5 12305.41 16010.41 15
## 2 30 37.5 12305.41 16010.41 15
## 3 30 37.5 12305.41 16010.41 15
## 4 30 37.5 12305.41 16010.41 15
## 5 30 37.5 12305.41 16010.41 15
## 6 30 37.5 12305.41 16010.41 15
## 7 30 37.5 12305.41 16010.41 15
## 8 30 37.5 12305.41 16010.41 15
## 9 30 37.5 12305.41 16010.41 15
## 10 30 37.5 12305.41 16010.41 15
## 11 30 37.5 12305.41 16010.41 15
## 12 30 37.5 12305.41 16010.41 15
## 13 30 37.5 12305.41 16010.41 15
## 14 30 37.5 12305.41 16010.41 15
## 15 30 37.5 12305.41 16010.41 15
## 16 30 37.5 12305.41 16010.41 15
## 17 30 37.5 12305.41 16010.41 15
## 18 30 37.5 12305.41 16010.41 15
## 19 30 37.5 12305.41 16010.41 15
## 20 30 37.5 12305.41 16010.41 15
## 21 30 37.5 12305.41 16010.41 15
## 22 30 37.5 12305.41 16010.41 15
## 23 30 37.5 12305.41 16010.41 15
## 24 30 37.5 12305.41 16010.41 15
## 25 30 37.5 12305.41 16010.41 15
## 26 30 37.5 12305.41 16010.41 15
## 27 30 37.5 12305.41 16010.41 15
## 28 30 37.5 12305.41 16010.41 15
## 29 30 37.5 12305.41 16010.41 15
## 30 30 37.5 12305.41 16010.41 15
## 31 30 37.5 12305.41 16010.41 15
## 32 30 37.5 12305.41 16010.41 15
## 33 30 37.5 12305.41 16010.41 15
## 34 30 37.5 12305.41 16010.41 15
## 35 30 37.5 12305.41 16010.41 15
## 36 30 37.5 12305.41 16010.41 15
## 37 30 37.5 12305.41 16010.41 15
## 38 30 37.5 12305.41 16010.41 15
## 39 30 37.5 12305.41 16010.41 15
## 40 30 37.5 12305.41 16010.41 15
## 41 30 37.5 12305.41 16010.41 15
## 42 30 37.5 12305.41 16010.41 15
## 43 30 37.5 12305.41 16010.41 15
## 44 30 37.5 12305.41 16010.41 15
## 45 30 37.5 12305.41 16010.41 15
## 46 30 37.5 12305.41 16010.41 15
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
## 31 60000
## 32 60000
## 33 60000
## 34 60000
## 35 60000
## 36 60000
## 37 60000
## 38 60000
## 39 60000
## 40 60000
## 41 60000
## 42 60000
## 43 60000
## 44 60000
## 45 60000
## 46 60000
##
## [[3]]
## date_daysAgo
## 1 1
## 2 5
## 3 30
## 4 Today
## 5 1
## 6 3
## 7 30
## 8 7
## 9 27
## 10 30
## 11 30
## 12 5
## 13 25
## 14 30
## 15 30
## 16 4
## 17 1
## 18 24
## 19 15
## 20 26
## 21 26
## 22 30
## 23 18
## 24 29
## 25 11
## 26 28
## 27 26
## 28 13
## 29 28
## 30 5
## 31 1
## 32 18
## 33 30
## 34 3
## 35 1
## 36 5
## 37 4
## 38 1
## 39 29
## 40 11
## 41 28
## 42 26
## 43 13
## 44 28
## 45 5
## 46 1
## 47 18
## 48 25
## 49 Today
## 50 30
## 51 1
## 52 11
## 53 28
## 54 26
## 55 13
## 56 28
## 57 5
## 58 1
## 59 18
## 60 25
## 61 26
## 62 25
## 63 24
## 64 30
## 65 30
## 66 30
## 67 5
## 68 1
## 69 18
## 70 25
## 71 26
## 72 25
## 73 24
## 74 30
## 75 30
## 76 30
## 77 Today
## 78 3
## 79 4
## 80 1
## 81 30
## 82 30
## 83 1
## 84 5
## 85 1
##
## [[4]]
## HiringAgency
## 1 Massage Envy AventuraAventura, FL 33180
## 2 Evolution MD Advanced Plastic Surgery3.1Miramar, FL 33027
## 3 Pines West ChiropracticPembroke Pines, FL 33029
## 4 Hand & Stone - Weston, FLWeston, FL 33331
## 5 Massage Envy Hollywood3.2Hollywood, FL 33021 (Emerald Hills area)
## 6 Destiny Med SpaMiami Lakes, FL 33014
## 7 Golden Medical CenterPembroke Pines, FL 33024
## 8 Melt No, 5Miami Beach, FL 33139 (Flamingo Lummus area)
## 9 Eména SpaMiami, FL 33137 (Little Haiti area)
## 10 Miabella wellness&spaMiami, FL
## 11 Tao Spa MiamiMiami Beach, FL 33139 (Flamingo Lummus area)
## 12 PRS ( Performance and Recovery System )Doral, FL 33172
## 13 Massage Envy Brickell3.2Miami, FL 33130 (Brickell area)+11 locations
## 14 CLASSIC VANTAGE SPA & WELLNESSCoral Gables, FL 33134
## 15 Indo-Pak Massage TherapyMiami, FL+2 locations•Remote work available
## 16 Miami Slim BodyDoral, FL 33172
## 17 Massage Envy Miami LakesMiami Lakes, FL 33016
## 18 Elite Core TherapyKendall, FL
## 19 Day SpaFort Lauderdale, FL 33301 (Colee Hammock area)
## 20 Stretch Zone2.7Cooper City, FL 33330
## 21 WTS International3.3Miami, FL 33131 (Brickell area)+1 location
## 22 Hand and Stone3.0Doral, FL 33166+6 locations
## 23 Auberge Beach Residences & Spa - Fort LauderdaleFort Lauderdale, FL
## 24 DBA; A Moments Serenity Day SpaHollywood, FL 33021 (Hollywood Hills area)
## 25 MassageLuXe3.0Pembroke Pines, FL 33024
## 26 Hand & Stone - Weston, FL3.0Weston, FL 33331
## 27 The YaYa SpaPembroke Pines, FL 33026
## 28 St. Somewhere Spa at Margaritaville Hollywood Beac...Hollywood, FL 33019
## 29 Olazabal hair and skin salonCoral Gables, FL 33134
## 30 LIVunLtd3.2Miami, FL
## 31 Massage EnvyDavie, FL 33324
## 32 Vivire WellnessDavie, FL 33328
## 33 Pines West ChiropracticPembroke Pines, FL 33029
## 34 Destiny Med SpaMiami Lakes, FL 33014
## 35 Massage Envy Miami LakesMiami Lakes, FL 33016
## 36 Evolution MD Advanced Plastic Surgery3.1Miramar, FL 33027
## 37 Miami Slim BodyDoral, FL 33172
## 38 Massage Envy Hollywood3.2Hollywood, FL 33021 (Emerald Hills area)
## 39 DBA; A Moments Serenity Day SpaHollywood, FL 33021 (Hollywood Hills area)
## 40 MassageLuXe3.0Pembroke Pines, FL 33024
## 41 Hand & Stone - Weston, FL3.0Weston, FL 33331
## 42 The YaYa SpaPembroke Pines, FL 33026
## 43 St. Somewhere Spa at Margaritaville Hollywood Beac...Hollywood, FL 33019
## 44 Olazabal hair and skin salonCoral Gables, FL 33134
## 45 LIVunLtd3.2Miami, FL
## 46 Massage EnvyDavie, FL 33324
## 47 Vivire WellnessDavie, FL 33328
## 48 Phenix Salon Suites3.9Hollywood, FL 33021
## 49 Hand & Stone - Weston, FLWeston, FL 33331
## 50 Golden Medical CenterPembroke Pines, FL 33024
## 51 Massage Envy AventuraAventura, FL 33180
## 52 MassageLuXe3.0Pembroke Pines, FL 33024
## 53 Hand & Stone - Weston, FL3.0Weston, FL 33331
## 54 The YaYa SpaPembroke Pines, FL 33026
## 55 St. Somewhere Spa at Margaritaville Hollywood Beac...Hollywood, FL 33019
## 56 Olazabal hair and skin salonCoral Gables, FL 33134
## 57 LIVunLtd3.2Miami, FL
## 58 Massage EnvyDavie, FL 33324
## 59 Vivire WellnessDavie, FL 33328
## 60 Phenix Salon Suites3.9Hollywood, FL 33021
## 61 Spine and Sport Rehab InstitutePlantation, FL 33324
## 62 VIP SALON & SPAPembroke Pines, FL 33024
## 63 Massage Envy3.2Miami, FL 33184
## 64 Hand and Stone3.0Weston, FL 33331
## 65 Massage Envy Miramar 0532Miramar, FL 33025
## 66 Massage Envy3.2Fort Lauderdale, FL 33316 (Harbordale area)
## 67 LIVunLtd3.2Miami, FL
## 68 Massage EnvyDavie, FL 33324
## 69 Vivire WellnessDavie, FL 33328
## 70 Phenix Salon Suites3.9Hollywood, FL 33021
## 71 Spine and Sport Rehab InstitutePlantation, FL 33324
## 72 VIP SALON & SPAPembroke Pines, FL 33024
## 73 Massage Envy3.2Miami, FL 33184
## 74 Hand and Stone3.0Weston, FL 33331
## 75 Massage Envy Miramar 0532Miramar, FL 33025
## 76 Massage Envy3.2Fort Lauderdale, FL 33316 (Harbordale area)
## 77 Hand & Stone - Weston, FLWeston, FL 33331
## 78 Destiny Med SpaMiami Lakes, FL 33014
## 79 Miami Slim BodyDoral, FL 33172
## 80 Massage Envy Hollywood3.2Hollywood, FL 33021 (Emerald Hills area)
## 81 Pines West ChiropracticPembroke Pines, FL 33029
## 82 Golden Medical CenterPembroke Pines, FL 33024
## 83 Massage Envy Miami LakesMiami Lakes, FL 33016
## 84 Evolution MD Advanced Plastic Surgery3.1Miramar, FL 33027
## 85 Massage Envy AventuraAventura, FL 33180
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$40,846 - $53,806 a year $40846 - $53806 40846 53806
## 4 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 5 \n$37,808 - $50,512 a year $37808 - $50512 37808 50512
## 18 \n$40,000 - $45,000 a year $40000 - $45000 40000 45000
## 24 \n$37,808 - $50,512 a year $37808 - $50512 37808 50512
## 26 \n$40,000 - $45,000 a year $40000 - $45000 40000 45000
## 29 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 31 \n$40,846 - $53,806 a year $40846 - $53806 40846 53806
## 32 \n$40,000 - $45,000 a year $40000 - $45000 40000 45000
## 35 \n$32,932 - $50,329 a year $32932 - $50329 32932 50329
## 38 \n$32,932 - $50,329 a year $32932 - $50329 32932 50329
## 40 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 42 \n$37,808 - $50,512 a year $37808 - $50512 37808 50512
## 46 \n$40,846 - $53,806 a year $40846 - $53806 40846 53806
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 40000 50512 39773.29 52043.71 32932
## 4 40000 50512 39773.29 52043.71 32932
## 5 40000 50512 39773.29 52043.71 32932
## 18 40000 50512 39773.29 52043.71 32932
## 24 40000 50512 39773.29 52043.71 32932
## 26 40000 50512 39773.29 52043.71 32932
## 29 40000 50512 39773.29 52043.71 32932
## 31 40000 50512 39773.29 52043.71 32932
## 32 40000 50512 39773.29 52043.71 32932
## 35 40000 50512 39773.29 52043.71 32932
## 38 40000 50512 39773.29 52043.71 32932
## 40 40000 50512 39773.29 52043.71 32932
## 42 40000 50512 39773.29 52043.71 32932
## 46 40000 50512 39773.29 52043.71 32932
## maximumMaxSalary
## 1 60000
## 4 60000
## 5 60000
## 18 60000
## 24 60000
## 26 60000
## 29 60000
## 31 60000
## 32 60000
## 35 60000
## 38 60000
## 40 60000
## 42 60000
## 46 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$20 an hour $20 20.0 NA 20
## 3 \n$20 - $26 an hour $20 - $26 20.0 26 20
## 6 \n$16 an hour $16 16.0 NA 20
## 7 \n$16 - $18 an hour $16 - $18 16.0 18 20
## 8 \n$30 - $40 an hour $30 - $40 30.0 40 20
## 9 \n$45 - $75 an hour $45 - $75 45.0 75 20
## 10 \n$25 - $30 an hour $25 - $30 25.0 30 20
## 12 \n$15 - $18 an hour $15 - $18 15.0 18 20
## 13 \n$17 - $18 an hour $17 - $18 17.0 18 20
## 14 \n$18 - $20 an hour $18 - $20 18.0 20 20
## 16 \n$20 - $25 an hour $20 - $25 20.0 25 20
## 17 \nUp to $32.50 an hour $32.50 32.5 NA 20
## 19 \n$40 - $65 an hour $40 - $65 40.0 65 20
## 20 \n$30 - $35 an hour $30 - $35 30.0 35 20
## 21 \n$20 - $26 an hour $20 - $26 20.0 26 20
## 22 \n$16 an hour $16 16.0 NA 20
## 23 \n$20 an hour $20 20.0 NA 20
## 25 \nUp to $32.50 an hour $32.50 32.5 NA 20
## 27 \n$40 - $65 an hour $40 - $65 40.0 65 20
## 28 \n$30 - $35 an hour $30 - $35 30.0 35 20
## 30 \n$16 - $18 an hour $16 - $18 16.0 18 20
## 33 \n$40 - $65 an hour $40 - $65 40.0 65 20
## 34 \n$30 - $35 an hour $30 - $35 30.0 35 20
## 36 \n$16 an hour $16 16.0 NA 20
## 37 \n$30 - $35 an hour $30 - $35 30.0 35 20
## 39 \n$16 an hour $16 16.0 NA 20
## 41 \n$16 an hour $16 16.0 NA 20
## 43 \n$20 - $26 an hour $20 - $26 20.0 26 20
## 44 \n$16 - $18 an hour $16 - $18 16.0 18 20
## 45 \n$20 an hour $20 20.0 NA 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 28 24.1 34.65 15 75
## 3 28 24.1 34.65 15 75
## 6 28 24.1 34.65 15 75
## 7 28 24.1 34.65 15 75
## 8 28 24.1 34.65 15 75
## 9 28 24.1 34.65 15 75
## 10 28 24.1 34.65 15 75
## 12 28 24.1 34.65 15 75
## 13 28 24.1 34.65 15 75
## 14 28 24.1 34.65 15 75
## 16 28 24.1 34.65 15 75
## 17 28 24.1 34.65 15 75
## 19 28 24.1 34.65 15 75
## 20 28 24.1 34.65 15 75
## 21 28 24.1 34.65 15 75
## 22 28 24.1 34.65 15 75
## 23 28 24.1 34.65 15 75
## 25 28 24.1 34.65 15 75
## 27 28 24.1 34.65 15 75
## 28 28 24.1 34.65 15 75
## 30 28 24.1 34.65 15 75
## 33 28 24.1 34.65 15 75
## 34 28 24.1 34.65 15 75
## 36 28 24.1 34.65 15 75
## 37 28 24.1 34.65 15 75
## 39 28 24.1 34.65 15 75
## 41 28 24.1 34.65 15 75
## 43 28 24.1 34.65 15 75
## 44 28 24.1 34.65 15 75
## 45 28 24.1 34.65 15 75
##
## [[7]]
## city state jobTitle
## 1 Miami FL Massage Therapist/Hiring Bonus
## 2 Miami FL Liscensed Massage Therapist
## 3 Miami FL Massage Therapist
## 4 Miami FL Massage Therapist Full Time or Part Time
## 5 Miami FL Massage Therapist/Hiring Bonus
## 6 Miami FL Licensed Massage Therapist (LMT)
## 7 Miami FL Licensed Massage Therapist
## 8 Miami FL Endospheres Technician (Preferred massage therapist, aesthet...
## 9 Miami FL Licensed Massage Therapist
## 10 Miami FL Licensed Massage Therapist
## 11 Miami FL Licensed Massage Therapist
## 12 Miami FL Licensed Massage Therapist (LMT)
## 13 Miami FL Massage Therapist
## 14 Miami FL Licensed Massage Therapist (LMT)
## 15 Miami FL Massage Therapist - Independent Contractor
## 16 Miami FL Licensed Massage Therapist
## 17 Miami FL Massage Therapist/Hiring Bonus
## 18 Miami FL Licensed Massage Therapist
## 19 Miami FL Massage Therapist
## 20 Miami FL Stretch Practitioner
## 21 Miami FL Dual Therapist (Massage / Esthetics)
## 22 Miami FL Licensed Massage Therapist
## 23 Miami FL Massage Therapist
## 24 Miami FL Licensed Massage Therapist (LMT) & Licensed Esthetician
## 25 Miami FL Massage Therapist
## 26 Miami FL Licensed Massage Therapist
## 27 Miami FL Massage Therapist
## 28 Miami FL Massage Therapist
## 29 Miami FL Massage Therapist - Independent Contractor
## 30 Miami FL Massage Therapist
## 31 Miami FL Licensed Massage Therapist
## 32 Miami FL ON CALL Licensed Massage Therapist
## 33 Miami FL Massage Therapist
## 34 Miami FL Licensed Massage Therapist (LMT)
## 35 Miami FL Massage Therapist/Hiring Bonus
## 36 Miami FL Liscensed Massage Therapist
## 37 Miami FL Licensed Massage Therapist
## 38 Miami FL Massage Therapist/Hiring Bonus
## 39 Miami FL Licensed Massage Therapist (LMT) & Licensed Esthetician
## 40 Miami FL Massage Therapist
## 41 Miami FL Licensed Massage Therapist
## 42 Miami FL Massage Therapist
## 43 Miami FL Massage Therapist
## 44 Miami FL Massage Therapist - Independent Contractor
## 45 Miami FL Massage Therapist
## 46 Miami FL Licensed Massage Therapist
## 47 Miami FL ON CALL Licensed Massage Therapist
## 48 Miami FL Massage Therapist
## 49 Miami FL Massage Therapist Full Time or Part Time
## 50 Miami FL Licensed Massage Therapist
## 51 Miami FL Massage Therapist/Hiring Bonus
## 52 Miami FL Massage Therapist
## 53 Miami FL Licensed Massage Therapist
## 54 Miami FL Massage Therapist
## 55 Miami FL Massage Therapist
## 56 Miami FL Massage Therapist - Independent Contractor
## 57 Miami FL Massage Therapist
## 58 Miami FL Licensed Massage Therapist
## 59 Miami FL ON CALL Licensed Massage Therapist
## 60 Miami FL Massage Therapist
## 61 Miami FL Licensed Massage therapist
## 62 Miami FL Seeking A Licensed Massage Therapist
## 63 Miami FL Massage Therapist for VERY BUSY CLINIC!!
## 64 Miami FL Massage Therapist Full Time or Part Time
## 65 Miami FL Licensed Massage Therapist
## 66 Miami FL LMT Massage Therapist- Part time & Full Time
## 67 Miami FL Massage Therapist
## 68 Miami FL Licensed Massage Therapist
## 69 Miami FL ON CALL Licensed Massage Therapist
## 70 Miami FL Massage Therapist
## 71 Miami FL Licensed Massage therapist
## 72 Miami FL Seeking A Licensed Massage Therapist
## 73 Miami FL Massage Therapist for VERY BUSY CLINIC!!
## 74 Miami FL Massage Therapist Full Time or Part Time
## 75 Miami FL Licensed Massage Therapist
## 76 Miami FL LMT Massage Therapist- Part time & Full Time
## 77 Miami FL Massage Therapist Full Time or Part Time
## 78 Miami FL Licensed Massage Therapist (LMT)
## 79 Miami FL Licensed Massage Therapist
## 80 Miami FL Massage Therapist/Hiring Bonus
## 81 Miami FL Massage Therapist
## 82 Miami FL Licensed Massage Therapist
## 83 Miami FL Massage Therapist/Hiring Bonus
## 84 Miami FL Liscensed Massage Therapist
## 85 Miami FL Massage Therapist/Hiring Bonus
## HiringAgency
## 1 Massage Envy AventuraAventura, FL 33180
## 2 Evolution MD Advanced Plastic Surgery3.1Miramar, FL 33027
## 3 Pines West ChiropracticPembroke Pines, FL 33029
## 4 Hand & Stone - Weston, FLWeston, FL 33331
## 5 Massage Envy Hollywood3.2Hollywood, FL 33021 (Emerald Hills area)
## 6 Destiny Med SpaMiami Lakes, FL 33014
## 7 Golden Medical CenterPembroke Pines, FL 33024
## 8 Melt No, 5Miami Beach, FL 33139 (Flamingo Lummus area)
## 9 Eména SpaMiami, FL 33137 (Little Haiti area)
## 10 Miabella wellness&spaMiami, FL
## 11 Tao Spa MiamiMiami Beach, FL 33139 (Flamingo Lummus area)
## 12 PRS ( Performance and Recovery System )Doral, FL 33172
## 13 Massage Envy Brickell3.2Miami, FL 33130 (Brickell area)+11 locations
## 14 CLASSIC VANTAGE SPA & WELLNESSCoral Gables, FL 33134
## 15 Indo-Pak Massage TherapyMiami, FL+2 locations•Remote work available
## 16 Miami Slim BodyDoral, FL 33172
## 17 Massage Envy Miami LakesMiami Lakes, FL 33016
## 18 Elite Core TherapyKendall, FL
## 19 Day SpaFort Lauderdale, FL 33301 (Colee Hammock area)
## 20 Stretch Zone2.7Cooper City, FL 33330
## 21 WTS International3.3Miami, FL 33131 (Brickell area)+1 location
## 22 Hand and Stone3.0Doral, FL 33166+6 locations
## 23 Auberge Beach Residences & Spa - Fort LauderdaleFort Lauderdale, FL
## 24 DBA; A Moments Serenity Day SpaHollywood, FL 33021 (Hollywood Hills area)
## 25 MassageLuXe3.0Pembroke Pines, FL 33024
## 26 Hand & Stone - Weston, FL3.0Weston, FL 33331
## 27 The YaYa SpaPembroke Pines, FL 33026
## 28 St. Somewhere Spa at Margaritaville Hollywood Beac...Hollywood, FL 33019
## 29 Olazabal hair and skin salonCoral Gables, FL 33134
## 30 LIVunLtd3.2Miami, FL
## 31 Massage EnvyDavie, FL 33324
## 32 Vivire WellnessDavie, FL 33328
## 33 Pines West ChiropracticPembroke Pines, FL 33029
## 34 Destiny Med SpaMiami Lakes, FL 33014
## 35 Massage Envy Miami LakesMiami Lakes, FL 33016
## 36 Evolution MD Advanced Plastic Surgery3.1Miramar, FL 33027
## 37 Miami Slim BodyDoral, FL 33172
## 38 Massage Envy Hollywood3.2Hollywood, FL 33021 (Emerald Hills area)
## 39 DBA; A Moments Serenity Day SpaHollywood, FL 33021 (Hollywood Hills area)
## 40 MassageLuXe3.0Pembroke Pines, FL 33024
## 41 Hand & Stone - Weston, FL3.0Weston, FL 33331
## 42 The YaYa SpaPembroke Pines, FL 33026
## 43 St. Somewhere Spa at Margaritaville Hollywood Beac...Hollywood, FL 33019
## 44 Olazabal hair and skin salonCoral Gables, FL 33134
## 45 LIVunLtd3.2Miami, FL
## 46 Massage EnvyDavie, FL 33324
## 47 Vivire WellnessDavie, FL 33328
## 48 Phenix Salon Suites3.9Hollywood, FL 33021
## 49 Hand & Stone - Weston, FLWeston, FL 33331
## 50 Golden Medical CenterPembroke Pines, FL 33024
## 51 Massage Envy AventuraAventura, FL 33180
## 52 MassageLuXe3.0Pembroke Pines, FL 33024
## 53 Hand & Stone - Weston, FL3.0Weston, FL 33331
## 54 The YaYa SpaPembroke Pines, FL 33026
## 55 St. Somewhere Spa at Margaritaville Hollywood Beac...Hollywood, FL 33019
## 56 Olazabal hair and skin salonCoral Gables, FL 33134
## 57 LIVunLtd3.2Miami, FL
## 58 Massage EnvyDavie, FL 33324
## 59 Vivire WellnessDavie, FL 33328
## 60 Phenix Salon Suites3.9Hollywood, FL 33021
## 61 Spine and Sport Rehab InstitutePlantation, FL 33324
## 62 VIP SALON & SPAPembroke Pines, FL 33024
## 63 Massage Envy3.2Miami, FL 33184
## 64 Hand and Stone3.0Weston, FL 33331
## 65 Massage Envy Miramar 0532Miramar, FL 33025
## 66 Massage Envy3.2Fort Lauderdale, FL 33316 (Harbordale area)
## 67 LIVunLtd3.2Miami, FL
## 68 Massage EnvyDavie, FL 33324
## 69 Vivire WellnessDavie, FL 33328
## 70 Phenix Salon Suites3.9Hollywood, FL 33021
## 71 Spine and Sport Rehab InstitutePlantation, FL 33324
## 72 VIP SALON & SPAPembroke Pines, FL 33024
## 73 Massage Envy3.2Miami, FL 33184
## 74 Hand and Stone3.0Weston, FL 33331
## 75 Massage Envy Miramar 0532Miramar, FL 33025
## 76 Massage Envy3.2Fort Lauderdale, FL 33316 (Harbordale area)
## 77 Hand & Stone - Weston, FLWeston, FL 33331
## 78 Destiny Med SpaMiami Lakes, FL 33014
## 79 Miami Slim BodyDoral, FL 33172
## 80 Massage Envy Hollywood3.2Hollywood, FL 33021 (Emerald Hills area)
## 81 Pines West ChiropracticPembroke Pines, FL 33029
## 82 Golden Medical CenterPembroke Pines, FL 33024
## 83 Massage Envy Miami LakesMiami Lakes, FL 33016
## 84 Evolution MD Advanced Plastic Surgery3.1Miramar, FL 33027
## 85 Massage Envy AventuraAventura, FL 33180
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 1 15 75 32932 60000
## 2 5 15 75 32932 60000
## 3 30 15 75 32932 60000
## 4 Today 15 75 32932 60000
## 5 1 15 75 32932 60000
## 6 3 15 75 32932 60000
## 7 30 15 75 32932 60000
## 8 7 15 75 32932 60000
## 9 27 15 75 32932 60000
## 10 30 15 75 32932 60000
## 11 30 15 75 32932 60000
## 12 5 15 75 32932 60000
## 13 25 15 75 32932 60000
## 14 30 15 75 32932 60000
## 15 30 15 75 32932 60000
## 16 4 15 75 32932 60000
## 17 1 15 75 32932 60000
## 18 24 15 75 32932 60000
## 19 15 15 75 32932 60000
## 20 26 15 75 32932 60000
## 21 26 15 75 32932 60000
## 22 30 15 75 32932 60000
## 23 18 15 75 32932 60000
## 24 29 15 75 32932 60000
## 25 11 15 75 32932 60000
## 26 28 15 75 32932 60000
## 27 26 15 75 32932 60000
## 28 13 15 75 32932 60000
## 29 28 15 75 32932 60000
## 30 5 15 75 32932 60000
## 31 1 15 75 32932 60000
## 32 18 15 75 32932 60000
## 33 30 15 75 32932 60000
## 34 3 15 75 32932 60000
## 35 1 15 75 32932 60000
## 36 5 15 75 32932 60000
## 37 4 15 75 32932 60000
## 38 1 15 75 32932 60000
## 39 29 15 75 32932 60000
## 40 11 15 75 32932 60000
## 41 28 15 75 32932 60000
## 42 26 15 75 32932 60000
## 43 13 15 75 32932 60000
## 44 28 15 75 32932 60000
## 45 5 15 75 32932 60000
## 46 1 15 75 32932 60000
## 47 18 15 75 32932 60000
## 48 25 15 75 32932 60000
## 49 Today 15 75 32932 60000
## 50 30 15 75 32932 60000
## 51 1 15 75 32932 60000
## 52 11 15 75 32932 60000
## 53 28 15 75 32932 60000
## 54 26 15 75 32932 60000
## 55 13 15 75 32932 60000
## 56 28 15 75 32932 60000
## 57 5 15 75 32932 60000
## 58 1 15 75 32932 60000
## 59 18 15 75 32932 60000
## 60 25 15 75 32932 60000
## 61 26 15 75 32932 60000
## 62 25 15 75 32932 60000
## 63 24 15 75 32932 60000
## 64 30 15 75 32932 60000
## 65 30 15 75 32932 60000
## 66 30 15 75 32932 60000
## 67 5 15 75 32932 60000
## 68 1 15 75 32932 60000
## 69 18 15 75 32932 60000
## 70 25 15 75 32932 60000
## 71 26 15 75 32932 60000
## 72 25 15 75 32932 60000
## 73 24 15 75 32932 60000
## 74 30 15 75 32932 60000
## 75 30 15 75 32932 60000
## 76 30 15 75 32932 60000
## 77 Today 15 75 32932 60000
## 78 3 15 75 32932 60000
## 79 4 15 75 32932 60000
## 80 1 15 75 32932 60000
## 81 30 15 75 32932 60000
## 82 30 15 75 32932 60000
## 83 1 15 75 32932 60000
## 84 5 15 75 32932 60000
## 85 1 15 75 32932 60000
getIndeedJobData5pages("massage therapist","Tampa","FL")
## Warning in getIndeedJobData5pages("massage therapist", "Tampa", "FL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Tampa", "FL"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT) 1500 SIGNING BONUS
## 4 Massage Therapist - Independent Contractor
## 5 Licensed Massage Therapist (LMT)
## 6 Licensed Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist
## 16 Massage Therapist
## 17 Massage Therapist FT&PT *Great Pay and Signing Bonus*
## 18 Massage Therapist - Full-Time
## 19 Licensed Massage Therapist
## 20 Mobile Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Massage Therapist
## 25 Licensed Massage Therapist (LMT)
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist (LMT)
## 29 LMT
## 30 Licensed Massage Therapist - Professional & Reliable
## 31 Licensed Massage Therapist - Professional & Reliable
## 32 Licensed Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist
## 35 Massage Therapist in Downtown St. Pete
## 36 Massage Therapist - Flexible Hours
## 37 Looking for TALENTED MASSAGE THERAPISTS. Now hiring at a loc...
## 38 Licensed Massage Therapist: Full-Time & Part-Time
## 39 Massage Therapist - PT or FT
## 40 Massage Therapist - Independent Contractor
## 41 Massage Therapist/ Esthetician Full Specialty License
## 42 Licensed Massage Therapist - Dual Licensed Preferred (Esthet...
## 43 Massage Therapists - FT or PT
## 44 Licensed Massage Therapist (LMT)
## 45 Licensed Massage Therapists FT/PT Great Opportunity-Start No...
## 46 Licensed Massage Therapist-Up to $1000 Sign On Bonus Availab...
## 47 Licensed Massage Therapist
## 48 Massage Therapist
## 49 Massage Therapist
## 50 Massage Therapist in Downtown St. Pete
## 51 Massage Therapist - Flexible Hours
## 52 Looking for TALENTED MASSAGE THERAPISTS. Now hiring at a loc...
## 53 Licensed Massage Therapist: Full-Time & Part-Time
## 54 Massage Therapist - PT or FT
## 55 Massage Therapist - Independent Contractor
## 56 Massage Therapist/ Esthetician Full Specialty License
## 57 Licensed Massage Therapist - Dual Licensed Preferred (Esthet...
## 58 Massage Therapists - FT or PT
## 59 Licensed Massage Therapist (LMT)
## 60 Licensed Massage Therapists FT/PT Great Opportunity-Start No...
## 61 Licensed Massage Therapist-Up to $1000 Sign On Bonus Availab...
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $25 an hour $20 - $25 20.0 25
## 2 \n$14 - $49 an hour $14 - $49 14.0 49
## 3 \n$20 - $25 an hour $20 - $25 20.0 25
## 4 \n$21 - $26 an hour $21 - $26 21.0 26
## 5 \n$15 - $20 an hour $15 - $20 15.0 20
## 6 \n$30 - $40 an hour $30 - $40 30.0 40
## 7 \n$18 - $25 an hour $18 - $25 18.0 25
## 8 \n$20 - $65 an hour $20 - $65 20.0 65
## 9 \n$35,000 - $42,000 a year $35000 - $42000 35000.0 42000
## 10 \n$35,353 - $60,000 a year $35353 - $60000 35353.0 60000
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 12 \n$14 - $18 an hour $14 - $18 14.0 18
## 13 \n$14 - $49 an hour $14 - $49 14.0 49
## 14 \n$45 - $70 an hour $45 - $70 45.0 70
## 15 \n$20 an hour $20 20.0 NA
## 16 \n$25 - $45 an hour $25 - $45 25.0 45
## 17 \n$20 - $65 an hour $20 - $65 20.0 65
## 18 \n$16 - $22 an hour $16 - $22 16.0 22
## 19 \n$14 - $35 an hour $14 - $35 14.0 35
## 20 \n$14 - $35 an hour $14 - $35 14.0 35
## 21 \n$13 - $35 an hour $13 - $35 13.0 35
## 22 \n$17.50 - $28.00 an hour $17.50 - $28.00 17.5 28
## 23 \n$20 - $25 an hour $20 - $25 20.0 25
## 24 \n$20 - $25 an hour $20 - $25 20.0 25
## 25 \n$13 an hour $13 13.0 NA
## 26 \n$30 - $40 an hour $30 - $40 30.0 40
## 27 \n$20 - $24 an hour $20 - $24 20.0 24
## 28 \n$13 an hour $13 13.0 NA
## 29 \n$30 - $40 an hour $30 - $40 30.0 40
## 30 \n$20 - $24 an hour $20 - $24 20.0 24
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 20 25 2529.65 3346.395 13
## 2 20 25 2529.65 3346.395 13
## 3 20 25 2529.65 3346.395 13
## 4 20 25 2529.65 3346.395 13
## 5 20 25 2529.65 3346.395 13
## 6 20 25 2529.65 3346.395 13
## 7 20 25 2529.65 3346.395 13
## 8 20 25 2529.65 3346.395 13
## 9 20 25 2529.65 3346.395 13
## 10 20 25 2529.65 3346.395 13
## 11 20 25 2529.65 3346.395 13
## 12 20 25 2529.65 3346.395 13
## 13 20 25 2529.65 3346.395 13
## 14 20 25 2529.65 3346.395 13
## 15 20 25 2529.65 3346.395 13
## 16 20 25 2529.65 3346.395 13
## 17 20 25 2529.65 3346.395 13
## 18 20 25 2529.65 3346.395 13
## 19 20 25 2529.65 3346.395 13
## 20 20 25 2529.65 3346.395 13
## 21 20 25 2529.65 3346.395 13
## 22 20 25 2529.65 3346.395 13
## 23 20 25 2529.65 3346.395 13
## 24 20 25 2529.65 3346.395 13
## 25 20 25 2529.65 3346.395 13
## 26 20 25 2529.65 3346.395 13
## 27 20 25 2529.65 3346.395 13
## 28 20 25 2529.65 3346.395 13
## 29 20 25 2529.65 3346.395 13
## 30 20 25 2529.65 3346.395 13
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
##
## [[3]]
## date_daysAgo
## 1 4
## 2 13
## 3 12
## 4 Just posted
## 5 7
## 6 Today
## 7 19
## 8 24
## 9 30
## 10 27
## 11 1
## 12 18
## 13 20
## 14 30
## 15 Today
## 16 30
## 17 22
## 18 30
## 19 28
## 20 30
## 21 29
## 22 30
## 23 30
## 24 23
## 25 30
## 26 30
## 27 6
## 28 19
## 29 28
## 30 30
## 31 30
## 32 30
## 33 30
## 34 30
## 35 5
## 36 30
## 37 5
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 30
## 45 28
## 46 7
## 47 30
## 48 30
## 49 30
## 50 5
## 51 30
## 52 5
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 30
## 59 30
## 60 28
## 61 7
##
## [[4]]
## HiringAgency
## 1 dr steve coxBrandon, FL 33511
## 2 Amy's Day SpaTampa, FL 33606 (Courier City area)
## 3 Divine Designs Salon & Spa3.9Brandon, FL 33511
## 4 Long Chiropractic & Rehab CenterTampa, FL 33624
## 5 Spine & Joint Center of Tarpon SpringsTarpon Springs, FL 34689
## 6 Crespo & Associates, PATampa, FL 33607
## 7 LeVisa Massage Spa & WellnessTampa, FL
## 8 Soothe3.7Tampa, FL
## 9 Synergy Health and WellnessWesley Chapel, FL 33543
## 10 South Tampa Day SpaTampa, FL 33629 (Culbreath area)
## 11 DayDreams Day & Med Spa4.2Brandon, FL 33511
## 12 Essentials of CarrollwoodTampa, FL 33618
## 13 Healthwest Rehabilitation CenterTampa, FL 33607 (Wellswood area)
## 14 Indo-Pak Massage TherapyTampa, FL+2 locations•Remote work available
## 15 Advanced Spine & Injury CenterSaint Petersburg, FL 33703
## 16 WTS International3.3Tampa, FL+2 locations
## 17 LaVida Massage3.7Tampa, FL 33618
## 18 Life Time3.6Tampa, FL 33607 (Tampa International Airport Area area)
## 19 Pope Golf / Pope PropertiesOdessa, FL 33556
## 20 Indo-Pak Massage TherapyTampa, FL
## 21 West Bay Chiropractic ClinicLargo, FL 33770
## 22 Spa ZenAura MassageTampa, FL 33626
## 23 South Tampa Day SpaTampa, FL 33629 (Culbreath area)
## 24 Reynolds ChiropracticClearwater, FL 33756
## 25 Tranquility Wellness SpaSaint Petersburg, FL 33701 (Downtown area)
## 26 Spa 801Saint Petersburg, FL 33710
## 27 Essentials Massage and Facials3.5Brandon, FL 33511
## 28 Essentials Massage and Facials of TrinityTrinity, FL 34655
## 29 Path Medical2.3Tampa, FL 33614 (Plaza Terrace area)+1 location
## 30 Therapeutic Elements Center for Massage TherapyClearwater, FL 33761
## 31 Therapeutic Elements Center for Massage TherapyClearwater, FL 33761
## 32 Massage Envy3.2Tampa, FL 33602 (Downtown area)+1 location
## 33 Massage Envy3.2Tampa, FL 33629 (Palma Ceia West area)+7 locations
## 34 The Woodhouse Day Spa - Saint PetersburgSaint Petersburg, FL 33701
## 35 Massage Studio3.8Saint Petersburg, FL 33701 (Downtown area)
## 36 Massage Envy3.2Clearwater, FL 33761
## 37 Massage Studio3.8Tampa, FL 33609 (Courier City area)
## 38 Massage Envy3.2Tampa, FL 33602 (Channel District area)
## 39 Massage Envy3.2Clearwater, FL 33761
## 40 Jon Anthony Salon & SpaLargo, FL 33770
## 41 Sharmaine's Salon & Day SpaClearwater Beach, FL 33767 (Island Estate area)
## 42 Natural Balance Massage Therapy & Wellness CenterPalm Harbor, FL
## 43 Massage Envy3.2Clearwater, FL 33761
## 44 Ideal MassageLutz, FL 33558
## 45 Amenity Pro, LLCTampa, FL 33626
## 46 Hand and Stone Spa3.0Tampa, FL 33646
## 47 Massage Envy3.2Tampa, FL 33602 (Downtown area)+1 location
## 48 Massage Envy3.2Tampa, FL 33629 (Palma Ceia West area)+7 locations
## 49 The Woodhouse Day Spa - Saint PetersburgSaint Petersburg, FL 33701
## 50 Massage Studio3.8Saint Petersburg, FL 33701 (Downtown area)
## 51 Massage Envy3.2Clearwater, FL 33761
## 52 Massage Studio3.8Tampa, FL 33609 (Courier City area)
## 53 Massage Envy3.2Tampa, FL 33602 (Channel District area)
## 54 Massage Envy3.2Clearwater, FL 33761
## 55 Jon Anthony Salon & SpaLargo, FL 33770
## 56 Sharmaine's Salon & Day SpaClearwater Beach, FL 33767 (Island Estate area)
## 57 Natural Balance Massage Therapy & Wellness CenterPalm Harbor, FL
## 58 Massage Envy3.2Clearwater, FL 33761
## 59 Ideal MassageLutz, FL 33558
## 60 Amenity Pro, LLCTampa, FL 33626
## 61 Hand and Stone Spa3.0Tampa, FL 33646
##
## [[5]]
## Salary salary minSalary maxSalary
## 9 \n$35,000 - $42,000 a year $35000 - $42000 35000 42000
## 10 \n$35,353 - $60,000 a year $35353 - $60000 35353 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 9 35176.5 51000 35176.5 51000 35000
## 10 35176.5 51000 35176.5 51000 35000
## maximumMaxSalary
## 9 60000
## 10 60000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $25 an hour $20 - $25 20.0 25
## 2 \n$14 - $49 an hour $14 - $49 14.0 49
## 3 \n$20 - $25 an hour $20 - $25 20.0 25
## 4 \n$21 - $26 an hour $21 - $26 21.0 26
## 5 \n$15 - $20 an hour $15 - $20 15.0 20
## 6 \n$30 - $40 an hour $30 - $40 30.0 40
## 7 \n$18 - $25 an hour $18 - $25 18.0 25
## 8 \n$20 - $65 an hour $20 - $65 20.0 65
## 12 \n$14 - $18 an hour $14 - $18 14.0 18
## 13 \n$14 - $49 an hour $14 - $49 14.0 49
## 14 \n$45 - $70 an hour $45 - $70 45.0 70
## 15 \n$20 an hour $20 20.0 NA
## 16 \n$25 - $45 an hour $25 - $45 25.0 45
## 17 \n$20 - $65 an hour $20 - $65 20.0 65
## 18 \n$16 - $22 an hour $16 - $22 16.0 22
## 19 \n$14 - $35 an hour $14 - $35 14.0 35
## 20 \n$14 - $35 an hour $14 - $35 14.0 35
## 21 \n$13 - $35 an hour $13 - $35 13.0 35
## 22 \n$17.50 - $28.00 an hour $17.50 - $28.00 17.5 28
## 23 \n$20 - $25 an hour $20 - $25 20.0 25
## 24 \n$20 - $25 an hour $20 - $25 20.0 25
## 25 \n$13 an hour $13 13.0 NA
## 26 \n$30 - $40 an hour $30 - $40 30.0 40
## 27 \n$20 - $24 an hour $20 - $24 20.0 24
## 28 \n$13 an hour $13 13.0 NA
## 29 \n$30 - $40 an hour $30 - $40 30.0 40
## 30 \n$20 - $24 an hour $20 - $24 20.0 24
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 20 31.5 19.87037 35.625 13
## 2 20 31.5 19.87037 35.625 13
## 3 20 31.5 19.87037 35.625 13
## 4 20 31.5 19.87037 35.625 13
## 5 20 31.5 19.87037 35.625 13
## 6 20 31.5 19.87037 35.625 13
## 7 20 31.5 19.87037 35.625 13
## 8 20 31.5 19.87037 35.625 13
## 12 20 31.5 19.87037 35.625 13
## 13 20 31.5 19.87037 35.625 13
## 14 20 31.5 19.87037 35.625 13
## 15 20 31.5 19.87037 35.625 13
## 16 20 31.5 19.87037 35.625 13
## 17 20 31.5 19.87037 35.625 13
## 18 20 31.5 19.87037 35.625 13
## 19 20 31.5 19.87037 35.625 13
## 20 20 31.5 19.87037 35.625 13
## 21 20 31.5 19.87037 35.625 13
## 22 20 31.5 19.87037 35.625 13
## 23 20 31.5 19.87037 35.625 13
## 24 20 31.5 19.87037 35.625 13
## 25 20 31.5 19.87037 35.625 13
## 26 20 31.5 19.87037 35.625 13
## 27 20 31.5 19.87037 35.625 13
## 28 20 31.5 19.87037 35.625 13
## 29 20 31.5 19.87037 35.625 13
## 30 20 31.5 19.87037 35.625 13
## maximumMaxSalary
## 1 70
## 2 70
## 3 70
## 4 70
## 5 70
## 6 70
## 7 70
## 8 70
## 12 70
## 13 70
## 14 70
## 15 70
## 16 70
## 17 70
## 18 70
## 19 70
## 20 70
## 21 70
## 22 70
## 23 70
## 24 70
## 25 70
## 26 70
## 27 70
## 28 70
## 29 70
## 30 70
##
## [[7]]
## city state jobTitle
## 1 Tampa FL Licensed Massage Therapist
## 2 Tampa FL Licensed Massage Therapist
## 3 Tampa FL Licensed Massage Therapist (LMT) 1500 SIGNING BONUS
## 4 Tampa FL Massage Therapist - Independent Contractor
## 5 Tampa FL Licensed Massage Therapist (LMT)
## 6 Tampa FL Licensed Massage Therapist
## 7 Tampa FL Massage Therapist - Independent Contractor
## 8 Tampa FL Licensed Massage Therapist
## 9 Tampa FL Licensed Massage Therapist
## 10 Tampa FL Licensed Massage Therapist
## 11 Tampa FL Licensed Massage Therapist (LMT)
## 12 Tampa FL Licensed Massage Therapist
## 13 Tampa FL Licensed Massage Therapist (LMT)
## 14 Tampa FL Massage Therapist - Independent Contractor
## 15 Tampa FL Massage Therapist
## 16 Tampa FL Massage Therapist
## 17 Tampa FL Massage Therapist FT&PT *Great Pay and Signing Bonus*
## 18 Tampa FL Massage Therapist - Full-Time
## 19 Tampa FL Licensed Massage Therapist
## 20 Tampa FL Mobile Massage Therapist
## 21 Tampa FL Massage Therapist
## 22 Tampa FL Licensed Massage Therapist
## 23 Tampa FL Licensed Massage Therapist (LMT)
## 24 Tampa FL Massage Therapist
## 25 Tampa FL Licensed Massage Therapist (LMT)
## 26 Tampa FL Massage Therapist
## 27 Tampa FL Licensed Massage Therapist
## 28 Tampa FL Licensed Massage Therapist (LMT)
## 29 Tampa FL LMT
## 30 Tampa FL Licensed Massage Therapist - Professional & Reliable
## 31 Tampa FL Licensed Massage Therapist - Professional & Reliable
## 32 Tampa FL Licensed Massage Therapist
## 33 Tampa FL Massage Therapist
## 34 Tampa FL Massage Therapist
## 35 Tampa FL Massage Therapist in Downtown St. Pete
## 36 Tampa FL Massage Therapist - Flexible Hours
## 37 Tampa FL Looking for TALENTED MASSAGE THERAPISTS. Now hiring at a loc...
## 38 Tampa FL Licensed Massage Therapist: Full-Time & Part-Time
## 39 Tampa FL Massage Therapist - PT or FT
## 40 Tampa FL Massage Therapist - Independent Contractor
## 41 Tampa FL Massage Therapist/ Esthetician Full Specialty License
## 42 Tampa FL Licensed Massage Therapist - Dual Licensed Preferred (Esthet...
## 43 Tampa FL Massage Therapists - FT or PT
## 44 Tampa FL Licensed Massage Therapist (LMT)
## 45 Tampa FL Licensed Massage Therapists FT/PT Great Opportunity-Start No...
## 46 Tampa FL Licensed Massage Therapist-Up to $1000 Sign On Bonus Availab...
## 47 Tampa FL Licensed Massage Therapist
## 48 Tampa FL Massage Therapist
## 49 Tampa FL Massage Therapist
## 50 Tampa FL Massage Therapist in Downtown St. Pete
## 51 Tampa FL Massage Therapist - Flexible Hours
## 52 Tampa FL Looking for TALENTED MASSAGE THERAPISTS. Now hiring at a loc...
## 53 Tampa FL Licensed Massage Therapist: Full-Time & Part-Time
## 54 Tampa FL Massage Therapist - PT or FT
## 55 Tampa FL Massage Therapist - Independent Contractor
## 56 Tampa FL Massage Therapist/ Esthetician Full Specialty License
## 57 Tampa FL Licensed Massage Therapist - Dual Licensed Preferred (Esthet...
## 58 Tampa FL Massage Therapists - FT or PT
## 59 Tampa FL Licensed Massage Therapist (LMT)
## 60 Tampa FL Licensed Massage Therapists FT/PT Great Opportunity-Start No...
## 61 Tampa FL Licensed Massage Therapist-Up to $1000 Sign On Bonus Availab...
## HiringAgency
## 1 dr steve coxBrandon, FL 33511
## 2 Amy's Day SpaTampa, FL 33606 (Courier City area)
## 3 Divine Designs Salon & Spa3.9Brandon, FL 33511
## 4 Long Chiropractic & Rehab CenterTampa, FL 33624
## 5 Spine & Joint Center of Tarpon SpringsTarpon Springs, FL 34689
## 6 Crespo & Associates, PATampa, FL 33607
## 7 LeVisa Massage Spa & WellnessTampa, FL
## 8 Soothe3.7Tampa, FL
## 9 Synergy Health and WellnessWesley Chapel, FL 33543
## 10 South Tampa Day SpaTampa, FL 33629 (Culbreath area)
## 11 DayDreams Day & Med Spa4.2Brandon, FL 33511
## 12 Essentials of CarrollwoodTampa, FL 33618
## 13 Healthwest Rehabilitation CenterTampa, FL 33607 (Wellswood area)
## 14 Indo-Pak Massage TherapyTampa, FL+2 locations•Remote work available
## 15 Advanced Spine & Injury CenterSaint Petersburg, FL 33703
## 16 WTS International3.3Tampa, FL+2 locations
## 17 LaVida Massage3.7Tampa, FL 33618
## 18 Life Time3.6Tampa, FL 33607 (Tampa International Airport Area area)
## 19 Pope Golf / Pope PropertiesOdessa, FL 33556
## 20 Indo-Pak Massage TherapyTampa, FL
## 21 West Bay Chiropractic ClinicLargo, FL 33770
## 22 Spa ZenAura MassageTampa, FL 33626
## 23 South Tampa Day SpaTampa, FL 33629 (Culbreath area)
## 24 Reynolds ChiropracticClearwater, FL 33756
## 25 Tranquility Wellness SpaSaint Petersburg, FL 33701 (Downtown area)
## 26 Spa 801Saint Petersburg, FL 33710
## 27 Essentials Massage and Facials3.5Brandon, FL 33511
## 28 Essentials Massage and Facials of TrinityTrinity, FL 34655
## 29 Path Medical2.3Tampa, FL 33614 (Plaza Terrace area)+1 location
## 30 Therapeutic Elements Center for Massage TherapyClearwater, FL 33761
## 31 Therapeutic Elements Center for Massage TherapyClearwater, FL 33761
## 32 Massage Envy3.2Tampa, FL 33602 (Downtown area)+1 location
## 33 Massage Envy3.2Tampa, FL 33629 (Palma Ceia West area)+7 locations
## 34 The Woodhouse Day Spa - Saint PetersburgSaint Petersburg, FL 33701
## 35 Massage Studio3.8Saint Petersburg, FL 33701 (Downtown area)
## 36 Massage Envy3.2Clearwater, FL 33761
## 37 Massage Studio3.8Tampa, FL 33609 (Courier City area)
## 38 Massage Envy3.2Tampa, FL 33602 (Channel District area)
## 39 Massage Envy3.2Clearwater, FL 33761
## 40 Jon Anthony Salon & SpaLargo, FL 33770
## 41 Sharmaine's Salon & Day SpaClearwater Beach, FL 33767 (Island Estate area)
## 42 Natural Balance Massage Therapy & Wellness CenterPalm Harbor, FL
## 43 Massage Envy3.2Clearwater, FL 33761
## 44 Ideal MassageLutz, FL 33558
## 45 Amenity Pro, LLCTampa, FL 33626
## 46 Hand and Stone Spa3.0Tampa, FL 33646
## 47 Massage Envy3.2Tampa, FL 33602 (Downtown area)+1 location
## 48 Massage Envy3.2Tampa, FL 33629 (Palma Ceia West area)+7 locations
## 49 The Woodhouse Day Spa - Saint PetersburgSaint Petersburg, FL 33701
## 50 Massage Studio3.8Saint Petersburg, FL 33701 (Downtown area)
## 51 Massage Envy3.2Clearwater, FL 33761
## 52 Massage Studio3.8Tampa, FL 33609 (Courier City area)
## 53 Massage Envy3.2Tampa, FL 33602 (Channel District area)
## 54 Massage Envy3.2Clearwater, FL 33761
## 55 Jon Anthony Salon & SpaLargo, FL 33770
## 56 Sharmaine's Salon & Day SpaClearwater Beach, FL 33767 (Island Estate area)
## 57 Natural Balance Massage Therapy & Wellness CenterPalm Harbor, FL
## 58 Massage Envy3.2Clearwater, FL 33761
## 59 Ideal MassageLutz, FL 33558
## 60 Amenity Pro, LLCTampa, FL 33626
## 61 Hand and Stone Spa3.0Tampa, FL 33646
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 4 13 70 35000 60000
## 2 13 13 70 35000 60000
## 3 12 13 70 35000 60000
## 4 Just posted 13 70 35000 60000
## 5 7 13 70 35000 60000
## 6 Today 13 70 35000 60000
## 7 19 13 70 35000 60000
## 8 24 13 70 35000 60000
## 9 30 13 70 35000 60000
## 10 27 13 70 35000 60000
## 11 1 13 70 35000 60000
## 12 18 13 70 35000 60000
## 13 20 13 70 35000 60000
## 14 30 13 70 35000 60000
## 15 Today 13 70 35000 60000
## 16 30 13 70 35000 60000
## 17 22 13 70 35000 60000
## 18 30 13 70 35000 60000
## 19 28 13 70 35000 60000
## 20 30 13 70 35000 60000
## 21 29 13 70 35000 60000
## 22 30 13 70 35000 60000
## 23 30 13 70 35000 60000
## 24 23 13 70 35000 60000
## 25 30 13 70 35000 60000
## 26 30 13 70 35000 60000
## 27 6 13 70 35000 60000
## 28 19 13 70 35000 60000
## 29 28 13 70 35000 60000
## 30 30 13 70 35000 60000
## 31 30 13 70 35000 60000
## 32 30 13 70 35000 60000
## 33 30 13 70 35000 60000
## 34 30 13 70 35000 60000
## 35 5 13 70 35000 60000
## 36 30 13 70 35000 60000
## 37 5 13 70 35000 60000
## 38 30 13 70 35000 60000
## 39 30 13 70 35000 60000
## 40 30 13 70 35000 60000
## 41 30 13 70 35000 60000
## 42 30 13 70 35000 60000
## 43 30 13 70 35000 60000
## 44 30 13 70 35000 60000
## 45 28 13 70 35000 60000
## 46 7 13 70 35000 60000
## 47 30 13 70 35000 60000
## 48 30 13 70 35000 60000
## 49 30 13 70 35000 60000
## 50 5 13 70 35000 60000
## 51 30 13 70 35000 60000
## 52 5 13 70 35000 60000
## 53 30 13 70 35000 60000
## 54 30 13 70 35000 60000
## 55 30 13 70 35000 60000
## 56 30 13 70 35000 60000
## 57 30 13 70 35000 60000
## 58 30 13 70 35000 60000
## 59 30 13 70 35000 60000
## 60 28 13 70 35000 60000
## 61 7 13 70 35000 60000
Georgia Atlanta, Augusta, Columbus
getIndeedJobData5pages("massage therapist","Atlanta","GA")
## Warning in getIndeedJobData5pages("massage therapist", "Atlanta", "GA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Atlanta", "GA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Atlanta", "GA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 3 Licensed Massage Therapist - - $$1500 SIGN ON BONUS$$
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist (LMT) - Must be available weekend...
## 6 Licensed Massage Therapist
## 7 ATL: Licensed Massage Therapist-$60-$93/hour: Corporation &...
## 8 Licensed Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist - Passionate Healer
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist, Esthetician
## 13 Licensed Massage Therapist - Passionate Healer
## 14 Massage Therapist- Good Pay! Paid Vacation! Free Massages! A...
## 15 Licensed Massage Therapist
## 16 Massage Therapist - Full Time
## 17 Massage Therapist
## 18 Massage Therapist- Full or Part Time (Atlanta, GA)
## 19 Mobile Massage Therapist
## 20 Massage Therapist - Independent Contractor Full or Part time
## 21 Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 LICENSED MASSAGE THERAPIST WANTED!!!!
## 26 Licensed Massage Therapist
## 27 Massage Therapist
## 28 Massage Therapist Full and Part Time Available
## 29 Passionate Licensed Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Massage Therapist IMMEDIATE OPENING
## 32 LifeSpa Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 LICENSED MASSAGE THERAPIST WANTED!!!!
## 36 Passionate Licensed Massage Therapist
## 37 Licensed Massage Therapist, Independent Contractor
## 38 Massage Therapist - Massage Envy Tucker Meridian
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist - Independent Contractor
## 42 Massage Services Associate
## 43 Massage Therapist- Good Pay! Paid Vacation! Free Massages! A...
## 44 Massage Therapist Full or Part Time
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist [CUSTOMIZATION REQUIRED]
## 48 Massage Therapist - Great Pay! COVID-19 Guest Process! Posit...
## 49 Neuromuscular Massage Therapist (LMT) - Full or Part Time
## 50 Total Body Stretch Service Provider
## 51 Passionate Licensed Massage Therapist
## 52 Licensed Massage Therapist, Independent Contractor
## 53 Massage Therapist - Massage Envy Tucker Meridian
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Massage Therapist - Independent Contractor
## 57 Massage Services Associate
## 58 Massage Therapist- Good Pay! Paid Vacation! Free Massages! A...
## 59 Massage Therapist Full or Part Time
## 60 Licensed Massage Therapist (LMT)
## 61 Licensed Massage Therapist
## 62 Massage Therapist [CUSTOMIZATION REQUIRED]
## 63 Massage Therapist - Great Pay! COVID-19 Guest Process! Posit...
## 64 Neuromuscular Massage Therapist (LMT) - Full or Part Time
## 65 Total Body Stretch Service Provider
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 an hour $20 20 NA
## 2 \n$30 - $45 an hour $30 - $45 30 45
## 3 \n$30 - $40 an hour $30 - $40 30 40
## 4 \n$35 - $55 an hour $35 - $55 35 55
## 5 \n$25 - $35 an hour $25 - $35 25 35
## 6 \n$25 - $30 an hour $25 - $30 25 30
## 7 \n$60 - $93 an hour $60 - $93 60 93
## 8 \n$100 - $125 an hour $100 - $125 100 125
## 9 \n$30 - $45 an hour $30 - $45 30 45
## 10 \n$35 - $60 an hour $35 - $60 35 60
## 11 \n$40 - $50 an hour $40 - $50 40 50
## 12 \n$30 - $45 an hour $30 - $45 30 45
## 13 \n$29 - $45 an hour $29 - $45 29 45
## 14 \n$40 - $80 an hour $40 - $80 40 80
## 15 \n$20 - $60 an hour ++ $20 - $60 20 60
## 16 \n$45 - $70 an hour $45 - $70 45 70
## 17 \n$30 - $50 an hour $30 - $50 30 50
## 18 \n$40 an hour $40 40 NA
## 19 \n$38,000 - $60,000 a year $38000 - $60000 38000 60000
## 20 \n$20 - $30 an hour $20 - $30 20 30
## 21 \nUp to $40 an hour $40 40 NA
## 22 \n$30 - $40 an hour ++ $30 - $40 30 40
## 23 \n$20 - $40 an hour $20 - $40 20 40
## 24 \n$25,000 - $48,000 a year $25000 - $48000 25000 48000
## 25 \n$20 - $30 an hour $20 - $30 20 30
## 26 \n$30 - $40 an hour $30 - $40 30 40
## 27 \n$30 - $40 an hour $30 - $40 30 40
## 28 \n$29 - $45 an hour $29 - $45 29 45
## 29 \n$40,000 a year $40000 40000 NA
## 30 \n$29 - $45 an hour $29 - $45 29 45
## 31 \n$30 - $40 an hour $30 - $40 30 40
## 32 \n$30 - $40 an hour $30 - $40 30 40
## 33 \n$29 - $45 an hour $29 - $45 29 45
## 34 \n$40,000 a year $40000 40000 NA
## 35 \n$29 - $45 an hour $29 - $45 29 45
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 40 4115.143 3899.046 20
## 2 30 40 4115.143 3899.046 20
## 3 30 40 4115.143 3899.046 20
## 4 30 40 4115.143 3899.046 20
## 5 30 40 4115.143 3899.046 20
## 6 30 40 4115.143 3899.046 20
## 7 30 40 4115.143 3899.046 20
## 8 30 40 4115.143 3899.046 20
## 9 30 40 4115.143 3899.046 20
## 10 30 40 4115.143 3899.046 20
## 11 30 40 4115.143 3899.046 20
## 12 30 40 4115.143 3899.046 20
## 13 30 40 4115.143 3899.046 20
## 14 30 40 4115.143 3899.046 20
## 15 30 40 4115.143 3899.046 20
## 16 30 40 4115.143 3899.046 20
## 17 30 40 4115.143 3899.046 20
## 18 30 40 4115.143 3899.046 20
## 19 30 40 4115.143 3899.046 20
## 20 30 40 4115.143 3899.046 20
## 21 30 40 4115.143 3899.046 20
## 22 30 40 4115.143 3899.046 20
## 23 30 40 4115.143 3899.046 20
## 24 30 40 4115.143 3899.046 20
## 25 30 40 4115.143 3899.046 20
## 26 30 40 4115.143 3899.046 20
## 27 30 40 4115.143 3899.046 20
## 28 30 40 4115.143 3899.046 20
## 29 30 40 4115.143 3899.046 20
## 30 30 40 4115.143 3899.046 20
## 31 30 40 4115.143 3899.046 20
## 32 30 40 4115.143 3899.046 20
## 33 30 40 4115.143 3899.046 20
## 34 30 40 4115.143 3899.046 20
## 35 30 40 4115.143 3899.046 20
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
## 31 60000
## 32 60000
## 33 60000
## 34 60000
## 35 60000
##
## [[3]]
## date_daysAgo
## 1 7
## 2 1
## 3 30
## 4 30
## 5 4
## 6 30
## 7 Just posted
## 8 24
## 9 Today
## 10 2
## 11 30
## 12 11
## 13 2
## 14 30
## 15 19
## 16 30
## 17 30
## 18 30
## 19 30
## 20 13
## 21 15
## 22 24
## 23 14
## 24 5
## 25 30
## 26 30
## 27 6
## 28 7
## 29 8
## 30 13
## 31 20
## 32 30
## 33 30
## 34 3
## 35 30
## 36 30
## 37 9
## 38 30
## 39 29
## 40 30
## 41 19
## 42 22
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 30
## 49 30
## 50 30
## 51 30
## 52 9
## 53 30
## 54 30
## 55 29
## 56 19
## 57 22
## 58 30
## 59 30
## 60 26
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
##
## [[4]]
## HiringAgency
## 1 Atlanta Center for Cosmetic DentistryAtlanta, GA 30342 (Buckhead area)
## 2 Ramsey InsightAtlanta, GA
## 3 Massage Heights Buckhead3.1Atlanta, GA 30305 (Peachtree Heights West area)
## 4 Spa in BuckheadAtlanta, GA 30305 (Buckhead Village area)
## 5 Journey Family ChiropracticRoswell, GA 30076
## 6 100% Chiropractic4.0Roswell, GA 30075
## 7 Spa Utopia (Luxury - On-demand Spa)2.0Atlanta, GA
## 8 Soothe3.7Atlanta, GA
## 9 Sipping Prettea Tea BarAtlanta, GA 30310 (Oakland City area)
## 10 Ramsey InsightAtlanta, GA
## 11 Heal Thyself AtlantaAtlanta, GA (Grant Park area)
## 12 Mezz SpaAlpharetta, GA 30009
## 13 Atlanta MassageDecatur, GA
## 14 LaVida Massage3.7Alpharetta, GA 30004
## 15 Buckhead Grand SpaAtlanta, GA 30326 (North Buckhead area)
## 16 Life Time3.6Sandy Springs, GA 30342 (Buckhead area)+2 locations
## 17 Massage Envy3.2Atlanta, GA 30305 (Buckhead area)+11 locations
## 18 The NOW, LLCAtlanta, GA 30303 (Five Points area)
## 19 Indo-Pak Massage TherapyAtlanta, GA+1 location
## 20 Milton Chiropractic & MassageMilton, GA 30004
## 21 Choice One Health CenterDuluth, GA 30096
## 22 Divine Harmony Massage Therapy3.0Roswell, GA 30076
## 23 Spavia Day Spa3.3Alpharetta, GA 30022+1 location
## 24 The Art of Touch MassageAtlanta, GA 30308 (Midtown area)
## 25 LaVida Massage3.7Sandy Springs, GA 30328 (Downtown area)
## 26 Hand and Stone Massage and Facial Spa3.0Fayetteville, GA 30214
## 27 The Woodhouse Day Spa - Dunwoody3.3Atlanta, GA 30346
## 28 The Woodhouse Day Spa - AvalonAlpharetta, GA 30009
## 29 Massage Heights - Atlanta3.1Atlanta, GA 30305 (Buckhead area)
## 30 Be the light chiropracticDuluth, GA 30096
## 31 Medi Spa3.4Marietta, GA
## 32 Life Time3.6Lawrenceville, GA 30024
## 33 Hand and Stone Massage and Facial Spa3.0Fayetteville, GA 30214
## 34 Spa Stinny4.5Snellville, GA 30078
## 35 LaVida Massage3.7Sandy Springs, GA 30328 (Downtown area)
## 36 Massage Heights3.1Atlanta, GA 30305 (Buckhead area)
## 37 Crown2Sole Therapeutic & Rehabilitative MassageJonesboro, GA 30236
## 38 Massage Envy3.2Tucker, GA 30084
## 39 Choice One Health CenterDuluth, GA 30096
## 40 Massage Envy3.2Atlanta, GA 30318 (Berkeley Park area)+1 location
## 41 Progressive Healthcare of Gwinnett5.0Lilburn, GA 30047
## 42 Power Wellness3.1Fayetteville, GA 30214
## 43 LaVida Massage3.7Alpharetta, GA 30004
## 44 Massage Envy3.2Kennesaw, GA 30144
## 45 Dominant PerformanceFayetteville, GA
## 46 Dominant PerformanceFayetteville, GA
## 47 Massage Envy3.2Woodstock, GA 30189
## 48 LaVida Massage3.7Johns Creek, GA 30022
## 49 MAC Day SpaMarietta, GA 30064
## 50 Massage Envy3.2Marietta, GA 30067
## 51 Massage Heights3.1Atlanta, GA 30305 (Buckhead area)
## 52 Crown2Sole Therapeutic & Rehabilitative MassageJonesboro, GA 30236
## 53 Massage Envy3.2Tucker, GA 30084
## 54 Massage Envy3.2Atlanta, GA 30318 (Berkeley Park area)+1 location
## 55 Choice One Health CenterDuluth, GA 30096
## 56 Progressive Healthcare of Gwinnett5.0Lilburn, GA 30047
## 57 Power Wellness3.1Fayetteville, GA 30214
## 58 LaVida Massage3.7Alpharetta, GA 30004
## 59 Massage Envy3.2Kennesaw, GA 30144
## 60 Massage SolutionsMcDonough, GA 30253
## 61 Dominant PerformanceFayetteville, GA
## 62 Massage Envy3.2Woodstock, GA 30189
## 63 LaVida Massage3.7Johns Creek, GA 30022
## 64 MAC Day SpaMarietta, GA 30064
## 65 Massage Envy3.2Marietta, GA 30067
##
## [[5]]
## Salary salary minSalary maxSalary
## 19 \n$38,000 - $60,000 a year $38000 - $60000 38000 60000
## 24 \n$25,000 - $48,000 a year $25000 - $48000 25000 48000
## 29 \n$40,000 a year $40000 40000 NA
## 34 \n$40,000 a year $40000 40000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 19 39000 54000 35750 54000 25000
## 24 39000 54000 35750 54000 25000
## 29 39000 54000 35750 54000 25000
## 34 39000 54000 35750 54000 25000
## maximumMaxSalary
## 19 60000
## 24 60000
## 29 60000
## 34 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 an hour $20 20 NA 30
## 2 \n$30 - $45 an hour $30 - $45 30 45 30
## 3 \n$30 - $40 an hour $30 - $40 30 40 30
## 4 \n$35 - $55 an hour $35 - $55 35 55 30
## 5 \n$25 - $35 an hour $25 - $35 25 35 30
## 6 \n$25 - $30 an hour $25 - $30 25 30 30
## 7 \n$60 - $93 an hour $60 - $93 60 93 30
## 8 \n$100 - $125 an hour $100 - $125 100 125 30
## 9 \n$30 - $45 an hour $30 - $45 30 45 30
## 10 \n$35 - $60 an hour $35 - $60 35 60 30
## 11 \n$40 - $50 an hour $40 - $50 40 50 30
## 12 \n$30 - $45 an hour $30 - $45 30 45 30
## 13 \n$29 - $45 an hour $29 - $45 29 45 30
## 14 \n$40 - $80 an hour $40 - $80 40 80 30
## 15 \n$20 - $60 an hour ++ $20 - $60 20 60 30
## 16 \n$45 - $70 an hour $45 - $70 45 70 30
## 17 \n$30 - $50 an hour $30 - $50 30 50 30
## 18 \n$40 an hour $40 40 NA 30
## 20 \n$20 - $30 an hour $20 - $30 20 30 30
## 21 \nUp to $40 an hour $40 40 NA 30
## 22 \n$30 - $40 an hour ++ $30 - $40 30 40 30
## 23 \n$20 - $40 an hour $20 - $40 20 40 30
## 25 \n$20 - $30 an hour $20 - $30 20 30 30
## 26 \n$30 - $40 an hour $30 - $40 30 40 30
## 27 \n$30 - $40 an hour $30 - $40 30 40 30
## 28 \n$29 - $45 an hour $29 - $45 29 45 30
## 30 \n$29 - $45 an hour $29 - $45 29 45 30
## 31 \n$30 - $40 an hour $30 - $40 30 40 30
## 32 \n$30 - $40 an hour $30 - $40 30 40 30
## 33 \n$29 - $45 an hour $29 - $45 29 45 30
## 35 \n$29 - $45 an hour $29 - $45 29 45 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 33.22581 50.28571 20 125
## 2 45 33.22581 50.28571 20 125
## 3 45 33.22581 50.28571 20 125
## 4 45 33.22581 50.28571 20 125
## 5 45 33.22581 50.28571 20 125
## 6 45 33.22581 50.28571 20 125
## 7 45 33.22581 50.28571 20 125
## 8 45 33.22581 50.28571 20 125
## 9 45 33.22581 50.28571 20 125
## 10 45 33.22581 50.28571 20 125
## 11 45 33.22581 50.28571 20 125
## 12 45 33.22581 50.28571 20 125
## 13 45 33.22581 50.28571 20 125
## 14 45 33.22581 50.28571 20 125
## 15 45 33.22581 50.28571 20 125
## 16 45 33.22581 50.28571 20 125
## 17 45 33.22581 50.28571 20 125
## 18 45 33.22581 50.28571 20 125
## 20 45 33.22581 50.28571 20 125
## 21 45 33.22581 50.28571 20 125
## 22 45 33.22581 50.28571 20 125
## 23 45 33.22581 50.28571 20 125
## 25 45 33.22581 50.28571 20 125
## 26 45 33.22581 50.28571 20 125
## 27 45 33.22581 50.28571 20 125
## 28 45 33.22581 50.28571 20 125
## 30 45 33.22581 50.28571 20 125
## 31 45 33.22581 50.28571 20 125
## 32 45 33.22581 50.28571 20 125
## 33 45 33.22581 50.28571 20 125
## 35 45 33.22581 50.28571 20 125
##
## [[7]]
## city state
## 1 Atlanta GA
## 2 Atlanta GA
## 3 Atlanta GA
## 4 Atlanta GA
## 5 Atlanta GA
## 6 Atlanta GA
## 7 Atlanta GA
## 8 Atlanta GA
## 9 Atlanta GA
## 10 Atlanta GA
## 11 Atlanta GA
## 12 Atlanta GA
## 13 Atlanta GA
## 14 Atlanta GA
## 15 Atlanta GA
## 16 Atlanta GA
## 17 Atlanta GA
## 18 Atlanta GA
## 19 Atlanta GA
## 20 Atlanta GA
## 21 Atlanta GA
## 22 Atlanta GA
## 23 Atlanta GA
## 24 Atlanta GA
## 25 Atlanta GA
## 26 Atlanta GA
## 27 Atlanta GA
## 28 Atlanta GA
## 29 Atlanta GA
## 30 Atlanta GA
## 31 Atlanta GA
## 32 Atlanta GA
## 33 Atlanta GA
## 34 Atlanta GA
## 35 Atlanta GA
## 36 Atlanta GA
## 37 Atlanta GA
## 38 Atlanta GA
## 39 Atlanta GA
## 40 Atlanta GA
## 41 Atlanta GA
## 42 Atlanta GA
## 43 Atlanta GA
## 44 Atlanta GA
## 45 Atlanta GA
## 46 Atlanta GA
## 47 Atlanta GA
## 48 Atlanta GA
## 49 Atlanta GA
## 50 Atlanta GA
## 51 Atlanta GA
## 52 Atlanta GA
## 53 Atlanta GA
## 54 Atlanta GA
## 55 Atlanta GA
## 56 Atlanta GA
## 57 Atlanta GA
## 58 Atlanta GA
## 59 Atlanta GA
## 60 Atlanta GA
## 61 Atlanta GA
## 62 Atlanta GA
## 63 Atlanta GA
## 64 Atlanta GA
## 65 Atlanta GA
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 3 Licensed Massage Therapist - - $$1500 SIGN ON BONUS$$
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist (LMT) - Must be available weekend...
## 6 Licensed Massage Therapist
## 7 ATL: Licensed Massage Therapist-$60-$93/hour: Corporation &...
## 8 Licensed Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist - Passionate Healer
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist, Esthetician
## 13 Licensed Massage Therapist - Passionate Healer
## 14 Massage Therapist- Good Pay! Paid Vacation! Free Massages! A...
## 15 Licensed Massage Therapist
## 16 Massage Therapist - Full Time
## 17 Massage Therapist
## 18 Massage Therapist- Full or Part Time (Atlanta, GA)
## 19 Mobile Massage Therapist
## 20 Massage Therapist - Independent Contractor Full or Part time
## 21 Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 LICENSED MASSAGE THERAPIST WANTED!!!!
## 26 Licensed Massage Therapist
## 27 Massage Therapist
## 28 Massage Therapist Full and Part Time Available
## 29 Passionate Licensed Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Massage Therapist IMMEDIATE OPENING
## 32 LifeSpa Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 LICENSED MASSAGE THERAPIST WANTED!!!!
## 36 Passionate Licensed Massage Therapist
## 37 Licensed Massage Therapist, Independent Contractor
## 38 Massage Therapist - Massage Envy Tucker Meridian
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist - Independent Contractor
## 42 Massage Services Associate
## 43 Massage Therapist- Good Pay! Paid Vacation! Free Massages! A...
## 44 Massage Therapist Full or Part Time
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist [CUSTOMIZATION REQUIRED]
## 48 Massage Therapist - Great Pay! COVID-19 Guest Process! Posit...
## 49 Neuromuscular Massage Therapist (LMT) - Full or Part Time
## 50 Total Body Stretch Service Provider
## 51 Passionate Licensed Massage Therapist
## 52 Licensed Massage Therapist, Independent Contractor
## 53 Massage Therapist - Massage Envy Tucker Meridian
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Massage Therapist - Independent Contractor
## 57 Massage Services Associate
## 58 Massage Therapist- Good Pay! Paid Vacation! Free Massages! A...
## 59 Massage Therapist Full or Part Time
## 60 Licensed Massage Therapist (LMT)
## 61 Licensed Massage Therapist
## 62 Massage Therapist [CUSTOMIZATION REQUIRED]
## 63 Massage Therapist - Great Pay! COVID-19 Guest Process! Posit...
## 64 Neuromuscular Massage Therapist (LMT) - Full or Part Time
## 65 Total Body Stretch Service Provider
## HiringAgency
## 1 Atlanta Center for Cosmetic DentistryAtlanta, GA 30342 (Buckhead area)
## 2 Ramsey InsightAtlanta, GA
## 3 Massage Heights Buckhead3.1Atlanta, GA 30305 (Peachtree Heights West area)
## 4 Spa in BuckheadAtlanta, GA 30305 (Buckhead Village area)
## 5 Journey Family ChiropracticRoswell, GA 30076
## 6 100% Chiropractic4.0Roswell, GA 30075
## 7 Spa Utopia (Luxury - On-demand Spa)2.0Atlanta, GA
## 8 Soothe3.7Atlanta, GA
## 9 Sipping Prettea Tea BarAtlanta, GA 30310 (Oakland City area)
## 10 Ramsey InsightAtlanta, GA
## 11 Heal Thyself AtlantaAtlanta, GA (Grant Park area)
## 12 Mezz SpaAlpharetta, GA 30009
## 13 Atlanta MassageDecatur, GA
## 14 LaVida Massage3.7Alpharetta, GA 30004
## 15 Buckhead Grand SpaAtlanta, GA 30326 (North Buckhead area)
## 16 Life Time3.6Sandy Springs, GA 30342 (Buckhead area)+2 locations
## 17 Massage Envy3.2Atlanta, GA 30305 (Buckhead area)+11 locations
## 18 The NOW, LLCAtlanta, GA 30303 (Five Points area)
## 19 Indo-Pak Massage TherapyAtlanta, GA+1 location
## 20 Milton Chiropractic & MassageMilton, GA 30004
## 21 Choice One Health CenterDuluth, GA 30096
## 22 Divine Harmony Massage Therapy3.0Roswell, GA 30076
## 23 Spavia Day Spa3.3Alpharetta, GA 30022+1 location
## 24 The Art of Touch MassageAtlanta, GA 30308 (Midtown area)
## 25 LaVida Massage3.7Sandy Springs, GA 30328 (Downtown area)
## 26 Hand and Stone Massage and Facial Spa3.0Fayetteville, GA 30214
## 27 The Woodhouse Day Spa - Dunwoody3.3Atlanta, GA 30346
## 28 The Woodhouse Day Spa - AvalonAlpharetta, GA 30009
## 29 Massage Heights - Atlanta3.1Atlanta, GA 30305 (Buckhead area)
## 30 Be the light chiropracticDuluth, GA 30096
## 31 Medi Spa3.4Marietta, GA
## 32 Life Time3.6Lawrenceville, GA 30024
## 33 Hand and Stone Massage and Facial Spa3.0Fayetteville, GA 30214
## 34 Spa Stinny4.5Snellville, GA 30078
## 35 LaVida Massage3.7Sandy Springs, GA 30328 (Downtown area)
## 36 Massage Heights3.1Atlanta, GA 30305 (Buckhead area)
## 37 Crown2Sole Therapeutic & Rehabilitative MassageJonesboro, GA 30236
## 38 Massage Envy3.2Tucker, GA 30084
## 39 Choice One Health CenterDuluth, GA 30096
## 40 Massage Envy3.2Atlanta, GA 30318 (Berkeley Park area)+1 location
## 41 Progressive Healthcare of Gwinnett5.0Lilburn, GA 30047
## 42 Power Wellness3.1Fayetteville, GA 30214
## 43 LaVida Massage3.7Alpharetta, GA 30004
## 44 Massage Envy3.2Kennesaw, GA 30144
## 45 Dominant PerformanceFayetteville, GA
## 46 Dominant PerformanceFayetteville, GA
## 47 Massage Envy3.2Woodstock, GA 30189
## 48 LaVida Massage3.7Johns Creek, GA 30022
## 49 MAC Day SpaMarietta, GA 30064
## 50 Massage Envy3.2Marietta, GA 30067
## 51 Massage Heights3.1Atlanta, GA 30305 (Buckhead area)
## 52 Crown2Sole Therapeutic & Rehabilitative MassageJonesboro, GA 30236
## 53 Massage Envy3.2Tucker, GA 30084
## 54 Massage Envy3.2Atlanta, GA 30318 (Berkeley Park area)+1 location
## 55 Choice One Health CenterDuluth, GA 30096
## 56 Progressive Healthcare of Gwinnett5.0Lilburn, GA 30047
## 57 Power Wellness3.1Fayetteville, GA 30214
## 58 LaVida Massage3.7Alpharetta, GA 30004
## 59 Massage Envy3.2Kennesaw, GA 30144
## 60 Massage SolutionsMcDonough, GA 30253
## 61 Dominant PerformanceFayetteville, GA
## 62 Massage Envy3.2Woodstock, GA 30189
## 63 LaVida Massage3.7Johns Creek, GA 30022
## 64 MAC Day SpaMarietta, GA 30064
## 65 Massage Envy3.2Marietta, GA 30067
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 7 20 125 25000 60000
## 2 1 20 125 25000 60000
## 3 30 20 125 25000 60000
## 4 30 20 125 25000 60000
## 5 4 20 125 25000 60000
## 6 30 20 125 25000 60000
## 7 Just posted 20 125 25000 60000
## 8 24 20 125 25000 60000
## 9 Today 20 125 25000 60000
## 10 2 20 125 25000 60000
## 11 30 20 125 25000 60000
## 12 11 20 125 25000 60000
## 13 2 20 125 25000 60000
## 14 30 20 125 25000 60000
## 15 19 20 125 25000 60000
## 16 30 20 125 25000 60000
## 17 30 20 125 25000 60000
## 18 30 20 125 25000 60000
## 19 30 20 125 25000 60000
## 20 13 20 125 25000 60000
## 21 15 20 125 25000 60000
## 22 24 20 125 25000 60000
## 23 14 20 125 25000 60000
## 24 5 20 125 25000 60000
## 25 30 20 125 25000 60000
## 26 30 20 125 25000 60000
## 27 6 20 125 25000 60000
## 28 7 20 125 25000 60000
## 29 8 20 125 25000 60000
## 30 13 20 125 25000 60000
## 31 20 20 125 25000 60000
## 32 30 20 125 25000 60000
## 33 30 20 125 25000 60000
## 34 3 20 125 25000 60000
## 35 30 20 125 25000 60000
## 36 30 20 125 25000 60000
## 37 9 20 125 25000 60000
## 38 30 20 125 25000 60000
## 39 29 20 125 25000 60000
## 40 30 20 125 25000 60000
## 41 19 20 125 25000 60000
## 42 22 20 125 25000 60000
## 43 30 20 125 25000 60000
## 44 30 20 125 25000 60000
## 45 30 20 125 25000 60000
## 46 30 20 125 25000 60000
## 47 30 20 125 25000 60000
## 48 30 20 125 25000 60000
## 49 30 20 125 25000 60000
## 50 30 20 125 25000 60000
## 51 30 20 125 25000 60000
## 52 9 20 125 25000 60000
## 53 30 20 125 25000 60000
## 54 30 20 125 25000 60000
## 55 29 20 125 25000 60000
## 56 19 20 125 25000 60000
## 57 22 20 125 25000 60000
## 58 30 20 125 25000 60000
## 59 30 20 125 25000 60000
## 60 26 20 125 25000 60000
## 61 30 20 125 25000 60000
## 62 30 20 125 25000 60000
## 63 30 20 125 25000 60000
## 64 30 20 125 25000 60000
## 65 30 20 125 25000 60000
getIndeedJobData5pages("massage therapist","Augusta","GA")
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist - Independent Contractor
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Massage Therapist
## 15 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5000 8500 5000 8500 5000
## 2 5000 8500 5000 8500 5000
## 3 5000 8500 5000 8500 5000
## 4 5000 8500 5000 8500 5000
## 5 5000 8500 5000 8500 5000
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
##
## [[3]]
## date_daysAgo
## 1 5
## 2 30
## 3 30
## 4 5
## 5 30
## 6 30
## 7 5
## 8 30
## 9 30
## 10 5
## 11 30
## 12 30
## 13 5
## 14 30
## 15 30
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyAugusta, GA•Remote work available
## 2 THE WILLCOX HOTEL3.0Aiken, SC 29801
## 3 Massage Envy3.2Augusta, GA 30909 (West Augusta area)
## 4 Indo-Pak Massage TherapyAugusta, GA•Remote work available
## 5 THE WILLCOX HOTEL3.0Aiken, SC 29801
## 6 Massage Envy3.2Augusta, GA 30909 (West Augusta area)
## 7 Indo-Pak Massage TherapyAugusta, GA•Remote work available
## 8 THE WILLCOX HOTEL3.0Aiken, SC 29801
## 9 Massage Envy3.2Augusta, GA 30909 (West Augusta area)
## 10 Indo-Pak Massage TherapyAugusta, GA•Remote work available
## 11 THE WILLCOX HOTEL3.0Aiken, SC 29801
## 12 Massage Envy3.2Augusta, GA 30909 (West Augusta area)
## 13 Indo-Pak Massage TherapyAugusta, GA•Remote work available
## 14 THE WILLCOX HOTEL3.0Aiken, SC 29801
## 15 Massage Envy3.2Augusta, GA 30909 (West Augusta area)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Augusta GA Massage Therapist - Independent Contractor
## 2 Augusta GA Massage Therapist
## 3 Augusta GA Massage Therapist
## 4 Augusta GA Massage Therapist - Independent Contractor
## 5 Augusta GA Massage Therapist
## 6 Augusta GA Massage Therapist
## 7 Augusta GA Massage Therapist - Independent Contractor
## 8 Augusta GA Massage Therapist
## 9 Augusta GA Massage Therapist
## 10 Augusta GA Massage Therapist - Independent Contractor
## 11 Augusta GA Massage Therapist
## 12 Augusta GA Massage Therapist
## 13 Augusta GA Massage Therapist - Independent Contractor
## 14 Augusta GA Massage Therapist
## 15 Augusta GA Massage Therapist
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyAugusta, GA•Remote work available 5
## 2 THE WILLCOX HOTEL3.0Aiken, SC 29801 30
## 3 Massage Envy3.2Augusta, GA 30909 (West Augusta area) 30
## 4 Indo-Pak Massage TherapyAugusta, GA•Remote work available 5
## 5 THE WILLCOX HOTEL3.0Aiken, SC 29801 30
## 6 Massage Envy3.2Augusta, GA 30909 (West Augusta area) 30
## 7 Indo-Pak Massage TherapyAugusta, GA•Remote work available 5
## 8 THE WILLCOX HOTEL3.0Aiken, SC 29801 30
## 9 Massage Envy3.2Augusta, GA 30909 (West Augusta area) 30
## 10 Indo-Pak Massage TherapyAugusta, GA•Remote work available 5
## 11 THE WILLCOX HOTEL3.0Aiken, SC 29801 30
## 12 Massage Envy3.2Augusta, GA 30909 (West Augusta area) 30
## 13 Indo-Pak Massage TherapyAugusta, GA•Remote work available 5
## 14 THE WILLCOX HOTEL3.0Aiken, SC 29801 30
## 15 Massage Envy3.2Augusta, GA 30909 (West Augusta area) 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
## 6 NA NA NA NA
## 7 NA NA NA NA
## 8 NA NA NA NA
## 9 NA NA NA NA
## 10 NA NA NA NA
## 11 NA NA NA NA
## 12 NA NA NA NA
## 13 NA NA NA NA
## 14 NA NA NA NA
## 15 NA NA NA NA
getIndeedJobData5pages("massage therapist","Columbus","GA")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Licensed Massage Therapist (LMT)
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$40 - $70 a day $40 - $70 40 70 40
## 2 \n$40 - $70 a day $40 - $70 40 70 40
## 3 \n$40 - $70 a day $40 - $70 40 70 40
## 4 \n$40 - $70 a day $40 - $70 40 70 40
## 5 \n$40 - $70 a day $40 - $70 40 70 40
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 55 40 55 40 70
## 2 55 40 55 40 70
## 3 55 40 55 40 70
## 4 55 40 55 40 70
## 5 55 40 55 40 70
##
## [[3]]
## date_daysAgo
## 1 13
## 2 30
## 3 30
## 4 13
## 5 30
## 6 13
## 7 13
## 8 30
## 9 30
## 10 13
##
## [[4]]
## HiringAgency
## 1 Earthwind MassageColumbus, GA 31904
## 2 Massage Envy3.2Columbus, GA 31904
## 3 Massage Envy3.2Columbus, GA 31904
## 4 Earthwind MassageColumbus, GA 31904
## 5 Massage Envy3.2Columbus, GA 31904
## 6 Earthwind MassageColumbus, GA 31904
## 7 Earthwind MassageColumbus, GA 31904
## 8 Massage Envy3.2Columbus, GA 31904
## 9 Massage Envy3.2Columbus, GA 31904
## 10 Earthwind MassageColumbus, GA 31904
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Columbus GA Licensed Massage Therapist (LMT)
## 2 Columbus GA Massage Therapist
## 3 Columbus GA Massage Therapist
## 4 Columbus GA Licensed Massage Therapist (LMT)
## 5 Columbus GA Massage Therapist
## 6 Columbus GA Licensed Massage Therapist (LMT)
## 7 Columbus GA Licensed Massage Therapist (LMT)
## 8 Columbus GA Massage Therapist
## 9 Columbus GA Massage Therapist
## 10 Columbus GA Licensed Massage Therapist (LMT)
## HiringAgency date_daysAgo MinHourlySalary
## 1 Earthwind MassageColumbus, GA 31904 13 NA
## 2 Massage Envy3.2Columbus, GA 31904 30 NA
## 3 Massage Envy3.2Columbus, GA 31904 30 NA
## 4 Earthwind MassageColumbus, GA 31904 13 NA
## 5 Massage Envy3.2Columbus, GA 31904 30 NA
## 6 Earthwind MassageColumbus, GA 31904 13 NA
## 7 Earthwind MassageColumbus, GA 31904 13 NA
## 8 Massage Envy3.2Columbus, GA 31904 30 NA
## 9 Massage Envy3.2Columbus, GA 31904 30 NA
## 10 Earthwind MassageColumbus, GA 31904 13 NA
## MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA
## 2 NA NA NA
## 3 NA NA NA
## 4 NA NA NA
## 5 NA NA NA
## 6 NA NA NA
## 7 NA NA NA
## 8 NA NA NA
## 9 NA NA NA
## 10 NA NA NA
Hawaii Honolulu, East Honolulu, Hilo
getIndeedJobData5pages("massage therapist","Honolulu","HI")
## Warning in getIndeedJobData5pages("massage therapist", "Honolulu", "HI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Honolulu", "HI"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist (per diem, up to 40 hours/week)
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Massage Therapist - Independent Contractor
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Massage Therapist
## 9 Massage Therapist (per diem, up to 40 hours/week)
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 Massage Therapist
## 17 Licensed Massage Therapist (LMT)
## 18 Massage Therapist - Independent Contractor
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Licensed Massage Therapist (LMT)
## 22 Massage Therapist
## 23 Massage Therapist (per diem, up to 40 hours/week)
## 24 Licensed Massage Therapist
## 25 Massage Therapist (per diem, up to 40 hours/week)
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist (LMT)
## 28 Massage Therapist - Independent Contractor
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Massage Therapist
## 33 Massage Therapist (per diem, up to 40 hours/week)
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist (LMT)
## 36 Massage Therapist - Independent Contractor
## 37 Licensed Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist (LMT)
## 40 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30 an hour $30 30 NA
## 2 \n$27 - $38 an hour $27 - $38 27 38
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$30 - $50 an hour $30 - $50 30 50
## 5 \n$30 - $35 an hour $30 - $35 30 35
## 6 \n$27 - $38 an hour $27 - $38 27 38
## 7 \n$30 an hour $30 30 NA
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$30 - $50 an hour $30 - $50 30 50
## 10 \n$30 - $35 an hour $30 - $35 30 35
## 11 \n$30 an hour $30 30 NA
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$30 - $50 an hour $30 - $50 30 50
## 14 \n$30 - $35 an hour $30 - $35 30 35
## 15 \n$27 - $38 an hour $27 - $38 27 38
## 16 \n$27 - $38 an hour $27 - $38 27 38
## 17 \n$30 an hour $30 30 NA
## 18 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 19 \n$30 - $50 an hour $30 - $50 30 50
## 20 \n$30 - $35 an hour $30 - $35 30 35
## 21 \n$27 - $38 an hour $27 - $38 27 38
## 22 \n$30 an hour $30 30 NA
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 24 \n$30 - $50 an hour $30 - $50 30 50
## 25 \n$30 - $35 an hour $30 - $35 30 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 35 1023.4 1915.556 27
## 2 30 35 1023.4 1915.556 27
## 3 30 35 1023.4 1915.556 27
## 4 30 35 1023.4 1915.556 27
## 5 30 35 1023.4 1915.556 27
## 6 30 35 1023.4 1915.556 27
## 7 30 35 1023.4 1915.556 27
## 8 30 35 1023.4 1915.556 27
## 9 30 35 1023.4 1915.556 27
## 10 30 35 1023.4 1915.556 27
## 11 30 35 1023.4 1915.556 27
## 12 30 35 1023.4 1915.556 27
## 13 30 35 1023.4 1915.556 27
## 14 30 35 1023.4 1915.556 27
## 15 30 35 1023.4 1915.556 27
## 16 30 35 1023.4 1915.556 27
## 17 30 35 1023.4 1915.556 27
## 18 30 35 1023.4 1915.556 27
## 19 30 35 1023.4 1915.556 27
## 20 30 35 1023.4 1915.556 27
## 21 30 35 1023.4 1915.556 27
## 22 30 35 1023.4 1915.556 27
## 23 30 35 1023.4 1915.556 27
## 24 30 35 1023.4 1915.556 27
## 25 30 35 1023.4 1915.556 27
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
##
## [[3]]
## date_daysAgo
## 1 6
## 2 17
## 3 6
## 4 17
## 5 20
## 6 6
## 7 30
## 8 30
## 9 6
## 10 6
## 11 17
## 12 17
## 13 20
## 14 6
## 15 30
## 16 30
## 17 17
## 18 17
## 19 20
## 20 6
## 21 30
## 22 30
## 23 6
## 24 6
## 25 6
## 26 6
## 27 17
## 28 17
## 29 20
## 30 6
## 31 30
## 32 30
## 33 6
## 34 6
## 35 17
## 36 17
## 37 20
## 38 6
## 39 30
## 40 30
##
## [[4]]
## HiringAgency
## 1 Navian HawaiiHonolulu, HI
## 2 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 3 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 4 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 5 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 6 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 7 Kailua Wellness CenterKailua, HI 96734
## 8 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 9 Navian HawaiiHonolulu, HI
## 10 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 11 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 12 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 13 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 14 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 15 Kailua Wellness CenterKailua, HI 96734
## 16 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 17 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 18 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 19 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 20 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 21 Kailua Wellness CenterKailua, HI 96734
## 22 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 23 Navian HawaiiHonolulu, HI
## 24 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 25 Navian HawaiiHonolulu, HI
## 26 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 27 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 28 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 29 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 30 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 31 Kailua Wellness CenterKailua, HI 96734
## 32 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 33 Navian HawaiiHonolulu, HI
## 34 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 35 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 36 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 37 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 38 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 39 Kailua Wellness CenterKailua, HI 96734
## 40 Massage Envy3.2Kaneohe, HI 96744+3 locations
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 an hour $30 30 NA 30
## 2 \n$27 - $38 an hour $27 - $38 27 38 30
## 4 \n$30 - $50 an hour $30 - $50 30 50 30
## 5 \n$30 - $35 an hour $30 - $35 30 35 30
## 6 \n$27 - $38 an hour $27 - $38 27 38 30
## 7 \n$30 an hour $30 30 NA 30
## 9 \n$30 - $50 an hour $30 - $50 30 50 30
## 10 \n$30 - $35 an hour $30 - $35 30 35 30
## 11 \n$30 an hour $30 30 NA 30
## 13 \n$30 - $50 an hour $30 - $50 30 50 30
## 14 \n$30 - $35 an hour $30 - $35 30 35 30
## 15 \n$27 - $38 an hour $27 - $38 27 38 30
## 16 \n$27 - $38 an hour $27 - $38 27 38 30
## 17 \n$30 an hour $30 30 NA 30
## 19 \n$30 - $50 an hour $30 - $50 30 50 30
## 20 \n$30 - $35 an hour $30 - $35 30 35 30
## 21 \n$27 - $38 an hour $27 - $38 27 38 30
## 22 \n$30 an hour $30 30 NA 30
## 24 \n$30 - $50 an hour $30 - $50 30 50 30
## 25 \n$30 - $35 an hour $30 - $35 30 35 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 38 29.25 41 27 50
## 2 38 29.25 41 27 50
## 4 38 29.25 41 27 50
## 5 38 29.25 41 27 50
## 6 38 29.25 41 27 50
## 7 38 29.25 41 27 50
## 9 38 29.25 41 27 50
## 10 38 29.25 41 27 50
## 11 38 29.25 41 27 50
## 13 38 29.25 41 27 50
## 14 38 29.25 41 27 50
## 15 38 29.25 41 27 50
## 16 38 29.25 41 27 50
## 17 38 29.25 41 27 50
## 19 38 29.25 41 27 50
## 20 38 29.25 41 27 50
## 21 38 29.25 41 27 50
## 22 38 29.25 41 27 50
## 24 38 29.25 41 27 50
## 25 38 29.25 41 27 50
##
## [[7]]
## city state jobTitle
## 1 Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 2 Honolulu HI Licensed Massage Therapist (LMT)
## 3 Honolulu HI Licensed Massage Therapist
## 4 Honolulu HI Massage Therapist - Independent Contractor
## 5 Honolulu HI Licensed Massage Therapist
## 6 Honolulu HI Massage Therapist
## 7 Honolulu HI Licensed Massage Therapist (LMT)
## 8 Honolulu HI Massage Therapist
## 9 Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 10 Honolulu HI Licensed Massage Therapist
## 11 Honolulu HI Licensed Massage Therapist (LMT)
## 12 Honolulu HI Massage Therapist - Independent Contractor
## 13 Honolulu HI Licensed Massage Therapist
## 14 Honolulu HI Massage Therapist
## 15 Honolulu HI Licensed Massage Therapist (LMT)
## 16 Honolulu HI Massage Therapist
## 17 Honolulu HI Licensed Massage Therapist (LMT)
## 18 Honolulu HI Massage Therapist - Independent Contractor
## 19 Honolulu HI Licensed Massage Therapist
## 20 Honolulu HI Massage Therapist
## 21 Honolulu HI Licensed Massage Therapist (LMT)
## 22 Honolulu HI Massage Therapist
## 23 Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 24 Honolulu HI Licensed Massage Therapist
## 25 Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 26 Honolulu HI Licensed Massage Therapist
## 27 Honolulu HI Licensed Massage Therapist (LMT)
## 28 Honolulu HI Massage Therapist - Independent Contractor
## 29 Honolulu HI Licensed Massage Therapist
## 30 Honolulu HI Massage Therapist
## 31 Honolulu HI Licensed Massage Therapist (LMT)
## 32 Honolulu HI Massage Therapist
## 33 Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 34 Honolulu HI Licensed Massage Therapist
## 35 Honolulu HI Licensed Massage Therapist (LMT)
## 36 Honolulu HI Massage Therapist - Independent Contractor
## 37 Honolulu HI Licensed Massage Therapist
## 38 Honolulu HI Massage Therapist
## 39 Honolulu HI Licensed Massage Therapist (LMT)
## 40 Honolulu HI Massage Therapist
## HiringAgency
## 1 Navian HawaiiHonolulu, HI
## 2 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 3 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 4 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 5 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 6 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 7 Kailua Wellness CenterKailua, HI 96734
## 8 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 9 Navian HawaiiHonolulu, HI
## 10 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 11 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 12 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 13 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 14 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 15 Kailua Wellness CenterKailua, HI 96734
## 16 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 17 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 18 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 19 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 20 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 21 Kailua Wellness CenterKailua, HI 96734
## 22 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 23 Navian HawaiiHonolulu, HI
## 24 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 25 Navian HawaiiHonolulu, HI
## 26 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 27 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 28 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 29 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 30 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 31 Kailua Wellness CenterKailua, HI 96734
## 32 Massage Envy3.2Kaneohe, HI 96744+3 locations
## 33 Navian HawaiiHonolulu, HI
## 34 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 35 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 36 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 37 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 38 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 39 Kailua Wellness CenterKailua, HI 96734
## 40 Massage Envy3.2Kaneohe, HI 96744+3 locations
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 27 50 NA NA
## 2 17 27 50 NA NA
## 3 6 27 50 NA NA
## 4 17 27 50 NA NA
## 5 20 27 50 NA NA
## 6 6 27 50 NA NA
## 7 30 27 50 NA NA
## 8 30 27 50 NA NA
## 9 6 27 50 NA NA
## 10 6 27 50 NA NA
## 11 17 27 50 NA NA
## 12 17 27 50 NA NA
## 13 20 27 50 NA NA
## 14 6 27 50 NA NA
## 15 30 27 50 NA NA
## 16 30 27 50 NA NA
## 17 17 27 50 NA NA
## 18 17 27 50 NA NA
## 19 20 27 50 NA NA
## 20 6 27 50 NA NA
## 21 30 27 50 NA NA
## 22 30 27 50 NA NA
## 23 6 27 50 NA NA
## 24 6 27 50 NA NA
## 25 6 27 50 NA NA
## 26 6 27 50 NA NA
## 27 17 27 50 NA NA
## 28 17 27 50 NA NA
## 29 20 27 50 NA NA
## 30 6 27 50 NA NA
## 31 30 27 50 NA NA
## 32 30 27 50 NA NA
## 33 6 27 50 NA NA
## 34 6 27 50 NA NA
## 35 17 27 50 NA NA
## 36 17 27 50 NA NA
## 37 20 27 50 NA NA
## 38 6 27 50 NA NA
## 39 30 27 50 NA NA
## 40 30 27 50 NA NA
getIndeedJobData5pages("massage therapist","East Honolulu","HI")
## Warning in getIndeedJobData5pages("massage therapist", "East Honolulu", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "East Honolulu", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist (per diem, up to 40 hours/week)
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Massage Therapist - Independent Contractor
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Massage Therapist
## 9 Massage Therapist (per diem, up to 40 hours/week)
## 10 Licensed Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist (per diem, up to 40 hours/week)
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist
## 20 Massage Therapist - Independent Contractor
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist - Independent Contractor
## 27 Licensed Massage Therapist
## 28 Massage Therapist
## 29 Licensed Massage Therapist (LMT)
## 30 Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Massage Therapist (per diem, up to 40 hours/week)
## 33 Massage Therapist (per diem, up to 40 hours/week)
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist
## 36 Massage Therapist - Independent Contractor
## 37 Licensed Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist (LMT)
## 40 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30 an hour $30 30 NA
## 2 \n$27 - $38 an hour $27 - $38 27 38
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$30 - $50 an hour $30 - $50 30 50
## 5 \n$30 - $35 an hour $30 - $35 30 35
## 6 \n$27 - $38 an hour $27 - $38 27 38
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$30 - $50 an hour $30 - $50 30 50
## 9 \n$30 - $35 an hour $30 - $35 30 35
## 10 \n$30 an hour $30 30 NA
## 11 \n$30 an hour $30 30 NA
## 12 \n$27 - $38 an hour $27 - $38 27 38
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$30 - $50 an hour $30 - $50 30 50
## 15 \n$30 - $35 an hour $30 - $35 30 35
## 16 \n$27 - $38 an hour $27 - $38 27 38
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$30 - $50 an hour $30 - $50 30 50
## 19 \n$30 - $35 an hour $30 - $35 30 35
## 20 \n$30 an hour $30 30 NA
## 21 \n$30 an hour $30 30 NA
## 22 \n$27 - $38 an hour $27 - $38 27 38
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 24 \n$30 - $50 an hour $30 - $50 30 50
## 25 \n$30 - $35 an hour $30 - $35 30 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 35 1023.4 1915.556 27
## 2 30 35 1023.4 1915.556 27
## 3 30 35 1023.4 1915.556 27
## 4 30 35 1023.4 1915.556 27
## 5 30 35 1023.4 1915.556 27
## 6 30 35 1023.4 1915.556 27
## 7 30 35 1023.4 1915.556 27
## 8 30 35 1023.4 1915.556 27
## 9 30 35 1023.4 1915.556 27
## 10 30 35 1023.4 1915.556 27
## 11 30 35 1023.4 1915.556 27
## 12 30 35 1023.4 1915.556 27
## 13 30 35 1023.4 1915.556 27
## 14 30 35 1023.4 1915.556 27
## 15 30 35 1023.4 1915.556 27
## 16 30 35 1023.4 1915.556 27
## 17 30 35 1023.4 1915.556 27
## 18 30 35 1023.4 1915.556 27
## 19 30 35 1023.4 1915.556 27
## 20 30 35 1023.4 1915.556 27
## 21 30 35 1023.4 1915.556 27
## 22 30 35 1023.4 1915.556 27
## 23 30 35 1023.4 1915.556 27
## 24 30 35 1023.4 1915.556 27
## 25 30 35 1023.4 1915.556 27
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
##
## [[3]]
## date_daysAgo
## 1 6
## 2 17
## 3 6
## 4 17
## 5 20
## 6 6
## 7 30
## 8 24
## 9 6
## 10 6
## 11 17
## 12 20
## 13 6
## 14 30
## 15 24
## 16 17
## 17 6
## 18 17
## 19 6
## 20 17
## 21 20
## 22 6
## 23 30
## 24 24
## 25 6
## 26 17
## 27 20
## 28 6
## 29 30
## 30 24
## 31 17
## 32 6
## 33 6
## 34 17
## 35 6
## 36 17
## 37 20
## 38 6
## 39 30
## 40 24
##
## [[4]]
## HiringAgency
## 1 Navian HawaiiHonolulu, HI
## 2 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 3 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 4 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 5 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 6 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 7 Kailua Wellness CenterKailua, HI 96734
## 8 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 9 Navian HawaiiHonolulu, HI
## 10 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 11 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 12 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 13 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 14 Kailua Wellness CenterKailua, HI 96734
## 15 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 16 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 17 Navian HawaiiHonolulu, HI
## 18 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 19 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 20 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 21 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 22 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 23 Kailua Wellness CenterKailua, HI 96734
## 24 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 25 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 26 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 27 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 28 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 29 Kailua Wellness CenterKailua, HI 96734
## 30 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 31 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 32 Navian HawaiiHonolulu, HI
## 33 Navian HawaiiHonolulu, HI
## 34 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 35 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 36 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 37 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 38 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 39 Kailua Wellness CenterKailua, HI 96734
## 40 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 an hour $30 30 NA 30
## 2 \n$27 - $38 an hour $27 - $38 27 38 30
## 4 \n$30 - $50 an hour $30 - $50 30 50 30
## 5 \n$30 - $35 an hour $30 - $35 30 35 30
## 6 \n$27 - $38 an hour $27 - $38 27 38 30
## 8 \n$30 - $50 an hour $30 - $50 30 50 30
## 9 \n$30 - $35 an hour $30 - $35 30 35 30
## 10 \n$30 an hour $30 30 NA 30
## 11 \n$30 an hour $30 30 NA 30
## 12 \n$27 - $38 an hour $27 - $38 27 38 30
## 14 \n$30 - $50 an hour $30 - $50 30 50 30
## 15 \n$30 - $35 an hour $30 - $35 30 35 30
## 16 \n$27 - $38 an hour $27 - $38 27 38 30
## 18 \n$30 - $50 an hour $30 - $50 30 50 30
## 19 \n$30 - $35 an hour $30 - $35 30 35 30
## 20 \n$30 an hour $30 30 NA 30
## 21 \n$30 an hour $30 30 NA 30
## 22 \n$27 - $38 an hour $27 - $38 27 38 30
## 24 \n$30 - $50 an hour $30 - $50 30 50 30
## 25 \n$30 - $35 an hour $30 - $35 30 35 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 38 29.25 41 27 50
## 2 38 29.25 41 27 50
## 4 38 29.25 41 27 50
## 5 38 29.25 41 27 50
## 6 38 29.25 41 27 50
## 8 38 29.25 41 27 50
## 9 38 29.25 41 27 50
## 10 38 29.25 41 27 50
## 11 38 29.25 41 27 50
## 12 38 29.25 41 27 50
## 14 38 29.25 41 27 50
## 15 38 29.25 41 27 50
## 16 38 29.25 41 27 50
## 18 38 29.25 41 27 50
## 19 38 29.25 41 27 50
## 20 38 29.25 41 27 50
## 21 38 29.25 41 27 50
## 22 38 29.25 41 27 50
## 24 38 29.25 41 27 50
## 25 38 29.25 41 27 50
##
## [[7]]
## city state jobTitle
## 1 East Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 2 East Honolulu HI Licensed Massage Therapist (LMT)
## 3 East Honolulu HI Licensed Massage Therapist
## 4 East Honolulu HI Massage Therapist - Independent Contractor
## 5 East Honolulu HI Licensed Massage Therapist
## 6 East Honolulu HI Massage Therapist
## 7 East Honolulu HI Licensed Massage Therapist (LMT)
## 8 East Honolulu HI Massage Therapist
## 9 East Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 10 East Honolulu HI Licensed Massage Therapist
## 11 East Honolulu HI Massage Therapist - Independent Contractor
## 12 East Honolulu HI Licensed Massage Therapist
## 13 East Honolulu HI Massage Therapist
## 14 East Honolulu HI Licensed Massage Therapist (LMT)
## 15 East Honolulu HI Massage Therapist
## 16 East Honolulu HI Licensed Massage Therapist (LMT)
## 17 East Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 18 East Honolulu HI Licensed Massage Therapist (LMT)
## 19 East Honolulu HI Licensed Massage Therapist
## 20 East Honolulu HI Massage Therapist - Independent Contractor
## 21 East Honolulu HI Licensed Massage Therapist
## 22 East Honolulu HI Massage Therapist
## 23 East Honolulu HI Licensed Massage Therapist (LMT)
## 24 East Honolulu HI Massage Therapist
## 25 East Honolulu HI Licensed Massage Therapist
## 26 East Honolulu HI Massage Therapist - Independent Contractor
## 27 East Honolulu HI Licensed Massage Therapist
## 28 East Honolulu HI Massage Therapist
## 29 East Honolulu HI Licensed Massage Therapist (LMT)
## 30 East Honolulu HI Massage Therapist
## 31 East Honolulu HI Licensed Massage Therapist (LMT)
## 32 East Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 33 East Honolulu HI Massage Therapist (per diem, up to 40 hours/week)
## 34 East Honolulu HI Licensed Massage Therapist (LMT)
## 35 East Honolulu HI Licensed Massage Therapist
## 36 East Honolulu HI Massage Therapist - Independent Contractor
## 37 East Honolulu HI Licensed Massage Therapist
## 38 East Honolulu HI Massage Therapist
## 39 East Honolulu HI Licensed Massage Therapist (LMT)
## 40 East Honolulu HI Massage Therapist
## HiringAgency
## 1 Navian HawaiiHonolulu, HI
## 2 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 3 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 4 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 5 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 6 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 7 Kailua Wellness CenterKailua, HI 96734
## 8 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 9 Navian HawaiiHonolulu, HI
## 10 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 11 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 12 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 13 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 14 Kailua Wellness CenterKailua, HI 96734
## 15 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 16 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 17 Navian HawaiiHonolulu, HI
## 18 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 19 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 20 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 21 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 22 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 23 Kailua Wellness CenterKailua, HI 96734
## 24 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 25 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 26 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 27 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 28 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 29 Kailua Wellness CenterKailua, HI 96734
## 30 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## 31 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 32 Navian HawaiiHonolulu, HI
## 33 Navian HawaiiHonolulu, HI
## 34 OrthoSport Hawaii3.0Honolulu, HI 96821 (Kuliouou-Kalani Iki area)
## 35 Pure Joy Day SpaHonolulu, HI 96813 (Ala Moana-Kakaako area)
## 36 Indo-Pak Massage TherapyHonolulu, HI+1 location•Remote work available
## 37 Thai-Issan Therapeutic MassageHonolulu, HI 96814 (Makiki-Lower Punchbowl-Tantalus area)
## 38 One Spa World3.8Honolulu, HI 96815 (Diamond Head-Kapahulu area)
## 39 Kailua Wellness CenterKailua, HI 96734
## 40 Massage Envy3.2Honolulu, HI 96821 (Kuliouou-Kalani Iki area)+3 locations
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 27 50 NA NA
## 2 17 27 50 NA NA
## 3 6 27 50 NA NA
## 4 17 27 50 NA NA
## 5 20 27 50 NA NA
## 6 6 27 50 NA NA
## 7 30 27 50 NA NA
## 8 24 27 50 NA NA
## 9 6 27 50 NA NA
## 10 6 27 50 NA NA
## 11 17 27 50 NA NA
## 12 20 27 50 NA NA
## 13 6 27 50 NA NA
## 14 30 27 50 NA NA
## 15 24 27 50 NA NA
## 16 17 27 50 NA NA
## 17 6 27 50 NA NA
## 18 17 27 50 NA NA
## 19 6 27 50 NA NA
## 20 17 27 50 NA NA
## 21 20 27 50 NA NA
## 22 6 27 50 NA NA
## 23 30 27 50 NA NA
## 24 24 27 50 NA NA
## 25 6 27 50 NA NA
## 26 17 27 50 NA NA
## 27 20 27 50 NA NA
## 28 6 27 50 NA NA
## 29 30 27 50 NA NA
## 30 24 27 50 NA NA
## 31 17 27 50 NA NA
## 32 6 27 50 NA NA
## 33 6 27 50 NA NA
## 34 17 27 50 NA NA
## 35 6 27 50 NA NA
## 36 17 27 50 NA NA
## 37 20 27 50 NA NA
## 38 6 27 50 NA NA
## 39 30 27 50 NA NA
## 40 24 27 50 NA NA
getIndeedJobData5pages("massage therapist","Hilo","HI")
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 6
## 2 6
## 3 6
## 4 6
## 5 6
##
## [[4]]
## HiringAgency
## 1 One Spa World3.8Island of Hawai‘i, HI
## 2 One Spa World3.8Island of Hawai‘i, HI
## 3 One Spa World3.8Island of Hawai‘i, HI
## 4 One Spa World3.8Island of Hawai‘i, HI
## 5 One Spa World3.8Island of Hawai‘i, HI
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle HiringAgency
## 1 Hilo HI Massage Therapist One Spa World3.8Island of Hawai‘i, HI
## 2 Hilo HI Massage Therapist One Spa World3.8Island of Hawai‘i, HI
## 3 Hilo HI Massage Therapist One Spa World3.8Island of Hawai‘i, HI
## 4 Hilo HI Massage Therapist One Spa World3.8Island of Hawai‘i, HI
## 5 Hilo HI Massage Therapist One Spa World3.8Island of Hawai‘i, HI
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 NA NA NA NA
## 2 6 NA NA NA NA
## 3 6 NA NA NA NA
## 4 6 NA NA NA NA
## 5 6 NA NA NA NA
Idaho Boise, Meridian, Nampa
getIndeedJobData5pages("massage therapist", "boise","ID")
## [[1]]
## jobTitle
## 1 Temporary Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 6 Massage Therapist - Independent Contractor
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapists
## 11 Massage Therapist
## 12 Massage therapists need at our Eagle location.
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapists
## 20 Massage Therapist
## 21 Massage therapists need at our Eagle location.
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Temporary Massage Therapist
## 25 Temporary Massage Therapist
## 26 Licensed Massage Therapist
## 27 Massage Therapist
## 28 Licensed Massage Therapist
## 29 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 30 Massage Therapist - Independent Contractor
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapists
## 35 Massage Therapist
## 36 Massage therapists need at our Eagle location.
## 37 Temporary Massage Therapist
## 38 Licensed Massage Therapist
## 39 Massage Therapist
## 40 Licensed Massage Therapist
## 41 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 42 Massage Therapist - Independent Contractor
## 43 Massage Therapist
## 44 Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapists
## 47 Massage Therapist
## 48 Massage therapists need at our Eagle location.
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 52 Massage Therapist - Independent Contractor
## 53 Massage Therapist
## 54 Massage Therapist
## 55 Licensed Massage Therapists
## 56 Massage Therapist
## 57 Massage therapists need at our Eagle location.
## 58 Temporary Massage Therapist
## 59 Massage Therapist
## 60 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 - $30 an hour $23 - $30 23 30
## 2 \n$30 - $52 an hour $30 - $52 30 52
## 3 \n$20 - $25 an hour $20 - $25 20 25
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$18 - $20 an hour $18 - $20 18 20
## 6 \n$15 - $20 an hour $15 - $20 15 20
## 7 \n$20 - $60 an hour $20 - $60 20 60
## 8 \n$25 - $40 an hour $25 - $40 25 40
## 9 \n$15 - $20 an hour $15 - $20 15 20
## 10 \n$30 - $52 an hour $30 - $52 30 52
## 11 \n$20 - $25 an hour $20 - $25 20 25
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$18 - $20 an hour $18 - $20 18 20
## 14 \n$20 - $60 an hour $20 - $60 20 60
## 15 \n$25 - $40 an hour $25 - $40 25 40
## 16 \n$23 - $30 an hour $23 - $30 23 30
## 17 \n$23 - $30 an hour $23 - $30 23 30
## 18 \n$30 - $52 an hour $30 - $52 30 52
## 19 \n$20 - $25 an hour $20 - $25 20 25
## 20 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 21 \n$18 - $20 an hour $18 - $20 18 20
## 22 \n$15 - $20 an hour $15 - $20 15 20
## 23 \n$20 - $60 an hour $20 - $60 20 60
## 24 \n$25 - $40 an hour $25 - $40 25 40
## 25 \n$23 - $30 an hour $23 - $30 23 30
## 26 \n$30 - $52 an hour $30 - $52 30 52
## 27 \n$20 - $25 an hour $20 - $25 20 25
## 28 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 29 \n$18 - $20 an hour $18 - $20 18 20
## 30 \n$15 - $20 an hour $15 - $20 15 20
## 31 \n$20 - $60 an hour $20 - $60 20 60
## 32 \n$25 - $40 an hour $25 - $40 25 40
## 33 \n$30 - $52 an hour $30 - $52 30 52
## 34 \n$20 - $25 an hour $20 - $25 20 25
## 35 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 36 \n$18 - $20 an hour $18 - $20 18 20
## 37 \n$20 - $60 an hour $20 - $60 20 60
## 38 \n$25 - $40 an hour $25 - $40 25 40
## 39 \n$23 - $30 an hour $23 - $30 23 30
## 40 \n$15 - $20 an hour $15 - $20 15 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 21.5 25 643.875 1087.375 15
## 2 21.5 25 643.875 1087.375 15
## 3 21.5 25 643.875 1087.375 15
## 4 21.5 25 643.875 1087.375 15
## 5 21.5 25 643.875 1087.375 15
## 6 21.5 25 643.875 1087.375 15
## 7 21.5 25 643.875 1087.375 15
## 8 21.5 25 643.875 1087.375 15
## 9 21.5 25 643.875 1087.375 15
## 10 21.5 25 643.875 1087.375 15
## 11 21.5 25 643.875 1087.375 15
## 12 21.5 25 643.875 1087.375 15
## 13 21.5 25 643.875 1087.375 15
## 14 21.5 25 643.875 1087.375 15
## 15 21.5 25 643.875 1087.375 15
## 16 21.5 25 643.875 1087.375 15
## 17 21.5 25 643.875 1087.375 15
## 18 21.5 25 643.875 1087.375 15
## 19 21.5 25 643.875 1087.375 15
## 20 21.5 25 643.875 1087.375 15
## 21 21.5 25 643.875 1087.375 15
## 22 21.5 25 643.875 1087.375 15
## 23 21.5 25 643.875 1087.375 15
## 24 21.5 25 643.875 1087.375 15
## 25 21.5 25 643.875 1087.375 15
## 26 21.5 25 643.875 1087.375 15
## 27 21.5 25 643.875 1087.375 15
## 28 21.5 25 643.875 1087.375 15
## 29 21.5 25 643.875 1087.375 15
## 30 21.5 25 643.875 1087.375 15
## 31 21.5 25 643.875 1087.375 15
## 32 21.5 25 643.875 1087.375 15
## 33 21.5 25 643.875 1087.375 15
## 34 21.5 25 643.875 1087.375 15
## 35 21.5 25 643.875 1087.375 15
## 36 21.5 25 643.875 1087.375 15
## 37 21.5 25 643.875 1087.375 15
## 38 21.5 25 643.875 1087.375 15
## 39 21.5 25 643.875 1087.375 15
## 40 21.5 25 643.875 1087.375 15
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
## 34 12000
## 35 12000
## 36 12000
## 37 12000
## 38 12000
## 39 12000
## 40 12000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 7
## 3 16
## 4 17
## 5 30
## 6 17
## 7 25
## 8 30
## 9 25
## 10 30
## 11 17
## 12 20
## 13 30
## 14 17
## 15 30
## 16 17
## 17 25
## 18 25
## 19 30
## 20 17
## 21 20
## 22 7
## 23 16
## 24 14
## 25 14
## 26 7
## 27 16
## 28 17
## 29 30
## 30 17
## 31 25
## 32 30
## 33 25
## 34 30
## 35 17
## 36 20
## 37 14
## 38 7
## 39 16
## 40 17
## 41 30
## 42 17
## 43 25
## 44 30
## 45 25
## 46 30
## 47 17
## 48 20
## 49 7
## 50 17
## 51 30
## 52 17
## 53 25
## 54 25
## 55 30
## 56 17
## 57 20
## 58 14
## 59 30
## 60 16
##
## [[4]]
## HiringAgency
## 1 Keystone Physical MedicineMeridian, ID 83646
## 2 Eagle Day SpaEagle, ID 83616
## 3 Touchmark Living3.5Meridian, ID
## 4 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 5 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 6 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 7 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 8 Elements Massage3.6Meridian, ID 83642
## 9 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 10 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 11 Bella MerNampa, ID 83651 (Old Nampa area)
## 12 Idaho MassageEagle, ID 83616
## 13 Elements Massage3.6Meridian, ID 83642
## 14 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 15 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 16 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 17 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 18 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 19 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 20 Bella MerNampa, ID 83651 (Old Nampa area)
## 21 Idaho MassageEagle, ID 83616
## 22 Eagle Day SpaEagle, ID 83616
## 23 Touchmark Living3.5Meridian, ID
## 24 Keystone Physical MedicineMeridian, ID 83646
## 25 Keystone Physical MedicineMeridian, ID 83646
## 26 Eagle Day SpaEagle, ID 83616
## 27 Touchmark Living3.5Meridian, ID
## 28 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 29 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 30 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 31 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 32 Elements Massage3.6Meridian, ID 83642
## 33 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 34 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 35 Bella MerNampa, ID 83651 (Old Nampa area)
## 36 Idaho MassageEagle, ID 83616
## 37 Keystone Physical MedicineMeridian, ID 83646
## 38 Eagle Day SpaEagle, ID 83616
## 39 Touchmark Living3.5Meridian, ID
## 40 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 41 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 42 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 43 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 44 Elements Massage3.6Meridian, ID 83642
## 45 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 46 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 47 Bella MerNampa, ID 83651 (Old Nampa area)
## 48 Idaho MassageEagle, ID 83616
## 49 Eagle Day SpaEagle, ID 83616
## 50 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 51 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 52 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 53 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 54 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 55 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 56 Bella MerNampa, ID 83651 (Old Nampa area)
## 57 Idaho MassageEagle, ID 83616
## 58 Keystone Physical MedicineMeridian, ID 83646
## 59 Elements Massage3.6Meridian, ID 83642
## 60 Touchmark Living3.5Meridian, ID
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$23 - $30 an hour $23 - $30 23 30 20
## 2 \n$30 - $52 an hour $30 - $52 30 52 20
## 3 \n$20 - $25 an hour $20 - $25 20 25 20
## 5 \n$18 - $20 an hour $18 - $20 18 20 20
## 6 \n$15 - $20 an hour $15 - $20 15 20 20
## 7 \n$20 - $60 an hour $20 - $60 20 60 20
## 8 \n$25 - $40 an hour $25 - $40 25 40 20
## 9 \n$15 - $20 an hour $15 - $20 15 20 20
## 10 \n$30 - $52 an hour $30 - $52 30 52 20
## 11 \n$20 - $25 an hour $20 - $25 20 25 20
## 13 \n$18 - $20 an hour $18 - $20 18 20 20
## 14 \n$20 - $60 an hour $20 - $60 20 60 20
## 15 \n$25 - $40 an hour $25 - $40 25 40 20
## 16 \n$23 - $30 an hour $23 - $30 23 30 20
## 17 \n$23 - $30 an hour $23 - $30 23 30 20
## 18 \n$30 - $52 an hour $30 - $52 30 52 20
## 19 \n$20 - $25 an hour $20 - $25 20 25 20
## 21 \n$18 - $20 an hour $18 - $20 18 20 20
## 22 \n$15 - $20 an hour $15 - $20 15 20 20
## 23 \n$20 - $60 an hour $20 - $60 20 60 20
## 24 \n$25 - $40 an hour $25 - $40 25 40 20
## 25 \n$23 - $30 an hour $23 - $30 23 30 20
## 26 \n$30 - $52 an hour $30 - $52 30 52 20
## 27 \n$20 - $25 an hour $20 - $25 20 25 20
## 29 \n$18 - $20 an hour $18 - $20 18 20 20
## 30 \n$15 - $20 an hour $15 - $20 15 20 20
## 31 \n$20 - $60 an hour $20 - $60 20 60 20
## 32 \n$25 - $40 an hour $25 - $40 25 40 20
## 33 \n$30 - $52 an hour $30 - $52 30 52 20
## 34 \n$20 - $25 an hour $20 - $25 20 25 20
## 36 \n$18 - $20 an hour $18 - $20 18 20 20
## 37 \n$20 - $60 an hour $20 - $60 20 60 20
## 38 \n$25 - $40 an hour $25 - $40 25 40 20
## 39 \n$23 - $30 an hour $23 - $30 23 30 20
## 40 \n$15 - $20 an hour $15 - $20 15 20 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 21.57143 35.28571 15 60
## 2 30 21.57143 35.28571 15 60
## 3 30 21.57143 35.28571 15 60
## 5 30 21.57143 35.28571 15 60
## 6 30 21.57143 35.28571 15 60
## 7 30 21.57143 35.28571 15 60
## 8 30 21.57143 35.28571 15 60
## 9 30 21.57143 35.28571 15 60
## 10 30 21.57143 35.28571 15 60
## 11 30 21.57143 35.28571 15 60
## 13 30 21.57143 35.28571 15 60
## 14 30 21.57143 35.28571 15 60
## 15 30 21.57143 35.28571 15 60
## 16 30 21.57143 35.28571 15 60
## 17 30 21.57143 35.28571 15 60
## 18 30 21.57143 35.28571 15 60
## 19 30 21.57143 35.28571 15 60
## 21 30 21.57143 35.28571 15 60
## 22 30 21.57143 35.28571 15 60
## 23 30 21.57143 35.28571 15 60
## 24 30 21.57143 35.28571 15 60
## 25 30 21.57143 35.28571 15 60
## 26 30 21.57143 35.28571 15 60
## 27 30 21.57143 35.28571 15 60
## 29 30 21.57143 35.28571 15 60
## 30 30 21.57143 35.28571 15 60
## 31 30 21.57143 35.28571 15 60
## 32 30 21.57143 35.28571 15 60
## 33 30 21.57143 35.28571 15 60
## 34 30 21.57143 35.28571 15 60
## 36 30 21.57143 35.28571 15 60
## 37 30 21.57143 35.28571 15 60
## 38 30 21.57143 35.28571 15 60
## 39 30 21.57143 35.28571 15 60
## 40 30 21.57143 35.28571 15 60
##
## [[7]]
## city state jobTitle
## 1 boise ID Temporary Massage Therapist
## 2 boise ID Licensed Massage Therapist
## 3 boise ID Massage Therapist
## 4 boise ID Licensed Massage Therapist
## 5 boise ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 6 boise ID Massage Therapist - Independent Contractor
## 7 boise ID Massage Therapist
## 8 boise ID Massage Therapist
## 9 boise ID Massage Therapist
## 10 boise ID Licensed Massage Therapists
## 11 boise ID Massage Therapist
## 12 boise ID Massage therapists need at our Eagle location.
## 13 boise ID Massage Therapist
## 14 boise ID Licensed Massage Therapist
## 15 boise ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 16 boise ID Massage Therapist - Independent Contractor
## 17 boise ID Massage Therapist
## 18 boise ID Massage Therapist
## 19 boise ID Licensed Massage Therapists
## 20 boise ID Massage Therapist
## 21 boise ID Massage therapists need at our Eagle location.
## 22 boise ID Licensed Massage Therapist
## 23 boise ID Massage Therapist
## 24 boise ID Temporary Massage Therapist
## 25 boise ID Temporary Massage Therapist
## 26 boise ID Licensed Massage Therapist
## 27 boise ID Massage Therapist
## 28 boise ID Licensed Massage Therapist
## 29 boise ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 30 boise ID Massage Therapist - Independent Contractor
## 31 boise ID Massage Therapist
## 32 boise ID Massage Therapist
## 33 boise ID Massage Therapist
## 34 boise ID Licensed Massage Therapists
## 35 boise ID Massage Therapist
## 36 boise ID Massage therapists need at our Eagle location.
## 37 boise ID Temporary Massage Therapist
## 38 boise ID Licensed Massage Therapist
## 39 boise ID Massage Therapist
## 40 boise ID Licensed Massage Therapist
## 41 boise ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 42 boise ID Massage Therapist - Independent Contractor
## 43 boise ID Massage Therapist
## 44 boise ID Massage Therapist
## 45 boise ID Massage Therapist
## 46 boise ID Licensed Massage Therapists
## 47 boise ID Massage Therapist
## 48 boise ID Massage therapists need at our Eagle location.
## 49 boise ID Licensed Massage Therapist
## 50 boise ID Licensed Massage Therapist
## 51 boise ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 52 boise ID Massage Therapist - Independent Contractor
## 53 boise ID Massage Therapist
## 54 boise ID Massage Therapist
## 55 boise ID Licensed Massage Therapists
## 56 boise ID Massage Therapist
## 57 boise ID Massage therapists need at our Eagle location.
## 58 boise ID Temporary Massage Therapist
## 59 boise ID Massage Therapist
## 60 boise ID Massage Therapist
## HiringAgency
## 1 Keystone Physical MedicineMeridian, ID 83646
## 2 Eagle Day SpaEagle, ID 83616
## 3 Touchmark Living3.5Meridian, ID
## 4 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 5 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 6 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 7 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 8 Elements Massage3.6Meridian, ID 83642
## 9 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 10 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 11 Bella MerNampa, ID 83651 (Old Nampa area)
## 12 Idaho MassageEagle, ID 83616
## 13 Elements Massage3.6Meridian, ID 83642
## 14 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 15 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 16 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 17 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 18 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 19 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 20 Bella MerNampa, ID 83651 (Old Nampa area)
## 21 Idaho MassageEagle, ID 83616
## 22 Eagle Day SpaEagle, ID 83616
## 23 Touchmark Living3.5Meridian, ID
## 24 Keystone Physical MedicineMeridian, ID 83646
## 25 Keystone Physical MedicineMeridian, ID 83646
## 26 Eagle Day SpaEagle, ID 83616
## 27 Touchmark Living3.5Meridian, ID
## 28 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 29 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 30 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 31 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 32 Elements Massage3.6Meridian, ID 83642
## 33 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 34 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 35 Bella MerNampa, ID 83651 (Old Nampa area)
## 36 Idaho MassageEagle, ID 83616
## 37 Keystone Physical MedicineMeridian, ID 83646
## 38 Eagle Day SpaEagle, ID 83616
## 39 Touchmark Living3.5Meridian, ID
## 40 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 41 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 42 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 43 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 44 Elements Massage3.6Meridian, ID 83642
## 45 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 46 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 47 Bella MerNampa, ID 83651 (Old Nampa area)
## 48 Idaho MassageEagle, ID 83616
## 49 Eagle Day SpaEagle, ID 83616
## 50 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 51 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 52 Indo-Pak Massage TherapyBoise, ID+2 locations•Remote work available
## 53 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 54 Elements3.6Boise, ID 83706 (Southeast Boise area)+1 location
## 55 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 56 Bella MerNampa, ID 83651 (Old Nampa area)
## 57 Idaho MassageEagle, ID 83616
## 58 Keystone Physical MedicineMeridian, ID 83646
## 59 Elements Massage3.6Meridian, ID 83642
## 60 Touchmark Living3.5Meridian, ID
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 14 15 60 NA NA
## 2 7 15 60 NA NA
## 3 16 15 60 NA NA
## 4 17 15 60 NA NA
## 5 30 15 60 NA NA
## 6 17 15 60 NA NA
## 7 25 15 60 NA NA
## 8 30 15 60 NA NA
## 9 25 15 60 NA NA
## 10 30 15 60 NA NA
## 11 17 15 60 NA NA
## 12 20 15 60 NA NA
## 13 30 15 60 NA NA
## 14 17 15 60 NA NA
## 15 30 15 60 NA NA
## 16 17 15 60 NA NA
## 17 25 15 60 NA NA
## 18 25 15 60 NA NA
## 19 30 15 60 NA NA
## 20 17 15 60 NA NA
## 21 20 15 60 NA NA
## 22 7 15 60 NA NA
## 23 16 15 60 NA NA
## 24 14 15 60 NA NA
## 25 14 15 60 NA NA
## 26 7 15 60 NA NA
## 27 16 15 60 NA NA
## 28 17 15 60 NA NA
## 29 30 15 60 NA NA
## 30 17 15 60 NA NA
## 31 25 15 60 NA NA
## 32 30 15 60 NA NA
## 33 25 15 60 NA NA
## 34 30 15 60 NA NA
## 35 17 15 60 NA NA
## 36 20 15 60 NA NA
## 37 14 15 60 NA NA
## 38 7 15 60 NA NA
## 39 16 15 60 NA NA
## 40 17 15 60 NA NA
## 41 30 15 60 NA NA
## 42 17 15 60 NA NA
## 43 25 15 60 NA NA
## 44 30 15 60 NA NA
## 45 25 15 60 NA NA
## 46 30 15 60 NA NA
## 47 17 15 60 NA NA
## 48 20 15 60 NA NA
## 49 7 15 60 NA NA
## 50 17 15 60 NA NA
## 51 30 15 60 NA NA
## 52 17 15 60 NA NA
## 53 25 15 60 NA NA
## 54 25 15 60 NA NA
## 55 30 15 60 NA NA
## 56 17 15 60 NA NA
## 57 20 15 60 NA NA
## 58 14 15 60 NA NA
## 59 30 15 60 NA NA
## 60 16 15 60 NA NA
getIndeedJobData5pages("massage therapist", "Meridian","ID")
## [[1]]
## jobTitle
## 1 Temporary Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapists
## 12 Massage therapists need at our Eagle location.
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 17 Massage Therapist - Independent Contractor
## 18 Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapists
## 21 Massage therapists need at our Eagle location.
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Temporary Massage Therapist
## 25 Temporary Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 29 Massage Therapist - Independent Contractor
## 30 Massage Therapist
## 31 Massage Therapist
## 32 Licensed Massage Therapists
## 33 Massage therapists need at our Eagle location.
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Massage Therapist
## 37 Temporary Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 43 Massage Therapist - Independent Contractor
## 44 Massage Therapist
## 45 Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapists
## 48 Massage therapists need at our Eagle location.
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist
## 52 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 53 Massage Therapist - Independent Contractor
## 54 Massage Therapist
## 55 Massage Therapist
## 56 Licensed Massage Therapists
## 57 Massage therapists need at our Eagle location.
## 58 Temporary Massage Therapist
## 59 Massage Therapist
## 60 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 - $30 an hour $23 - $30 23 30
## 2 \n$20 - $60 an hour $20 - $60 20 60
## 3 \n$30 - $52 an hour $30 - $52 30 52
## 4 \n$20 - $25 an hour $20 - $25 20 25
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$15 - $20 an hour $15 - $20 15 20
## 7 \n$18 - $20 an hour $18 - $20 18 20
## 8 \n$25 - $40 an hour $25 - $40 25 40
## 9 \n$20 - $60 an hour $20 - $60 20 60
## 10 \n$30 - $52 an hour $30 - $52 30 52
## 11 \n$20 - $25 an hour $20 - $25 20 25
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$18 - $20 an hour $18 - $20 18 20
## 14 \n$25 - $40 an hour $25 - $40 25 40
## 15 \n$15 - $20 an hour $15 - $20 15 20
## 16 \n$23 - $30 an hour $23 - $30 23 30
## 17 \n$23 - $30 an hour $23 - $30 23 30
## 18 \n$20 - $60 an hour $20 - $60 20 60
## 19 \n$30 - $52 an hour $30 - $52 30 52
## 20 \n$20 - $25 an hour $20 - $25 20 25
## 21 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 22 \n$18 - $20 an hour $18 - $20 18 20
## 23 \n$25 - $40 an hour $25 - $40 25 40
## 24 \n$15 - $20 an hour $15 - $20 15 20
## 25 \n$23 - $30 an hour $23 - $30 23 30
## 26 \n$20 - $60 an hour $20 - $60 20 60
## 27 \n$30 - $52 an hour $30 - $52 30 52
## 28 \n$20 - $25 an hour $20 - $25 20 25
## 29 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 30 \n$15 - $20 an hour $15 - $20 15 20
## 31 \n$18 - $20 an hour $18 - $20 18 20
## 32 \n$25 - $40 an hour $25 - $40 25 40
## 33 \n$20 - $60 an hour $20 - $60 20 60
## 34 \n$30 - $52 an hour $30 - $52 30 52
## 35 \n$20 - $25 an hour $20 - $25 20 25
## 36 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 37 \n$18 - $20 an hour $18 - $20 18 20
## 38 \n$25 - $40 an hour $25 - $40 25 40
## 39 \n$23 - $30 an hour $23 - $30 23 30
## 40 \n$15 - $20 an hour $15 - $20 15 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 21.5 25 643.875 1087.375 15
## 2 21.5 25 643.875 1087.375 15
## 3 21.5 25 643.875 1087.375 15
## 4 21.5 25 643.875 1087.375 15
## 5 21.5 25 643.875 1087.375 15
## 6 21.5 25 643.875 1087.375 15
## 7 21.5 25 643.875 1087.375 15
## 8 21.5 25 643.875 1087.375 15
## 9 21.5 25 643.875 1087.375 15
## 10 21.5 25 643.875 1087.375 15
## 11 21.5 25 643.875 1087.375 15
## 12 21.5 25 643.875 1087.375 15
## 13 21.5 25 643.875 1087.375 15
## 14 21.5 25 643.875 1087.375 15
## 15 21.5 25 643.875 1087.375 15
## 16 21.5 25 643.875 1087.375 15
## 17 21.5 25 643.875 1087.375 15
## 18 21.5 25 643.875 1087.375 15
## 19 21.5 25 643.875 1087.375 15
## 20 21.5 25 643.875 1087.375 15
## 21 21.5 25 643.875 1087.375 15
## 22 21.5 25 643.875 1087.375 15
## 23 21.5 25 643.875 1087.375 15
## 24 21.5 25 643.875 1087.375 15
## 25 21.5 25 643.875 1087.375 15
## 26 21.5 25 643.875 1087.375 15
## 27 21.5 25 643.875 1087.375 15
## 28 21.5 25 643.875 1087.375 15
## 29 21.5 25 643.875 1087.375 15
## 30 21.5 25 643.875 1087.375 15
## 31 21.5 25 643.875 1087.375 15
## 32 21.5 25 643.875 1087.375 15
## 33 21.5 25 643.875 1087.375 15
## 34 21.5 25 643.875 1087.375 15
## 35 21.5 25 643.875 1087.375 15
## 36 21.5 25 643.875 1087.375 15
## 37 21.5 25 643.875 1087.375 15
## 38 21.5 25 643.875 1087.375 15
## 39 21.5 25 643.875 1087.375 15
## 40 21.5 25 643.875 1087.375 15
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
## 34 12000
## 35 12000
## 36 12000
## 37 12000
## 38 12000
## 39 12000
## 40 12000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 16
## 3 7
## 4 17
## 5 17
## 6 30
## 7 10
## 8 30
## 9 25
## 10 26
## 11 30
## 12 20
## 13 16
## 14 17
## 15 17
## 16 30
## 17 10
## 18 25
## 19 26
## 20 30
## 21 20
## 22 7
## 23 30
## 24 14
## 25 14
## 26 17
## 27 17
## 28 30
## 29 10
## 30 25
## 31 26
## 32 30
## 33 20
## 34 7
## 35 16
## 36 30
## 37 14
## 38 16
## 39 7
## 40 17
## 41 17
## 42 30
## 43 10
## 44 30
## 45 25
## 46 26
## 47 30
## 48 20
## 49 7
## 50 17
## 51 17
## 52 30
## 53 10
## 54 25
## 55 26
## 56 30
## 57 20
## 58 14
## 59 30
## 60 16
##
## [[4]]
## HiringAgency
## 1 Keystone Physical MedicineMeridian, ID 83646
## 2 Touchmark Living3.5Meridian, ID
## 3 Eagle Day SpaEagle, ID 83616
## 4 Bella MerNampa, ID 83651 (Old Nampa area)
## 5 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 6 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 7 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 8 Elements Massage3.6Meridian, ID 83642
## 9 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 10 Elements3.6Meridian, ID 83642+1 location
## 11 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 12 Idaho MassageEagle, ID 83616
## 13 Touchmark Living3.5Meridian, ID
## 14 Bella MerNampa, ID 83651 (Old Nampa area)
## 15 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 16 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 17 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 18 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 19 Elements3.6Meridian, ID 83642+1 location
## 20 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 21 Idaho MassageEagle, ID 83616
## 22 Eagle Day SpaEagle, ID 83616
## 23 Elements Massage3.6Meridian, ID 83642
## 24 Keystone Physical MedicineMeridian, ID 83646
## 25 Keystone Physical MedicineMeridian, ID 83646
## 26 Bella MerNampa, ID 83651 (Old Nampa area)
## 27 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 28 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 29 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 30 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 31 Elements3.6Meridian, ID 83642+1 location
## 32 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 33 Idaho MassageEagle, ID 83616
## 34 Eagle Day SpaEagle, ID 83616
## 35 Touchmark Living3.5Meridian, ID
## 36 Elements Massage3.6Meridian, ID 83642
## 37 Keystone Physical MedicineMeridian, ID 83646
## 38 Touchmark Living3.5Meridian, ID
## 39 Eagle Day SpaEagle, ID 83616
## 40 Bella MerNampa, ID 83651 (Old Nampa area)
## 41 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 42 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 43 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 44 Elements Massage3.6Meridian, ID 83642
## 45 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 46 Elements3.6Meridian, ID 83642+1 location
## 47 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 48 Idaho MassageEagle, ID 83616
## 49 Eagle Day SpaEagle, ID 83616
## 50 Bella MerNampa, ID 83651 (Old Nampa area)
## 51 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 52 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 53 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 54 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 55 Elements3.6Meridian, ID 83642+1 location
## 56 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 57 Idaho MassageEagle, ID 83616
## 58 Keystone Physical MedicineMeridian, ID 83646
## 59 Elements Massage3.6Meridian, ID 83642
## 60 Touchmark Living3.5Meridian, ID
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$23 - $30 an hour $23 - $30 23 30 20
## 2 \n$20 - $60 an hour $20 - $60 20 60 20
## 3 \n$30 - $52 an hour $30 - $52 30 52 20
## 4 \n$20 - $25 an hour $20 - $25 20 25 20
## 6 \n$15 - $20 an hour $15 - $20 15 20 20
## 7 \n$18 - $20 an hour $18 - $20 18 20 20
## 8 \n$25 - $40 an hour $25 - $40 25 40 20
## 9 \n$20 - $60 an hour $20 - $60 20 60 20
## 10 \n$30 - $52 an hour $30 - $52 30 52 20
## 11 \n$20 - $25 an hour $20 - $25 20 25 20
## 13 \n$18 - $20 an hour $18 - $20 18 20 20
## 14 \n$25 - $40 an hour $25 - $40 25 40 20
## 15 \n$15 - $20 an hour $15 - $20 15 20 20
## 16 \n$23 - $30 an hour $23 - $30 23 30 20
## 17 \n$23 - $30 an hour $23 - $30 23 30 20
## 18 \n$20 - $60 an hour $20 - $60 20 60 20
## 19 \n$30 - $52 an hour $30 - $52 30 52 20
## 20 \n$20 - $25 an hour $20 - $25 20 25 20
## 22 \n$18 - $20 an hour $18 - $20 18 20 20
## 23 \n$25 - $40 an hour $25 - $40 25 40 20
## 24 \n$15 - $20 an hour $15 - $20 15 20 20
## 25 \n$23 - $30 an hour $23 - $30 23 30 20
## 26 \n$20 - $60 an hour $20 - $60 20 60 20
## 27 \n$30 - $52 an hour $30 - $52 30 52 20
## 28 \n$20 - $25 an hour $20 - $25 20 25 20
## 30 \n$15 - $20 an hour $15 - $20 15 20 20
## 31 \n$18 - $20 an hour $18 - $20 18 20 20
## 32 \n$25 - $40 an hour $25 - $40 25 40 20
## 33 \n$20 - $60 an hour $20 - $60 20 60 20
## 34 \n$30 - $52 an hour $30 - $52 30 52 20
## 35 \n$20 - $25 an hour $20 - $25 20 25 20
## 37 \n$18 - $20 an hour $18 - $20 18 20 20
## 38 \n$25 - $40 an hour $25 - $40 25 40 20
## 39 \n$23 - $30 an hour $23 - $30 23 30 20
## 40 \n$15 - $20 an hour $15 - $20 15 20 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 21.57143 35.28571 15 60
## 2 30 21.57143 35.28571 15 60
## 3 30 21.57143 35.28571 15 60
## 4 30 21.57143 35.28571 15 60
## 6 30 21.57143 35.28571 15 60
## 7 30 21.57143 35.28571 15 60
## 8 30 21.57143 35.28571 15 60
## 9 30 21.57143 35.28571 15 60
## 10 30 21.57143 35.28571 15 60
## 11 30 21.57143 35.28571 15 60
## 13 30 21.57143 35.28571 15 60
## 14 30 21.57143 35.28571 15 60
## 15 30 21.57143 35.28571 15 60
## 16 30 21.57143 35.28571 15 60
## 17 30 21.57143 35.28571 15 60
## 18 30 21.57143 35.28571 15 60
## 19 30 21.57143 35.28571 15 60
## 20 30 21.57143 35.28571 15 60
## 22 30 21.57143 35.28571 15 60
## 23 30 21.57143 35.28571 15 60
## 24 30 21.57143 35.28571 15 60
## 25 30 21.57143 35.28571 15 60
## 26 30 21.57143 35.28571 15 60
## 27 30 21.57143 35.28571 15 60
## 28 30 21.57143 35.28571 15 60
## 30 30 21.57143 35.28571 15 60
## 31 30 21.57143 35.28571 15 60
## 32 30 21.57143 35.28571 15 60
## 33 30 21.57143 35.28571 15 60
## 34 30 21.57143 35.28571 15 60
## 35 30 21.57143 35.28571 15 60
## 37 30 21.57143 35.28571 15 60
## 38 30 21.57143 35.28571 15 60
## 39 30 21.57143 35.28571 15 60
## 40 30 21.57143 35.28571 15 60
##
## [[7]]
## city state
## 1 Meridian ID
## 2 Meridian ID
## 3 Meridian ID
## 4 Meridian ID
## 5 Meridian ID
## 6 Meridian ID
## 7 Meridian ID
## 8 Meridian ID
## 9 Meridian ID
## 10 Meridian ID
## 11 Meridian ID
## 12 Meridian ID
## 13 Meridian ID
## 14 Meridian ID
## 15 Meridian ID
## 16 Meridian ID
## 17 Meridian ID
## 18 Meridian ID
## 19 Meridian ID
## 20 Meridian ID
## 21 Meridian ID
## 22 Meridian ID
## 23 Meridian ID
## 24 Meridian ID
## 25 Meridian ID
## 26 Meridian ID
## 27 Meridian ID
## 28 Meridian ID
## 29 Meridian ID
## 30 Meridian ID
## 31 Meridian ID
## 32 Meridian ID
## 33 Meridian ID
## 34 Meridian ID
## 35 Meridian ID
## 36 Meridian ID
## 37 Meridian ID
## 38 Meridian ID
## 39 Meridian ID
## 40 Meridian ID
## 41 Meridian ID
## 42 Meridian ID
## 43 Meridian ID
## 44 Meridian ID
## 45 Meridian ID
## 46 Meridian ID
## 47 Meridian ID
## 48 Meridian ID
## 49 Meridian ID
## 50 Meridian ID
## 51 Meridian ID
## 52 Meridian ID
## 53 Meridian ID
## 54 Meridian ID
## 55 Meridian ID
## 56 Meridian ID
## 57 Meridian ID
## 58 Meridian ID
## 59 Meridian ID
## 60 Meridian ID
## jobTitle
## 1 Temporary Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapists
## 12 Massage therapists need at our Eagle location.
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 17 Massage Therapist - Independent Contractor
## 18 Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapists
## 21 Massage therapists need at our Eagle location.
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Temporary Massage Therapist
## 25 Temporary Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 29 Massage Therapist - Independent Contractor
## 30 Massage Therapist
## 31 Massage Therapist
## 32 Licensed Massage Therapists
## 33 Massage therapists need at our Eagle location.
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Massage Therapist
## 37 Temporary Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 43 Massage Therapist - Independent Contractor
## 44 Massage Therapist
## 45 Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapists
## 48 Massage therapists need at our Eagle location.
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist
## 52 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 53 Massage Therapist - Independent Contractor
## 54 Massage Therapist
## 55 Massage Therapist
## 56 Licensed Massage Therapists
## 57 Massage therapists need at our Eagle location.
## 58 Temporary Massage Therapist
## 59 Massage Therapist
## 60 Massage Therapist
## HiringAgency
## 1 Keystone Physical MedicineMeridian, ID 83646
## 2 Touchmark Living3.5Meridian, ID
## 3 Eagle Day SpaEagle, ID 83616
## 4 Bella MerNampa, ID 83651 (Old Nampa area)
## 5 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 6 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 7 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 8 Elements Massage3.6Meridian, ID 83642
## 9 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 10 Elements3.6Meridian, ID 83642+1 location
## 11 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 12 Idaho MassageEagle, ID 83616
## 13 Touchmark Living3.5Meridian, ID
## 14 Bella MerNampa, ID 83651 (Old Nampa area)
## 15 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 16 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 17 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 18 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 19 Elements3.6Meridian, ID 83642+1 location
## 20 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 21 Idaho MassageEagle, ID 83616
## 22 Eagle Day SpaEagle, ID 83616
## 23 Elements Massage3.6Meridian, ID 83642
## 24 Keystone Physical MedicineMeridian, ID 83646
## 25 Keystone Physical MedicineMeridian, ID 83646
## 26 Bella MerNampa, ID 83651 (Old Nampa area)
## 27 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 28 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 29 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 30 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 31 Elements3.6Meridian, ID 83642+1 location
## 32 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 33 Idaho MassageEagle, ID 83616
## 34 Eagle Day SpaEagle, ID 83616
## 35 Touchmark Living3.5Meridian, ID
## 36 Elements Massage3.6Meridian, ID 83642
## 37 Keystone Physical MedicineMeridian, ID 83646
## 38 Touchmark Living3.5Meridian, ID
## 39 Eagle Day SpaEagle, ID 83616
## 40 Bella MerNampa, ID 83651 (Old Nampa area)
## 41 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 42 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 43 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 44 Elements Massage3.6Meridian, ID 83642
## 45 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 46 Elements3.6Meridian, ID 83642+1 location
## 47 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 48 Idaho MassageEagle, ID 83616
## 49 Eagle Day SpaEagle, ID 83616
## 50 Bella MerNampa, ID 83651 (Old Nampa area)
## 51 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 52 StretchLab - Boise & EagleBoise, ID 83702 (Harrison Blvd area)+1 location
## 53 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 54 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 55 Elements3.6Meridian, ID 83642+1 location
## 56 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 57 Idaho MassageEagle, ID 83616
## 58 Keystone Physical MedicineMeridian, ID 83646
## 59 Elements Massage3.6Meridian, ID 83642
## 60 Touchmark Living3.5Meridian, ID
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 14 15 60 NA NA
## 2 16 15 60 NA NA
## 3 7 15 60 NA NA
## 4 17 15 60 NA NA
## 5 17 15 60 NA NA
## 6 30 15 60 NA NA
## 7 10 15 60 NA NA
## 8 30 15 60 NA NA
## 9 25 15 60 NA NA
## 10 26 15 60 NA NA
## 11 30 15 60 NA NA
## 12 20 15 60 NA NA
## 13 16 15 60 NA NA
## 14 17 15 60 NA NA
## 15 17 15 60 NA NA
## 16 30 15 60 NA NA
## 17 10 15 60 NA NA
## 18 25 15 60 NA NA
## 19 26 15 60 NA NA
## 20 30 15 60 NA NA
## 21 20 15 60 NA NA
## 22 7 15 60 NA NA
## 23 30 15 60 NA NA
## 24 14 15 60 NA NA
## 25 14 15 60 NA NA
## 26 17 15 60 NA NA
## 27 17 15 60 NA NA
## 28 30 15 60 NA NA
## 29 10 15 60 NA NA
## 30 25 15 60 NA NA
## 31 26 15 60 NA NA
## 32 30 15 60 NA NA
## 33 20 15 60 NA NA
## 34 7 15 60 NA NA
## 35 16 15 60 NA NA
## 36 30 15 60 NA NA
## 37 14 15 60 NA NA
## 38 16 15 60 NA NA
## 39 7 15 60 NA NA
## 40 17 15 60 NA NA
## 41 17 15 60 NA NA
## 42 30 15 60 NA NA
## 43 10 15 60 NA NA
## 44 30 15 60 NA NA
## 45 25 15 60 NA NA
## 46 26 15 60 NA NA
## 47 30 15 60 NA NA
## 48 20 15 60 NA NA
## 49 7 15 60 NA NA
## 50 17 15 60 NA NA
## 51 17 15 60 NA NA
## 52 30 15 60 NA NA
## 53 10 15 60 NA NA
## 54 25 15 60 NA NA
## 55 26 15 60 NA NA
## 56 30 15 60 NA NA
## 57 20 15 60 NA NA
## 58 14 15 60 NA NA
## 59 30 15 60 NA NA
## 60 16 15 60 NA NA
getIndeedJobData5pages("massage therapist", "Nampa","ID")
## [[1]]
## jobTitle
## 1 Temporary Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Licensed Massage Therapist
## 7 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapists
## 11 Massage therapists need at our Eagle location.
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist - Independent Contractor
## 16 Licensed Massage Therapist
## 17 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 18 Massage Therapist
## 19 Licensed Massage Therapists
## 20 Massage therapists need at our Eagle location.
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Temporary Massage Therapist
## 25 Temporary Massage Therapist
## 26 Licensed Massage Therapist
## 27 Massage Therapist
## 28 Massage Therapist
## 29 Massage Therapist - Independent Contractor
## 30 Licensed Massage Therapist
## 31 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapists
## 35 Massage therapists need at our Eagle location.
## 36 Massage Therapist
## 37 Temporary Massage Therapist
## 38 Licensed Massage Therapist
## 39 Massage Therapist
## 40 Massage Therapist
## 41 Massage Therapist - Independent Contractor
## 42 Licensed Massage Therapist
## 43 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 44 Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapists
## 47 Massage therapists need at our Eagle location.
## 48 Massage Therapist
## 49 Temporary Massage Therapist
## 50 Licensed Massage Therapist
## 51 Massage Therapist
## 52 Massage Therapist
## 53 Massage Therapist - Independent Contractor
## 54 Licensed Massage Therapist
## 55 Personal Trainers / Physical Therapy Assistants / Massage Th...
## 56 Massage Therapist
## 57 Massage Therapist
## 58 Licensed Massage Therapists
## 59 Massage therapists need at our Eagle location.
## 60 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 - $30 an hour $23 - $30 23 30
## 2 \n$20 - $60 an hour $20 - $60 20 60
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$30 - $52 an hour $30 - $52 30 52
## 5 \n$20 - $25 an hour $20 - $25 20 25
## 6 \n$15 - $20 an hour $15 - $20 15 20
## 7 \n$18 - $20 an hour $18 - $20 18 20
## 8 \n$25 - $40 an hour $25 - $40 25 40
## 9 \n$20 - $60 an hour $20 - $60 20 60
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 11 \n$30 - $52 an hour $30 - $52 30 52
## 12 \n$20 - $25 an hour $20 - $25 20 25
## 13 \n$18 - $20 an hour $18 - $20 18 20
## 14 \n$25 - $40 an hour $25 - $40 25 40
## 15 \n$15 - $20 an hour $15 - $20 15 20
## 16 \n$23 - $30 an hour $23 - $30 23 30
## 17 \n$23 - $30 an hour $23 - $30 23 30
## 18 \n$20 - $60 an hour $20 - $60 20 60
## 19 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 20 \n$30 - $52 an hour $30 - $52 30 52
## 21 \n$20 - $25 an hour $20 - $25 20 25
## 22 \n$15 - $20 an hour $15 - $20 15 20
## 23 \n$18 - $20 an hour $18 - $20 18 20
## 24 \n$25 - $40 an hour $25 - $40 25 40
## 25 \n$23 - $30 an hour $23 - $30 23 30
## 26 \n$20 - $60 an hour $20 - $60 20 60
## 27 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 28 \n$30 - $52 an hour $30 - $52 30 52
## 29 \n$20 - $25 an hour $20 - $25 20 25
## 30 \n$15 - $20 an hour $15 - $20 15 20
## 31 \n$18 - $20 an hour $18 - $20 18 20
## 32 \n$25 - $40 an hour $25 - $40 25 40
## 33 \n$23 - $30 an hour $23 - $30 23 30
## 34 \n$20 - $60 an hour $20 - $60 20 60
## 35 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 36 \n$30 - $52 an hour $30 - $52 30 52
## 37 \n$20 - $25 an hour $20 - $25 20 25
## 38 \n$15 - $20 an hour $15 - $20 15 20
## 39 \n$18 - $20 an hour $18 - $20 18 20
## 40 \n$25 - $40 an hour $25 - $40 25 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 21.5 25 643.875 1087.375 15
## 2 21.5 25 643.875 1087.375 15
## 3 21.5 25 643.875 1087.375 15
## 4 21.5 25 643.875 1087.375 15
## 5 21.5 25 643.875 1087.375 15
## 6 21.5 25 643.875 1087.375 15
## 7 21.5 25 643.875 1087.375 15
## 8 21.5 25 643.875 1087.375 15
## 9 21.5 25 643.875 1087.375 15
## 10 21.5 25 643.875 1087.375 15
## 11 21.5 25 643.875 1087.375 15
## 12 21.5 25 643.875 1087.375 15
## 13 21.5 25 643.875 1087.375 15
## 14 21.5 25 643.875 1087.375 15
## 15 21.5 25 643.875 1087.375 15
## 16 21.5 25 643.875 1087.375 15
## 17 21.5 25 643.875 1087.375 15
## 18 21.5 25 643.875 1087.375 15
## 19 21.5 25 643.875 1087.375 15
## 20 21.5 25 643.875 1087.375 15
## 21 21.5 25 643.875 1087.375 15
## 22 21.5 25 643.875 1087.375 15
## 23 21.5 25 643.875 1087.375 15
## 24 21.5 25 643.875 1087.375 15
## 25 21.5 25 643.875 1087.375 15
## 26 21.5 25 643.875 1087.375 15
## 27 21.5 25 643.875 1087.375 15
## 28 21.5 25 643.875 1087.375 15
## 29 21.5 25 643.875 1087.375 15
## 30 21.5 25 643.875 1087.375 15
## 31 21.5 25 643.875 1087.375 15
## 32 21.5 25 643.875 1087.375 15
## 33 21.5 25 643.875 1087.375 15
## 34 21.5 25 643.875 1087.375 15
## 35 21.5 25 643.875 1087.375 15
## 36 21.5 25 643.875 1087.375 15
## 37 21.5 25 643.875 1087.375 15
## 38 21.5 25 643.875 1087.375 15
## 39 21.5 25 643.875 1087.375 15
## 40 21.5 25 643.875 1087.375 15
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
## 34 12000
## 35 12000
## 36 12000
## 37 12000
## 38 12000
## 39 12000
## 40 12000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 7
## 3 17
## 4 16
## 5 10
## 6 17
## 7 30
## 8 30
## 9 25
## 10 30
## 11 20
## 12 26
## 13 16
## 14 17
## 15 10
## 16 17
## 17 30
## 18 25
## 19 30
## 20 20
## 21 26
## 22 7
## 23 30
## 24 14
## 25 14
## 26 7
## 27 17
## 28 16
## 29 10
## 30 17
## 31 30
## 32 30
## 33 25
## 34 30
## 35 20
## 36 26
## 37 14
## 38 7
## 39 17
## 40 16
## 41 10
## 42 17
## 43 30
## 44 30
## 45 25
## 46 30
## 47 20
## 48 26
## 49 14
## 50 7
## 51 17
## 52 16
## 53 10
## 54 17
## 55 30
## 56 30
## 57 25
## 58 30
## 59 20
## 60 26
##
## [[4]]
## HiringAgency
## 1 Keystone Physical MedicineMeridian, ID 83646
## 2 Eagle Day SpaEagle, ID 83616
## 3 Bella MerNampa, ID 83651 (Old Nampa area)
## 4 Touchmark Living3.5Meridian, ID
## 5 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 6 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 7 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 8 Elements Massage3.6Meridian, ID 83642
## 9 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 10 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 11 Idaho MassageEagle, ID 83616
## 12 Elements3.6Meridian, ID 83642+1 location
## 13 Touchmark Living3.5Meridian, ID
## 14 Bella MerNampa, ID 83651 (Old Nampa area)
## 15 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 16 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 17 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 18 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 19 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 20 Idaho MassageEagle, ID 83616
## 21 Elements3.6Meridian, ID 83642+1 location
## 22 Eagle Day SpaEagle, ID 83616
## 23 Elements Massage3.6Meridian, ID 83642
## 24 Keystone Physical MedicineMeridian, ID 83646
## 25 Keystone Physical MedicineMeridian, ID 83646
## 26 Eagle Day SpaEagle, ID 83616
## 27 Bella MerNampa, ID 83651 (Old Nampa area)
## 28 Touchmark Living3.5Meridian, ID
## 29 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 30 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 31 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 32 Elements Massage3.6Meridian, ID 83642
## 33 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 34 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 35 Idaho MassageEagle, ID 83616
## 36 Elements3.6Meridian, ID 83642+1 location
## 37 Keystone Physical MedicineMeridian, ID 83646
## 38 Eagle Day SpaEagle, ID 83616
## 39 Bella MerNampa, ID 83651 (Old Nampa area)
## 40 Touchmark Living3.5Meridian, ID
## 41 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 42 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 43 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 44 Elements Massage3.6Meridian, ID 83642
## 45 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 46 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 47 Idaho MassageEagle, ID 83616
## 48 Elements3.6Meridian, ID 83642+1 location
## 49 Keystone Physical MedicineMeridian, ID 83646
## 50 Eagle Day SpaEagle, ID 83616
## 51 Bella MerNampa, ID 83651 (Old Nampa area)
## 52 Touchmark Living3.5Meridian, ID
## 53 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 54 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 55 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 56 Elements Massage3.6Meridian, ID 83642
## 57 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 58 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 59 Idaho MassageEagle, ID 83616
## 60 Elements3.6Meridian, ID 83642+1 location
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$23 - $30 an hour $23 - $30 23 30 20
## 2 \n$20 - $60 an hour $20 - $60 20 60 20
## 4 \n$30 - $52 an hour $30 - $52 30 52 20
## 5 \n$20 - $25 an hour $20 - $25 20 25 20
## 6 \n$15 - $20 an hour $15 - $20 15 20 20
## 7 \n$18 - $20 an hour $18 - $20 18 20 20
## 8 \n$25 - $40 an hour $25 - $40 25 40 20
## 9 \n$20 - $60 an hour $20 - $60 20 60 20
## 11 \n$30 - $52 an hour $30 - $52 30 52 20
## 12 \n$20 - $25 an hour $20 - $25 20 25 20
## 13 \n$18 - $20 an hour $18 - $20 18 20 20
## 14 \n$25 - $40 an hour $25 - $40 25 40 20
## 15 \n$15 - $20 an hour $15 - $20 15 20 20
## 16 \n$23 - $30 an hour $23 - $30 23 30 20
## 17 \n$23 - $30 an hour $23 - $30 23 30 20
## 18 \n$20 - $60 an hour $20 - $60 20 60 20
## 20 \n$30 - $52 an hour $30 - $52 30 52 20
## 21 \n$20 - $25 an hour $20 - $25 20 25 20
## 22 \n$15 - $20 an hour $15 - $20 15 20 20
## 23 \n$18 - $20 an hour $18 - $20 18 20 20
## 24 \n$25 - $40 an hour $25 - $40 25 40 20
## 25 \n$23 - $30 an hour $23 - $30 23 30 20
## 26 \n$20 - $60 an hour $20 - $60 20 60 20
## 28 \n$30 - $52 an hour $30 - $52 30 52 20
## 29 \n$20 - $25 an hour $20 - $25 20 25 20
## 30 \n$15 - $20 an hour $15 - $20 15 20 20
## 31 \n$18 - $20 an hour $18 - $20 18 20 20
## 32 \n$25 - $40 an hour $25 - $40 25 40 20
## 33 \n$23 - $30 an hour $23 - $30 23 30 20
## 34 \n$20 - $60 an hour $20 - $60 20 60 20
## 36 \n$30 - $52 an hour $30 - $52 30 52 20
## 37 \n$20 - $25 an hour $20 - $25 20 25 20
## 38 \n$15 - $20 an hour $15 - $20 15 20 20
## 39 \n$18 - $20 an hour $18 - $20 18 20 20
## 40 \n$25 - $40 an hour $25 - $40 25 40 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 21.57143 35.28571 15 60
## 2 30 21.57143 35.28571 15 60
## 4 30 21.57143 35.28571 15 60
## 5 30 21.57143 35.28571 15 60
## 6 30 21.57143 35.28571 15 60
## 7 30 21.57143 35.28571 15 60
## 8 30 21.57143 35.28571 15 60
## 9 30 21.57143 35.28571 15 60
## 11 30 21.57143 35.28571 15 60
## 12 30 21.57143 35.28571 15 60
## 13 30 21.57143 35.28571 15 60
## 14 30 21.57143 35.28571 15 60
## 15 30 21.57143 35.28571 15 60
## 16 30 21.57143 35.28571 15 60
## 17 30 21.57143 35.28571 15 60
## 18 30 21.57143 35.28571 15 60
## 20 30 21.57143 35.28571 15 60
## 21 30 21.57143 35.28571 15 60
## 22 30 21.57143 35.28571 15 60
## 23 30 21.57143 35.28571 15 60
## 24 30 21.57143 35.28571 15 60
## 25 30 21.57143 35.28571 15 60
## 26 30 21.57143 35.28571 15 60
## 28 30 21.57143 35.28571 15 60
## 29 30 21.57143 35.28571 15 60
## 30 30 21.57143 35.28571 15 60
## 31 30 21.57143 35.28571 15 60
## 32 30 21.57143 35.28571 15 60
## 33 30 21.57143 35.28571 15 60
## 34 30 21.57143 35.28571 15 60
## 36 30 21.57143 35.28571 15 60
## 37 30 21.57143 35.28571 15 60
## 38 30 21.57143 35.28571 15 60
## 39 30 21.57143 35.28571 15 60
## 40 30 21.57143 35.28571 15 60
##
## [[7]]
## city state jobTitle
## 1 Nampa ID Temporary Massage Therapist
## 2 Nampa ID Licensed Massage Therapist
## 3 Nampa ID Massage Therapist
## 4 Nampa ID Massage Therapist
## 5 Nampa ID Massage Therapist - Independent Contractor
## 6 Nampa ID Licensed Massage Therapist
## 7 Nampa ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 8 Nampa ID Massage Therapist
## 9 Nampa ID Massage Therapist
## 10 Nampa ID Licensed Massage Therapists
## 11 Nampa ID Massage therapists need at our Eagle location.
## 12 Nampa ID Massage Therapist
## 13 Nampa ID Massage Therapist
## 14 Nampa ID Massage Therapist
## 15 Nampa ID Massage Therapist - Independent Contractor
## 16 Nampa ID Licensed Massage Therapist
## 17 Nampa ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 18 Nampa ID Massage Therapist
## 19 Nampa ID Licensed Massage Therapists
## 20 Nampa ID Massage therapists need at our Eagle location.
## 21 Nampa ID Massage Therapist
## 22 Nampa ID Licensed Massage Therapist
## 23 Nampa ID Massage Therapist
## 24 Nampa ID Temporary Massage Therapist
## 25 Nampa ID Temporary Massage Therapist
## 26 Nampa ID Licensed Massage Therapist
## 27 Nampa ID Massage Therapist
## 28 Nampa ID Massage Therapist
## 29 Nampa ID Massage Therapist - Independent Contractor
## 30 Nampa ID Licensed Massage Therapist
## 31 Nampa ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 32 Nampa ID Massage Therapist
## 33 Nampa ID Massage Therapist
## 34 Nampa ID Licensed Massage Therapists
## 35 Nampa ID Massage therapists need at our Eagle location.
## 36 Nampa ID Massage Therapist
## 37 Nampa ID Temporary Massage Therapist
## 38 Nampa ID Licensed Massage Therapist
## 39 Nampa ID Massage Therapist
## 40 Nampa ID Massage Therapist
## 41 Nampa ID Massage Therapist - Independent Contractor
## 42 Nampa ID Licensed Massage Therapist
## 43 Nampa ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 44 Nampa ID Massage Therapist
## 45 Nampa ID Massage Therapist
## 46 Nampa ID Licensed Massage Therapists
## 47 Nampa ID Massage therapists need at our Eagle location.
## 48 Nampa ID Massage Therapist
## 49 Nampa ID Temporary Massage Therapist
## 50 Nampa ID Licensed Massage Therapist
## 51 Nampa ID Massage Therapist
## 52 Nampa ID Massage Therapist
## 53 Nampa ID Massage Therapist - Independent Contractor
## 54 Nampa ID Licensed Massage Therapist
## 55 Nampa ID Personal Trainers / Physical Therapy Assistants / Massage Th...
## 56 Nampa ID Massage Therapist
## 57 Nampa ID Massage Therapist
## 58 Nampa ID Licensed Massage Therapists
## 59 Nampa ID Massage therapists need at our Eagle location.
## 60 Nampa ID Massage Therapist
## HiringAgency
## 1 Keystone Physical MedicineMeridian, ID 83646
## 2 Eagle Day SpaEagle, ID 83616
## 3 Bella MerNampa, ID 83651 (Old Nampa area)
## 4 Touchmark Living3.5Meridian, ID
## 5 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 6 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 7 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 8 Elements Massage3.6Meridian, ID 83642
## 9 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 10 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 11 Idaho MassageEagle, ID 83616
## 12 Elements3.6Meridian, ID 83642+1 location
## 13 Touchmark Living3.5Meridian, ID
## 14 Bella MerNampa, ID 83651 (Old Nampa area)
## 15 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 16 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 17 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 18 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 19 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 20 Idaho MassageEagle, ID 83616
## 21 Elements3.6Meridian, ID 83642+1 location
## 22 Eagle Day SpaEagle, ID 83616
## 23 Elements Massage3.6Meridian, ID 83642
## 24 Keystone Physical MedicineMeridian, ID 83646
## 25 Keystone Physical MedicineMeridian, ID 83646
## 26 Eagle Day SpaEagle, ID 83616
## 27 Bella MerNampa, ID 83651 (Old Nampa area)
## 28 Touchmark Living3.5Meridian, ID
## 29 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 30 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 31 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 32 Elements Massage3.6Meridian, ID 83642
## 33 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 34 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 35 Idaho MassageEagle, ID 83616
## 36 Elements3.6Meridian, ID 83642+1 location
## 37 Keystone Physical MedicineMeridian, ID 83646
## 38 Eagle Day SpaEagle, ID 83616
## 39 Bella MerNampa, ID 83651 (Old Nampa area)
## 40 Touchmark Living3.5Meridian, ID
## 41 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 42 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 43 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 44 Elements Massage3.6Meridian, ID 83642
## 45 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 46 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 47 Idaho MassageEagle, ID 83616
## 48 Elements3.6Meridian, ID 83642+1 location
## 49 Keystone Physical MedicineMeridian, ID 83646
## 50 Eagle Day SpaEagle, ID 83616
## 51 Bella MerNampa, ID 83651 (Old Nampa area)
## 52 Touchmark Living3.5Meridian, ID
## 53 Indo-Pak Massage TherapyCaldwell, ID+2 locations•Remote work available
## 54 Grove Fitness Club & SpaBoise, ID 83702 (Downtown area)
## 55 StretchLab - Boise & EagleEagle, ID 83616+1 location
## 56 Elements Massage3.6Meridian, ID 83642
## 57 Massage BayBoise, ID 83709 (Southwest Ada County Alliance area)
## 58 Emerald Wellness & BodyworkBoise, ID 83704 (West Valley area)
## 59 Idaho MassageEagle, ID 83616
## 60 Elements3.6Meridian, ID 83642+1 location
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 14 15 60 NA NA
## 2 7 15 60 NA NA
## 3 17 15 60 NA NA
## 4 16 15 60 NA NA
## 5 10 15 60 NA NA
## 6 17 15 60 NA NA
## 7 30 15 60 NA NA
## 8 30 15 60 NA NA
## 9 25 15 60 NA NA
## 10 30 15 60 NA NA
## 11 20 15 60 NA NA
## 12 26 15 60 NA NA
## 13 16 15 60 NA NA
## 14 17 15 60 NA NA
## 15 10 15 60 NA NA
## 16 17 15 60 NA NA
## 17 30 15 60 NA NA
## 18 25 15 60 NA NA
## 19 30 15 60 NA NA
## 20 20 15 60 NA NA
## 21 26 15 60 NA NA
## 22 7 15 60 NA NA
## 23 30 15 60 NA NA
## 24 14 15 60 NA NA
## 25 14 15 60 NA NA
## 26 7 15 60 NA NA
## 27 17 15 60 NA NA
## 28 16 15 60 NA NA
## 29 10 15 60 NA NA
## 30 17 15 60 NA NA
## 31 30 15 60 NA NA
## 32 30 15 60 NA NA
## 33 25 15 60 NA NA
## 34 30 15 60 NA NA
## 35 20 15 60 NA NA
## 36 26 15 60 NA NA
## 37 14 15 60 NA NA
## 38 7 15 60 NA NA
## 39 17 15 60 NA NA
## 40 16 15 60 NA NA
## 41 10 15 60 NA NA
## 42 17 15 60 NA NA
## 43 30 15 60 NA NA
## 44 30 15 60 NA NA
## 45 25 15 60 NA NA
## 46 30 15 60 NA NA
## 47 20 15 60 NA NA
## 48 26 15 60 NA NA
## 49 14 15 60 NA NA
## 50 7 15 60 NA NA
## 51 17 15 60 NA NA
## 52 16 15 60 NA NA
## 53 10 15 60 NA NA
## 54 17 15 60 NA NA
## 55 30 15 60 NA NA
## 56 30 15 60 NA NA
## 57 25 15 60 NA NA
## 58 30 15 60 NA NA
## 59 20 15 60 NA NA
## 60 26 15 60 NA NA
Illinois Chicago, Aurora, Naperville
getIndeedJobData5pages("massage therapist","chicago","IL")
## Warning in getIndeedJobData5pages("massage therapist", "chicago", "IL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "chicago", "IL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "chicago", "IL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "chicago", "IL"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage therapist/Chiropractic Assistant
## 3 Massage Therapist - Chicago
## 4 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 5 Massage Therapist
## 6 Experienced Massage Therapist - Independent Contractor/Part...
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Massage Therapist - Independent Contractor
## 16 Massage therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist- 900 N. Michigan Ave.
## 19 Massage Therapist- $500 Bonus
## 20 Massage Therapist - $500 Bonus
## 21 Licensed Massage Therapist (LMT)
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist (LMT)
## 26 Licensed Massage Therapist - Loop/South Suburb Locations
## 27 Massage Therapist
## 28 Licensed Massage Therapist- LMT
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Volunteer - Massage Therapist (LMT) for Hospice Patients
## 33 Stretch Technician
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Massage Therapist
## 37 Massage Therapist
## 38 Licensed Massage Therapist- LMT
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist- Orland Park
## 41 Licensed Massage Therapist (LMT)
## 42 Licensed Massage Therapist- Old Orchard Mall
## 43 Licensed Massage Therapist - $500 Bonus
## 44 Licensed Massage Therapist- Oakbrook Center
## 45 Orland Park Health & Fitness Center Massage Therapist
## 46 Massage Therapist
## 47 Flexologist (Stretch Professional)
## 48 Personal Trainer/ Yoga/Pilates/Dance/Massage Therapy
## 49 Massage Therapist
## 50 Massage Therapist
## 51 Clinical Massage Therapist $22-$25 session hour CEU Reimburs...
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist- LMT
## 54 Personal Trainer/ Physical Therapy/Yoga/Pilates/Dance/Massag...
## 55 Part Time Stretch Practitioner
## 56 Massage Therapist
## 57 Massage therapist
## 58 Massage Therapist $20-$25 session hour plus tips/bonus
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist (LMT)
## 61 Part Time Massage Therapist $22-$25 Session hour + $Bonus
## 62 Looking for ROCKSTAR Massage Therapists!!
## 63 Licensed Massage Therapist- Old Orchard Mall
## 64 Licensed Massage Therapist - $500 Bonus
## 65 Licensed Massage Therapist- Oakbrook Center
## 66 Orland Park Health & Fitness Center Massage Therapist
## 67 Massage Therapist
## 68 Flexologist (Stretch Professional)
## 69 Massage Therapy & Bodywork Adjunct Faculty Member
## 70 Personal Trainer/ Yoga/Pilates/Dance/Massage Therapy
## 71 Massage Therapist
## 72 Massage Therapist
## 73 Esthetician,Waxing tech.,Massage Therapist,Lash Artist, etc.
## 74 Experienced Massage Therapist - Independent Contractor/Part...
## 75 Massage therapist
## 76 Massage Therapist
## 77 Massage Therapist
## 78 Massage Therapist - Chicago
## 79 Massage Therapist
## 80 Massage therapist/Chiropractic Assistant
## 81 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000
## 2 \n$28,000 - $38,000 a year $28000 - $38000 28000.00 38000
## 3 \n$750 - $1,000 a week $750 - $1000 a week 750.00 NA
## 4 \n$30,000 - $90,000 a year $30000 - $90000 30000.00 90000
## 5 \n$14 - $39 an hour $14 - $39 14.00 39
## 6 \n$25 - $30 an hour $25 - $30 25.00 30
## 7 \n$30 - $35 an hour $30 - $35 30.00 35
## 8 \n$30 - $35 an hour $30 - $35 30.00 35
## 9 \n$30 - $40 an hour $30 - $40 30.00 40
## 10 \n$27 - $40 an hour $27 - $40 27.00 40
## 11 \n$25 - $30 an hour $25 - $30 25.00 30
## 12 \n$25 - $30 an hour $25 - $30 25.00 30
## 13 \n$43,000 - $62,000 a year $43000 - $62000 43000.00 62000
## 14 \n$150 a day $150 150.00 NA
## 15 \n$40,000 a year $40000 40000.00 NA
## 16 \n$29 - $30 an hour $29 - $30 29.00 30
## 17 \nFrom $50 per session $50 per session NA NA
## 18 \n$18 - $22 an hour $18 - $22 18.00 22
## 19 \n$23 - $49 an hour $23 - $49 23.00 49
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 21 \n$33,000 - $55,000 a year $33000 - $55000 33000.00 55000
## 22 \n$18 - $22 an hour $18 - $22 18.00 22
## 23 \n$23 - $49 an hour $23 - $49 23.00 49
## 24 \n$150 a day $150 150.00 NA
## 25 \n$35,000 - $70,000 a year $35000 - $70000 35000.00 70000
## 26 \n$150 a day $150 150.00 NA
## 27 \n$150 a day $150 150.00 NA
## 28 \n$38.25 an hour $38.25 38.25 NA
## 29 \n$22 - $25 per session $22 - $25 per session 22.00 NA
## 30 \n$17 - $51 an hour $17 - $51 17.00 51
## 31 \n$23 - $49 an hour $23 - $49 23.00 49
## 32 \n$10 - $20 an hour $10 - $20 10.00 20
## 33 \n$28 - $35 an hour $28 - $35 28.00 35
## 34 \n$20 - $25 an hour $20 - $25 20.00 25
## 35 \n$20 - $25 an hour $20 - $25 20.00 25
## 36 \n$25 - $30 an hour $25 - $30 25.00 30
## 37 \n$150 a day $150 150.00 NA
## 38 \n$150 a day $150 150.00 NA
## 39 \n$38.25 an hour $38.25 38.25 NA
## 40 \n$43,906 - $74,000 a year $43906 - $74000 43906.00 74000
## 41 \n$14 - $39 an hour $14 - $39 14.00 39
## 42 \n$25 - $30 an hour $25 - $30 25.00 30
## 43 \n$750 - $1,000 a week $750 - $1000 a week 750.00 NA
## 44 \n$43,000 - $62,000 a year $43000 - $62000 43000.00 62000
## 45 \n$28,000 - $38,000 a year $28000 - $38000 28000.00 38000
## 46 \n$35,000 - $50,000 a year $35000 - $50000 35000.00 50000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 38.625 9820.078 13995.62 10
## 2 30 38.625 9820.078 13995.62 10
## 3 30 38.625 9820.078 13995.62 10
## 4 30 38.625 9820.078 13995.62 10
## 5 30 38.625 9820.078 13995.62 10
## 6 30 38.625 9820.078 13995.62 10
## 7 30 38.625 9820.078 13995.62 10
## 8 30 38.625 9820.078 13995.62 10
## 9 30 38.625 9820.078 13995.62 10
## 10 30 38.625 9820.078 13995.62 10
## 11 30 38.625 9820.078 13995.62 10
## 12 30 38.625 9820.078 13995.62 10
## 13 30 38.625 9820.078 13995.62 10
## 14 30 38.625 9820.078 13995.62 10
## 15 30 38.625 9820.078 13995.62 10
## 16 30 38.625 9820.078 13995.62 10
## 17 30 38.625 9820.078 13995.62 10
## 18 30 38.625 9820.078 13995.62 10
## 19 30 38.625 9820.078 13995.62 10
## 20 30 38.625 9820.078 13995.62 10
## 21 30 38.625 9820.078 13995.62 10
## 22 30 38.625 9820.078 13995.62 10
## 23 30 38.625 9820.078 13995.62 10
## 24 30 38.625 9820.078 13995.62 10
## 25 30 38.625 9820.078 13995.62 10
## 26 30 38.625 9820.078 13995.62 10
## 27 30 38.625 9820.078 13995.62 10
## 28 30 38.625 9820.078 13995.62 10
## 29 30 38.625 9820.078 13995.62 10
## 30 30 38.625 9820.078 13995.62 10
## 31 30 38.625 9820.078 13995.62 10
## 32 30 38.625 9820.078 13995.62 10
## 33 30 38.625 9820.078 13995.62 10
## 34 30 38.625 9820.078 13995.62 10
## 35 30 38.625 9820.078 13995.62 10
## 36 30 38.625 9820.078 13995.62 10
## 37 30 38.625 9820.078 13995.62 10
## 38 30 38.625 9820.078 13995.62 10
## 39 30 38.625 9820.078 13995.62 10
## 40 30 38.625 9820.078 13995.62 10
## 41 30 38.625 9820.078 13995.62 10
## 42 30 38.625 9820.078 13995.62 10
## 43 30 38.625 9820.078 13995.62 10
## 44 30 38.625 9820.078 13995.62 10
## 45 30 38.625 9820.078 13995.62 10
## 46 30 38.625 9820.078 13995.62 10
## maximumMaxSalary
## 1 90000
## 2 90000
## 3 90000
## 4 90000
## 5 90000
## 6 90000
## 7 90000
## 8 90000
## 9 90000
## 10 90000
## 11 90000
## 12 90000
## 13 90000
## 14 90000
## 15 90000
## 16 90000
## 17 90000
## 18 90000
## 19 90000
## 20 90000
## 21 90000
## 22 90000
## 23 90000
## 24 90000
## 25 90000
## 26 90000
## 27 90000
## 28 90000
## 29 90000
## 30 90000
## 31 90000
## 32 90000
## 33 90000
## 34 90000
## 35 90000
## 36 90000
## 37 90000
## 38 90000
## 39 90000
## 40 90000
## 41 90000
## 42 90000
## 43 90000
## 44 90000
## 45 90000
## 46 90000
##
## [[3]]
## date_daysAgo
## 1 Today
## 2 12
## 3 30
## 4 30
## 5 30
## 6 11
## 7 8
## 8 Just posted
## 9 13
## 10 8
## 11 11
## 12 1
## 13 5
## 14 1
## 15 30
## 16 19
## 17 21
## 18 30
## 19 30
## 20 30
## 21 15
## 22 30
## 23 13
## 24 30
## 25 8
## 26 30
## 27 14
## 28 30
## 29 11
## 30 Just posted
## 31 30
## 32 2
## 33 6
## 34 26
## 35 8
## 36 30
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 22
## 47 30
## 48 30
## 49 30
## 50 17
## 51 14
## 52 28
## 53 30
## 54 30
## 55 7
## 56 30
## 57 30
## 58 30
## 59 30
## 60 30
## 61 14
## 62 14
## 63 30
## 64 30
## 65 30
## 66 30
## 67 22
## 68 30
## 69 6
## 70 30
## 71 30
## 72 17
## 73 30
## 74 11
## 75 19
## 76 30
## 77 8
## 78 30
## 79 21
## 80 12
## 81 Today
##
## [[4]]
## HiringAgency
## 1 Windy City Massage3.2Chicago, IL 60601 (New Eastside area)
## 2 Chiropractic Health, Wellness & RehabilitationGlenview, IL 60025
## 3 Hand and Stone Massage and Facial SpaChicago, IL
## 4 Salon & Spa RecruitingChicago, IL 60642 (Goose Island area)
## 5 Asha SalonSpa3.1Lombard, IL
## 6 Hyde Park Chiropractic Wellness CenterChicago, IL 60653 (North Kenwood area)
## 7 Vive! Therapeutic MassagePark Ridge, IL 60068
## 8 Thai Lotus BodyworkChicago, IL 60605 (South Loop area)
## 9 West Loop Spine & StabilityChicago, IL 60607 (West Town area)
## 10 West Loop Spine & StabilityChicago, IL 60607 (West Town area)
## 11 Lume WellnessChicago, IL (River North area)
## 12 Asha SalonSpa3.1Chicago, IL+1 location
## 13 Be Well.4.5Chicago, IL 60618 (North Center area)
## 14 Chicago Chiropractic & Sports MedicineNorthfield, IL 60093
## 15 ReAlign ChiropracticChicago, IL
## 16 Pain Stop WellnessChicago, IL 60608 (Bridgeport area)
## 17 Elements Massage\231 – (South Loop)3.6Chicago, IL 60605 (South Loop area)
## 18 Mario Tricoci Hair Salon and Day SpasChicago, IL 60611 (Streeterville area)
## 19 Heavenly Massage3.8Chicago, IL
## 20 Heavenly Massage3.8Chicago, IL+3 locations
## 21 Active Care Chiropractic & RehabilitationArlington Heights, IL 60004
## 22 WTS International3.3Chicago, IL 60611 (Near North area)
## 23 Wellness RevolutionEvanston, IL 60201 (Noyes and Foster area)
## 24 PhysioPartnersChicago, IL 60602 (Loop area)
## 25 Olympia Chiropractic and Physical Therapy3.8Elmhurst, IL 60126
## 26 Aligned Modern Health3.0Chicago, IL
## 27 Massage Envy3.2Chicago, IL 60605 (South Loop area)+11 locations
## 28 Salon/SpaChicago, IL 60657 (Lake View area)
## 29 Wellness Clinic4.0Elmhurst, IL+3 locations
## 30 Massage Envy Park Ridge3.2Park Ridge, IL 60068+9 locations
## 31 Hand and Stone3.0Chicago, IL 60605 (Near South Side area)+4 locations
## 32 Rainbow Hospice and Palliative Care4.3Addison, IL 60101+5 locations
## 33 Restore Hyper Wellness of ChicagoNorthbrook, IL 60062
## 34 Spavia Day Spa3.3Elmhurst, IL 60126+1 location
## 35 Precision WellnessArlington Hts, IL 60004
## 36 Power Wellness3.1Orland Park, IL 60462
## 37 Life Time3.6Burr Ridge, IL 60527+4 locations
## 38 Salon/SpaChicago, IL 60657 (Lake View area)
## 39 Elements3.6Park Ridge, IL 60068
## 40 Mario Tricoci Hair Salon and Day SpasOrland Park, IL 60462+2 locations
## 41 Hand and Stone Massage and Facial Spa - Rolling Me...3.0Rolling Meadows, IL 60008
## 42 Mario Tricoci Hair Salon and Day SpasSkokie, IL 60077
## 43 Heavenly Massage3.8Morton Grove, IL+1 location
## 44 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 45 Power Wellness3.1Orland Park, IL 60462
## 46 C'zar Salon SpaWheaton, IL
## 47 StretchLab Lakeview3.8Chicago, IL
## 48 StretchLab Lakeview3.8Chicago, IL
## 49 Hit the Floor FitnessWinnetka, IL 60093
## 50 Fitness Formula Clubs (FFC)Chicago, IL 60661 (West Loop Gate area)+3 locations
## 51 Massage Envy3.2Chicago, IL 60614 (Lincoln Park area)
## 52 Elite Wellness3.7Highland Park, IL 60035
## 53 Salon/SpaChicago, IL 60657 (Lake View area)
## 54 StretchLab Old Town3.8Chicago, IL
## 55 Stretch Zone2.7Willowbrook, IL 60527
## 56 TBD Fitness & Holistic HealthElk Grove Village, IL 60007
## 57 Roselle ChiropracticRoselle, IL 60172
## 58 Massage Envy3.2Chicago, IL 60614 (Ranch Triangle area)
## 59 Massage Envy Chicago Lincoln ParkChicago, IL 60614 (Wrightwood Neighbors area)
## 60 Hand & Stone Spa - Chicago Lakeview3.0Chicago, IL (Roscoe Village area)
## 61 Massage Envy3.2Chicago, IL 60610 (Old Town area)
## 62 Helping Hands Massage & ChiropracticNorthbrook, IL 60062
## 63 Mario Tricoci Hair Salon and Day SpasSkokie, IL 60077
## 64 Heavenly Massage3.8Morton Grove, IL+1 location
## 65 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 66 Power Wellness3.1Orland Park, IL 60462
## 67 C'zar Salon SpaWheaton, IL
## 68 StretchLab Lakeview3.8Chicago, IL
## 69 Pacific College of Health and ScienceChicago, IL 60601 (The Loop area)
## 70 StretchLab Lakeview3.8Chicago, IL
## 71 Hit the Floor FitnessWinnetka, IL 60093
## 72 Fitness Formula Clubs (FFC)Chicago, IL 60661 (West Loop Gate area)+3 locations
## 73 Aura SpaNiles, IL 60714
## 74 Hyde Park Chiropractic Wellness CenterChicago, IL 60653 (North Kenwood area)
## 75 Pain Stop WellnessChicago, IL 60608 (Bridgeport area)
## 76 Asha SalonSpa3.1Lombard, IL
## 77 Vive! Therapeutic MassagePark Ridge, IL 60068
## 78 Hand and Stone Massage and Facial SpaChicago, IL
## 79 Elements Massage\231 – (South Loop)3.6Chicago, IL 60605 (South Loop area)
## 80 Chiropractic Health, Wellness & RehabilitationGlenview, IL 60025
## 81 Windy City Massage3.2Chicago, IL 60601 (New Eastside area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 2 \n$28,000 - $38,000 a year $28000 - $38000 28000 38000
## 4 \n$30,000 - $90,000 a year $30000 - $90000 30000 90000
## 13 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 15 \n$40,000 a year $40000 40000 NA
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 21 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 25 \n$35,000 - $70,000 a year $35000 - $70000 35000 70000
## 40 \n$43,906 - $74,000 a year $43906 - $74000 43906 74000
## 44 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 45 \n$28,000 - $38,000 a year $28000 - $38000 28000 38000
## 46 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35000 60000 36575.5 59000 28000
## 2 35000 60000 36575.5 59000 28000
## 4 35000 60000 36575.5 59000 28000
## 13 35000 60000 36575.5 59000 28000
## 15 35000 60000 36575.5 59000 28000
## 20 35000 60000 36575.5 59000 28000
## 21 35000 60000 36575.5 59000 28000
## 25 35000 60000 36575.5 59000 28000
## 40 35000 60000 36575.5 59000 28000
## 44 35000 60000 36575.5 59000 28000
## 45 35000 60000 36575.5 59000 28000
## 46 35000 60000 36575.5 59000 28000
## maximumMaxSalary
## 1 90000
## 2 90000
## 4 90000
## 13 90000
## 15 90000
## 20 90000
## 21 90000
## 25 90000
## 40 90000
## 44 90000
## 45 90000
## 46 90000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 5 \n$14 - $39 an hour $14 - $39 14.00 39 25
## 6 \n$25 - $30 an hour $25 - $30 25.00 30 25
## 7 \n$30 - $35 an hour $30 - $35 30.00 35 25
## 8 \n$30 - $35 an hour $30 - $35 30.00 35 25
## 9 \n$30 - $40 an hour $30 - $40 30.00 40 25
## 10 \n$27 - $40 an hour $27 - $40 27.00 40 25
## 11 \n$25 - $30 an hour $25 - $30 25.00 30 25
## 12 \n$25 - $30 an hour $25 - $30 25.00 30 25
## 16 \n$29 - $30 an hour $29 - $30 29.00 30 25
## 18 \n$18 - $22 an hour $18 - $22 18.00 22 25
## 19 \n$23 - $49 an hour $23 - $49 23.00 49 25
## 22 \n$18 - $22 an hour $18 - $22 18.00 22 25
## 23 \n$23 - $49 an hour $23 - $49 23.00 49 25
## 28 \n$38.25 an hour $38.25 38.25 NA 25
## 30 \n$17 - $51 an hour $17 - $51 17.00 51 25
## 31 \n$23 - $49 an hour $23 - $49 23.00 49 25
## 32 \n$10 - $20 an hour $10 - $20 10.00 20 25
## 33 \n$28 - $35 an hour $28 - $35 28.00 35 25
## 34 \n$20 - $25 an hour $20 - $25 20.00 25 25
## 35 \n$20 - $25 an hour $20 - $25 20.00 25 25
## 36 \n$25 - $30 an hour $25 - $30 25.00 30 25
## 39 \n$38.25 an hour $38.25 38.25 NA 25
## 41 \n$14 - $39 an hour $14 - $39 14.00 39 25
## 42 \n$25 - $30 an hour $25 - $30 25.00 30 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 5 32.5 23.97917 34.31818 10 51
## 6 32.5 23.97917 34.31818 10 51
## 7 32.5 23.97917 34.31818 10 51
## 8 32.5 23.97917 34.31818 10 51
## 9 32.5 23.97917 34.31818 10 51
## 10 32.5 23.97917 34.31818 10 51
## 11 32.5 23.97917 34.31818 10 51
## 12 32.5 23.97917 34.31818 10 51
## 16 32.5 23.97917 34.31818 10 51
## 18 32.5 23.97917 34.31818 10 51
## 19 32.5 23.97917 34.31818 10 51
## 22 32.5 23.97917 34.31818 10 51
## 23 32.5 23.97917 34.31818 10 51
## 28 32.5 23.97917 34.31818 10 51
## 30 32.5 23.97917 34.31818 10 51
## 31 32.5 23.97917 34.31818 10 51
## 32 32.5 23.97917 34.31818 10 51
## 33 32.5 23.97917 34.31818 10 51
## 34 32.5 23.97917 34.31818 10 51
## 35 32.5 23.97917 34.31818 10 51
## 36 32.5 23.97917 34.31818 10 51
## 39 32.5 23.97917 34.31818 10 51
## 41 32.5 23.97917 34.31818 10 51
## 42 32.5 23.97917 34.31818 10 51
##
## [[7]]
## city state
## 1 chicago IL
## 2 chicago IL
## 3 chicago IL
## 4 chicago IL
## 5 chicago IL
## 6 chicago IL
## 7 chicago IL
## 8 chicago IL
## 9 chicago IL
## 10 chicago IL
## 11 chicago IL
## 12 chicago IL
## 13 chicago IL
## 14 chicago IL
## 15 chicago IL
## 16 chicago IL
## 17 chicago IL
## 18 chicago IL
## 19 chicago IL
## 20 chicago IL
## 21 chicago IL
## 22 chicago IL
## 23 chicago IL
## 24 chicago IL
## 25 chicago IL
## 26 chicago IL
## 27 chicago IL
## 28 chicago IL
## 29 chicago IL
## 30 chicago IL
## 31 chicago IL
## 32 chicago IL
## 33 chicago IL
## 34 chicago IL
## 35 chicago IL
## 36 chicago IL
## 37 chicago IL
## 38 chicago IL
## 39 chicago IL
## 40 chicago IL
## 41 chicago IL
## 42 chicago IL
## 43 chicago IL
## 44 chicago IL
## 45 chicago IL
## 46 chicago IL
## 47 chicago IL
## 48 chicago IL
## 49 chicago IL
## 50 chicago IL
## 51 chicago IL
## 52 chicago IL
## 53 chicago IL
## 54 chicago IL
## 55 chicago IL
## 56 chicago IL
## 57 chicago IL
## 58 chicago IL
## 59 chicago IL
## 60 chicago IL
## 61 chicago IL
## 62 chicago IL
## 63 chicago IL
## 64 chicago IL
## 65 chicago IL
## 66 chicago IL
## 67 chicago IL
## 68 chicago IL
## 69 chicago IL
## 70 chicago IL
## 71 chicago IL
## 72 chicago IL
## 73 chicago IL
## 74 chicago IL
## 75 chicago IL
## 76 chicago IL
## 77 chicago IL
## 78 chicago IL
## 79 chicago IL
## 80 chicago IL
## 81 chicago IL
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage therapist/Chiropractic Assistant
## 3 Massage Therapist - Chicago
## 4 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 5 Massage Therapist
## 6 Experienced Massage Therapist - Independent Contractor/Part...
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Massage Therapist - Independent Contractor
## 16 Massage therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist- 900 N. Michigan Ave.
## 19 Massage Therapist- $500 Bonus
## 20 Massage Therapist - $500 Bonus
## 21 Licensed Massage Therapist (LMT)
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist (LMT)
## 26 Licensed Massage Therapist - Loop/South Suburb Locations
## 27 Massage Therapist
## 28 Licensed Massage Therapist- LMT
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Volunteer - Massage Therapist (LMT) for Hospice Patients
## 33 Stretch Technician
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Massage Therapist
## 37 Massage Therapist
## 38 Licensed Massage Therapist- LMT
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist- Orland Park
## 41 Licensed Massage Therapist (LMT)
## 42 Licensed Massage Therapist- Old Orchard Mall
## 43 Licensed Massage Therapist - $500 Bonus
## 44 Licensed Massage Therapist- Oakbrook Center
## 45 Orland Park Health & Fitness Center Massage Therapist
## 46 Massage Therapist
## 47 Flexologist (Stretch Professional)
## 48 Personal Trainer/ Yoga/Pilates/Dance/Massage Therapy
## 49 Massage Therapist
## 50 Massage Therapist
## 51 Clinical Massage Therapist $22-$25 session hour CEU Reimburs...
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist- LMT
## 54 Personal Trainer/ Physical Therapy/Yoga/Pilates/Dance/Massag...
## 55 Part Time Stretch Practitioner
## 56 Massage Therapist
## 57 Massage therapist
## 58 Massage Therapist $20-$25 session hour plus tips/bonus
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist (LMT)
## 61 Part Time Massage Therapist $22-$25 Session hour + $Bonus
## 62 Looking for ROCKSTAR Massage Therapists!!
## 63 Licensed Massage Therapist- Old Orchard Mall
## 64 Licensed Massage Therapist - $500 Bonus
## 65 Licensed Massage Therapist- Oakbrook Center
## 66 Orland Park Health & Fitness Center Massage Therapist
## 67 Massage Therapist
## 68 Flexologist (Stretch Professional)
## 69 Massage Therapy & Bodywork Adjunct Faculty Member
## 70 Personal Trainer/ Yoga/Pilates/Dance/Massage Therapy
## 71 Massage Therapist
## 72 Massage Therapist
## 73 Esthetician,Waxing tech.,Massage Therapist,Lash Artist, etc.
## 74 Experienced Massage Therapist - Independent Contractor/Part...
## 75 Massage therapist
## 76 Massage Therapist
## 77 Massage Therapist
## 78 Massage Therapist - Chicago
## 79 Massage Therapist
## 80 Massage therapist/Chiropractic Assistant
## 81 Licensed Massage Therapist
## HiringAgency
## 1 Windy City Massage3.2Chicago, IL 60601 (New Eastside area)
## 2 Chiropractic Health, Wellness & RehabilitationGlenview, IL 60025
## 3 Hand and Stone Massage and Facial SpaChicago, IL
## 4 Salon & Spa RecruitingChicago, IL 60642 (Goose Island area)
## 5 Asha SalonSpa3.1Lombard, IL
## 6 Hyde Park Chiropractic Wellness CenterChicago, IL 60653 (North Kenwood area)
## 7 Vive! Therapeutic MassagePark Ridge, IL 60068
## 8 Thai Lotus BodyworkChicago, IL 60605 (South Loop area)
## 9 West Loop Spine & StabilityChicago, IL 60607 (West Town area)
## 10 West Loop Spine & StabilityChicago, IL 60607 (West Town area)
## 11 Lume WellnessChicago, IL (River North area)
## 12 Asha SalonSpa3.1Chicago, IL+1 location
## 13 Be Well.4.5Chicago, IL 60618 (North Center area)
## 14 Chicago Chiropractic & Sports MedicineNorthfield, IL 60093
## 15 ReAlign ChiropracticChicago, IL
## 16 Pain Stop WellnessChicago, IL 60608 (Bridgeport area)
## 17 Elements Massage\231 – (South Loop)3.6Chicago, IL 60605 (South Loop area)
## 18 Mario Tricoci Hair Salon and Day SpasChicago, IL 60611 (Streeterville area)
## 19 Heavenly Massage3.8Chicago, IL
## 20 Heavenly Massage3.8Chicago, IL+3 locations
## 21 Active Care Chiropractic & RehabilitationArlington Heights, IL 60004
## 22 WTS International3.3Chicago, IL 60611 (Near North area)
## 23 Wellness RevolutionEvanston, IL 60201 (Noyes and Foster area)
## 24 PhysioPartnersChicago, IL 60602 (Loop area)
## 25 Olympia Chiropractic and Physical Therapy3.8Elmhurst, IL 60126
## 26 Aligned Modern Health3.0Chicago, IL
## 27 Massage Envy3.2Chicago, IL 60605 (South Loop area)+11 locations
## 28 Salon/SpaChicago, IL 60657 (Lake View area)
## 29 Wellness Clinic4.0Elmhurst, IL+3 locations
## 30 Massage Envy Park Ridge3.2Park Ridge, IL 60068+9 locations
## 31 Hand and Stone3.0Chicago, IL 60605 (Near South Side area)+4 locations
## 32 Rainbow Hospice and Palliative Care4.3Addison, IL 60101+5 locations
## 33 Restore Hyper Wellness of ChicagoNorthbrook, IL 60062
## 34 Spavia Day Spa3.3Elmhurst, IL 60126+1 location
## 35 Precision WellnessArlington Hts, IL 60004
## 36 Power Wellness3.1Orland Park, IL 60462
## 37 Life Time3.6Burr Ridge, IL 60527+4 locations
## 38 Salon/SpaChicago, IL 60657 (Lake View area)
## 39 Elements3.6Park Ridge, IL 60068
## 40 Mario Tricoci Hair Salon and Day SpasOrland Park, IL 60462+2 locations
## 41 Hand and Stone Massage and Facial Spa - Rolling Me...3.0Rolling Meadows, IL 60008
## 42 Mario Tricoci Hair Salon and Day SpasSkokie, IL 60077
## 43 Heavenly Massage3.8Morton Grove, IL+1 location
## 44 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 45 Power Wellness3.1Orland Park, IL 60462
## 46 C'zar Salon SpaWheaton, IL
## 47 StretchLab Lakeview3.8Chicago, IL
## 48 StretchLab Lakeview3.8Chicago, IL
## 49 Hit the Floor FitnessWinnetka, IL 60093
## 50 Fitness Formula Clubs (FFC)Chicago, IL 60661 (West Loop Gate area)+3 locations
## 51 Massage Envy3.2Chicago, IL 60614 (Lincoln Park area)
## 52 Elite Wellness3.7Highland Park, IL 60035
## 53 Salon/SpaChicago, IL 60657 (Lake View area)
## 54 StretchLab Old Town3.8Chicago, IL
## 55 Stretch Zone2.7Willowbrook, IL 60527
## 56 TBD Fitness & Holistic HealthElk Grove Village, IL 60007
## 57 Roselle ChiropracticRoselle, IL 60172
## 58 Massage Envy3.2Chicago, IL 60614 (Ranch Triangle area)
## 59 Massage Envy Chicago Lincoln ParkChicago, IL 60614 (Wrightwood Neighbors area)
## 60 Hand & Stone Spa - Chicago Lakeview3.0Chicago, IL (Roscoe Village area)
## 61 Massage Envy3.2Chicago, IL 60610 (Old Town area)
## 62 Helping Hands Massage & ChiropracticNorthbrook, IL 60062
## 63 Mario Tricoci Hair Salon and Day SpasSkokie, IL 60077
## 64 Heavenly Massage3.8Morton Grove, IL+1 location
## 65 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 66 Power Wellness3.1Orland Park, IL 60462
## 67 C'zar Salon SpaWheaton, IL
## 68 StretchLab Lakeview3.8Chicago, IL
## 69 Pacific College of Health and ScienceChicago, IL 60601 (The Loop area)
## 70 StretchLab Lakeview3.8Chicago, IL
## 71 Hit the Floor FitnessWinnetka, IL 60093
## 72 Fitness Formula Clubs (FFC)Chicago, IL 60661 (West Loop Gate area)+3 locations
## 73 Aura SpaNiles, IL 60714
## 74 Hyde Park Chiropractic Wellness CenterChicago, IL 60653 (North Kenwood area)
## 75 Pain Stop WellnessChicago, IL 60608 (Bridgeport area)
## 76 Asha SalonSpa3.1Lombard, IL
## 77 Vive! Therapeutic MassagePark Ridge, IL 60068
## 78 Hand and Stone Massage and Facial SpaChicago, IL
## 79 Elements Massage\231 – (South Loop)3.6Chicago, IL 60605 (South Loop area)
## 80 Chiropractic Health, Wellness & RehabilitationGlenview, IL 60025
## 81 Windy City Massage3.2Chicago, IL 60601 (New Eastside area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 Today 10 51 28000 90000
## 2 12 10 51 28000 90000
## 3 30 10 51 28000 90000
## 4 30 10 51 28000 90000
## 5 30 10 51 28000 90000
## 6 11 10 51 28000 90000
## 7 8 10 51 28000 90000
## 8 Just posted 10 51 28000 90000
## 9 13 10 51 28000 90000
## 10 8 10 51 28000 90000
## 11 11 10 51 28000 90000
## 12 1 10 51 28000 90000
## 13 5 10 51 28000 90000
## 14 1 10 51 28000 90000
## 15 30 10 51 28000 90000
## 16 19 10 51 28000 90000
## 17 21 10 51 28000 90000
## 18 30 10 51 28000 90000
## 19 30 10 51 28000 90000
## 20 30 10 51 28000 90000
## 21 15 10 51 28000 90000
## 22 30 10 51 28000 90000
## 23 13 10 51 28000 90000
## 24 30 10 51 28000 90000
## 25 8 10 51 28000 90000
## 26 30 10 51 28000 90000
## 27 14 10 51 28000 90000
## 28 30 10 51 28000 90000
## 29 11 10 51 28000 90000
## 30 Just posted 10 51 28000 90000
## 31 30 10 51 28000 90000
## 32 2 10 51 28000 90000
## 33 6 10 51 28000 90000
## 34 26 10 51 28000 90000
## 35 8 10 51 28000 90000
## 36 30 10 51 28000 90000
## 37 30 10 51 28000 90000
## 38 30 10 51 28000 90000
## 39 30 10 51 28000 90000
## 40 30 10 51 28000 90000
## 41 30 10 51 28000 90000
## 42 30 10 51 28000 90000
## 43 30 10 51 28000 90000
## 44 30 10 51 28000 90000
## 45 30 10 51 28000 90000
## 46 22 10 51 28000 90000
## 47 30 10 51 28000 90000
## 48 30 10 51 28000 90000
## 49 30 10 51 28000 90000
## 50 17 10 51 28000 90000
## 51 14 10 51 28000 90000
## 52 28 10 51 28000 90000
## 53 30 10 51 28000 90000
## 54 30 10 51 28000 90000
## 55 7 10 51 28000 90000
## 56 30 10 51 28000 90000
## 57 30 10 51 28000 90000
## 58 30 10 51 28000 90000
## 59 30 10 51 28000 90000
## 60 30 10 51 28000 90000
## 61 14 10 51 28000 90000
## 62 14 10 51 28000 90000
## 63 30 10 51 28000 90000
## 64 30 10 51 28000 90000
## 65 30 10 51 28000 90000
## 66 30 10 51 28000 90000
## 67 22 10 51 28000 90000
## 68 30 10 51 28000 90000
## 69 6 10 51 28000 90000
## 70 30 10 51 28000 90000
## 71 30 10 51 28000 90000
## 72 17 10 51 28000 90000
## 73 30 10 51 28000 90000
## 74 11 10 51 28000 90000
## 75 19 10 51 28000 90000
## 76 30 10 51 28000 90000
## 77 8 10 51 28000 90000
## 78 30 10 51 28000 90000
## 79 21 10 51 28000 90000
## 80 12 10 51 28000 90000
## 81 Today 10 51 28000 90000
getIndeedJobData5pages("massage therapist","aurora","IL")
## Warning in getIndeedJobData5pages("massage therapist", "aurora", "IL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "aurora", "IL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "aurora", "IL"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist - South Elgin
## 3 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 4 Massage Therapist - Independent Contractor
## 5 Massage Therapist for a Luxury spa
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist- Geneva
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist- Full or Part Time (Naperville, IL)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist - Lisle, IL
## 15 Licensed Massage Therapist (for Assisted Stretching)
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist - Independent Contractor
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist (LMT)
## 20 Flexologist (Stretch Professional)
## 21 Licensed Massage Therapist
## 22 Massage Therapists
## 23 Licensed Massage Therapist LMT BUSY
## 24 Licensed Massage Therapist- Oakbrook Center
## 25 Licensed Massage Therapist LMT BUSY LOCATION
## 26 Licensed Massage Therapist, Independent Contractor
## 27 Licensed Massage Therapist - Schaumburg
## 28 Massage therapist
## 29 Part Time Stretch Practitioner
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist for a Luxury spa
## 36 Massage Therapist
## 37 Licensed Massage Therapist LMT BUSY LOCATION
## 38 Licensed Massage Therapist, Independent Contractor
## 39 Licensed Massage Therapist - Schaumburg
## 40 Massage therapist
## 41 Part Time Stretch Practitioner
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist LMT BUSY LOCATION
## 44 Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 45 Licensed Massage Therapist Part Time
## 46 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 47 Licensed Massage Therapist (LMT) (MT)
## 48 Massage Therapist - South Elgin
## 49 Flexologist (Stretch Professional)
## 50 Licensed Massage Therapist
## 51 Massage Therapists
## 52 Licensed Massage Therapist LMT BUSY
## 53 Licensed Massage Therapist- Oakbrook Center
## 54 Licensed Massage Therapist LMT BUSY LOCATION
## 55 Licensed Massage Therapist, Independent Contractor
## 56 Licensed Massage Therapist - Schaumburg
## 57 Massage therapist
## 58 Part Time Stretch Practitioner
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist LMT BUSY LOCATION
## 61 Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 62 Massage Therapist-PART TIME HOURS
## 63 Massage Therapist
## 64 Flexologist (Stretch Professional)
## 65 Licensed Massage Therapist
## 66 Massage Therapists
## 67 Licensed Massage Therapist LMT BUSY
## 68 Licensed Massage Therapist- Oakbrook Center
## 69 Licensed Massage Therapist LMT BUSY LOCATION
## 70 Licensed Massage Therapist, Independent Contractor
## 71 Licensed Massage Therapist - Schaumburg
## 72 Massage therapist
## 73 Part Time Stretch Practitioner
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist LMT BUSY LOCATION
## 76 Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 77 Massage Therapist-PART TIME HOURS
## 78 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$60,000 a year ++ $60000 60000 NA
## 2 \n$750 - $1,000 a week $750 - $1000 a week 750 NA
## 3 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 4 \n$45 an hour $45 45 NA
## 5 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 6 \n$25 - $35 an hour $25 - $35 25 35
## 7 \n$62,000 a year $62000 62000 NA
## 8 \n$150 a day $150 150 NA
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$60 - $65 an hour $60 - $65 60 65
## 11 \n$18 - $22 an hour $18 - $22 18 22
## 12 \n$15 - $30 an hour $15 - $30 15 30
## 13 \n$38,000 - $70,000 a year $38000 - $70000 38000 70000
## 14 \n$27 - $34 an hour $27 - $34 27 34
## 15 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 16 \n$18 - $27 an hour $18 - $27 18 27
## 17 \n$150 a day $150 150 NA
## 18 \n$28 - $35 an hour $28 - $35 28 35
## 19 \n$10 - $20 an hour $10 - $20 10 20
## 20 \n$20 - $25 an hour $20 - $25 20 25
## 21 \n$25 - $35 an hour $25 - $35 25 35
## 22 \n$60,000 a year ++ $60000 60000 NA
## 23 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 24 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 25 \n$28 - $35 an hour $28 - $35 28 35
## 26 \n$10 - $20 an hour $10 - $20 10 20
## 27 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 28 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 29 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 30 \n$750 - $1,000 a week $750 - $1000 a week 750 NA
## 31 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 32 \n$18 - $27 an hour $18 - $27 18 27
## 33 \n$150 a day $150 150 NA
## 34 \n$28 - $35 an hour $28 - $35 28 35
## 35 \n$10 - $20 an hour $10 - $20 10 20
## 36 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 37 \n$17 an hour ++ $17 17 NA
## 38 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 39 \n$18 - $27 an hour $18 - $27 18 27
## 40 \n$150 a day $150 150 NA
## 41 \n$28 - $35 an hour $28 - $35 28 35
## 42 \n$10 - $20 an hour $10 - $20 10 20
## 43 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 44 \n$17 an hour ++ $17 17 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 150 62.5 14922.16 19264.76 10
## 2 150 62.5 14922.16 19264.76 10
## 3 150 62.5 14922.16 19264.76 10
## 4 150 62.5 14922.16 19264.76 10
## 5 150 62.5 14922.16 19264.76 10
## 6 150 62.5 14922.16 19264.76 10
## 7 150 62.5 14922.16 19264.76 10
## 8 150 62.5 14922.16 19264.76 10
## 9 150 62.5 14922.16 19264.76 10
## 10 150 62.5 14922.16 19264.76 10
## 11 150 62.5 14922.16 19264.76 10
## 12 150 62.5 14922.16 19264.76 10
## 13 150 62.5 14922.16 19264.76 10
## 14 150 62.5 14922.16 19264.76 10
## 15 150 62.5 14922.16 19264.76 10
## 16 150 62.5 14922.16 19264.76 10
## 17 150 62.5 14922.16 19264.76 10
## 18 150 62.5 14922.16 19264.76 10
## 19 150 62.5 14922.16 19264.76 10
## 20 150 62.5 14922.16 19264.76 10
## 21 150 62.5 14922.16 19264.76 10
## 22 150 62.5 14922.16 19264.76 10
## 23 150 62.5 14922.16 19264.76 10
## 24 150 62.5 14922.16 19264.76 10
## 25 150 62.5 14922.16 19264.76 10
## 26 150 62.5 14922.16 19264.76 10
## 27 150 62.5 14922.16 19264.76 10
## 28 150 62.5 14922.16 19264.76 10
## 29 150 62.5 14922.16 19264.76 10
## 30 150 62.5 14922.16 19264.76 10
## 31 150 62.5 14922.16 19264.76 10
## 32 150 62.5 14922.16 19264.76 10
## 33 150 62.5 14922.16 19264.76 10
## 34 150 62.5 14922.16 19264.76 10
## 35 150 62.5 14922.16 19264.76 10
## 36 150 62.5 14922.16 19264.76 10
## 37 150 62.5 14922.16 19264.76 10
## 38 150 62.5 14922.16 19264.76 10
## 39 150 62.5 14922.16 19264.76 10
## 40 150 62.5 14922.16 19264.76 10
## 41 150 62.5 14922.16 19264.76 10
## 42 150 62.5 14922.16 19264.76 10
## 43 150 62.5 14922.16 19264.76 10
## 44 150 62.5 14922.16 19264.76 10
## maximumMaxSalary
## 1 70000
## 2 70000
## 3 70000
## 4 70000
## 5 70000
## 6 70000
## 7 70000
## 8 70000
## 9 70000
## 10 70000
## 11 70000
## 12 70000
## 13 70000
## 14 70000
## 15 70000
## 16 70000
## 17 70000
## 18 70000
## 19 70000
## 20 70000
## 21 70000
## 22 70000
## 23 70000
## 24 70000
## 25 70000
## 26 70000
## 27 70000
## 28 70000
## 29 70000
## 30 70000
## 31 70000
## 32 70000
## 33 70000
## 34 70000
## 35 70000
## 36 70000
## 37 70000
## 38 70000
## 39 70000
## 40 70000
## 41 70000
## 42 70000
## 43 70000
## 44 70000
##
## [[3]]
## date_daysAgo
## 1 21
## 2 30
## 3 26
## 4 9
## 5 17
## 6 30
## 7 30
## 8 20
## 9 30
## 10 30
## 11 5
## 12 30
## 13 11
## 14 30
## 15 6
## 16 8
## 17 8
## 18 30
## 19 29
## 20 6
## 21 26
## 22 12
## 23 7
## 24 30
## 25 14
## 26 18
## 27 30
## 28 30
## 29 7
## 30 27
## 31 30
## 32 30
## 33 21
## 34 28
## 35 17
## 36 30
## 37 14
## 38 18
## 39 30
## 40 30
## 41 7
## 42 27
## 43 14
## 44 6
## 45 22
## 46 26
## 47 30
## 48 30
## 49 6
## 50 26
## 51 12
## 52 7
## 53 30
## 54 14
## 55 18
## 56 30
## 57 30
## 58 7
## 59 27
## 60 14
## 61 6
## 62 30
## 63 17
## 64 6
## 65 26
## 66 12
## 67 7
## 68 30
## 69 14
## 70 18
## 71 30
## 72 30
## 73 7
## 74 27
## 75 14
## 76 6
## 77 30
## 78 17
##
## [[4]]
## HiringAgency
## 1 Elements Massage Geneva3.6Geneva, IL 60134
## 2 Hand and Stone Massage and Facial SpaSouth Elgin, IL 60177
## 3 Asha SalonSpaNaperville, IL 60540
## 4 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 5 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 6 Asha SalonSpa3.1Lombard, IL
## 7 Sycamore Integrated HealthSycamore, IL 60178
## 8 Elements3.6Geneva, IL 60134+5 locations
## 9 A Premier Massage & Day Spa3.4Aurora, IL
## 10 Mario Tricoci Hair Salon and Day SpasGeneva, IL 60134+2 locations
## 11 Indo-Pak Massage TherapyNaperville, IL•Remote work available
## 12 The NOW, LLCNaperville, IL 60564
## 13 Wellness Clinic4.0Geneva, IL+4 locations
## 14 Flamingo4.2Lisle, IL 60532+1 location
## 15 StretchLabFoxValley3.8Saint Charles, IL
## 16 Olympia Chiropractic and Physical Therapy3.8Elmhurst, IL 60126
## 17 Gym / HealthClubNaperville, IL 60563
## 18 Hand and Stone Massage and Facial Spa - South Elgi...3.0South Elgin, IL 60177+1 location
## 19 Arista Spa & SalonNaperville, IL 60563
## 20 StretchLabFoxValley3.8Saint Charles, IL
## 21 Spavia Day Spa3.3Elmhurst, IL 60126
## 22 RiverOne Health & WellnessJoliet, IL 60431
## 23 Hand and Stone Spa3.0Naperville, IL 60564
## 24 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 25 Hand and Stone3.0Naperville, IL 60540
## 26 Ascent Physical TherapyPlainfield, IL 60544
## 27 Aligned Modern Health3.0Schaumburg, IL
## 28 Roselle ChiropracticRoselle, IL 60172
## 29 Stretch Zone2.7Willowbrook, IL 60527
## 30 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 31 Elements Massage3.6Bloomingdale, IL 60108
## 32 Sycamore Integrated HealthSycamore, IL 60178
## 33 Elements Massage Geneva3.6Geneva, IL 60134
## 34 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 35 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 36 Asha SalonSpa3.1Lombard, IL
## 37 Hand and Stone3.0Naperville, IL 60540
## 38 Ascent Physical TherapyPlainfield, IL 60544
## 39 Aligned Modern Health3.0Schaumburg, IL
## 40 Roselle ChiropracticRoselle, IL 60172
## 41 Stretch Zone2.7Willowbrook, IL 60527
## 42 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 43 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 44 StretchLabFoxValley3.8Saint Charles, IL
## 45 The Center For Physical HealthSchaumburg, IL 60194
## 46 Asha SalonSpaNaperville, IL 60540
## 47 Hand & Stone Massage and Facial Spa - ShorewoodShorewood, IL 60404
## 48 Hand and Stone Massage and Facial SpaSouth Elgin, IL 60177
## 49 StretchLabFoxValley3.8Saint Charles, IL
## 50 Spavia Day Spa3.3Elmhurst, IL 60126
## 51 RiverOne Health & WellnessJoliet, IL 60431
## 52 Hand and Stone Spa3.0Naperville, IL 60564
## 53 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 54 Hand and Stone3.0Naperville, IL 60540
## 55 Ascent Physical TherapyPlainfield, IL 60544
## 56 Aligned Modern Health3.0Schaumburg, IL
## 57 Roselle ChiropracticRoselle, IL 60172
## 58 Stretch Zone2.7Willowbrook, IL 60527
## 59 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 60 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 61 StretchLabFoxValley3.8Saint Charles, IL
## 62 Massage Envy3.2Shorewood, IL 60404
## 63 Fitness Formula Clubs (FFC)Elmhurst, IL 60126
## 64 StretchLabFoxValley3.8Saint Charles, IL
## 65 Spavia Day Spa3.3Elmhurst, IL 60126
## 66 RiverOne Health & WellnessJoliet, IL 60431
## 67 Hand and Stone Spa3.0Naperville, IL 60564
## 68 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 69 Hand and Stone3.0Naperville, IL 60540
## 70 Ascent Physical TherapyPlainfield, IL 60544
## 71 Aligned Modern Health3.0Schaumburg, IL
## 72 Roselle ChiropracticRoselle, IL 60172
## 73 Stretch Zone2.7Willowbrook, IL 60527
## 74 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 75 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 76 StretchLabFoxValley3.8Saint Charles, IL
## 77 Massage Envy3.2Shorewood, IL 60404
## 78 Fitness Formula Clubs (FFC)Elmhurst, IL 60126
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$60,000 a year ++ $60000 60000 NA
## 3 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 5 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 7 \n$62,000 a year $62000 62000 NA
## 13 \n$38,000 - $70,000 a year $38000 - $70000 38000 70000
## 15 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 22 \n$60,000 a year ++ $60000 60000 NA
## 23 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 24 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 27 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 28 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 29 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 31 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 36 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 38 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 43 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 40000 60000 40562.5 61153.85 30000
## 3 40000 60000 40562.5 61153.85 30000
## 5 40000 60000 40562.5 61153.85 30000
## 7 40000 60000 40562.5 61153.85 30000
## 13 40000 60000 40562.5 61153.85 30000
## 15 40000 60000 40562.5 61153.85 30000
## 22 40000 60000 40562.5 61153.85 30000
## 23 40000 60000 40562.5 61153.85 30000
## 24 40000 60000 40562.5 61153.85 30000
## 27 40000 60000 40562.5 61153.85 30000
## 28 40000 60000 40562.5 61153.85 30000
## 29 40000 60000 40562.5 61153.85 30000
## 31 40000 60000 40562.5 61153.85 30000
## 36 40000 60000 40562.5 61153.85 30000
## 38 40000 60000 40562.5 61153.85 30000
## 43 40000 60000 40562.5 61153.85 30000
## maximumMaxSalary
## 1 70000
## 3 70000
## 5 70000
## 7 70000
## 13 70000
## 15 70000
## 22 70000
## 23 70000
## 24 70000
## 27 70000
## 28 70000
## 29 70000
## 31 70000
## 36 70000
## 38 70000
## 43 70000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 4 \n$45 an hour $45 45 NA 18
## 6 \n$25 - $35 an hour $25 - $35 25 35 18
## 10 \n$60 - $65 an hour $60 - $65 60 65 18
## 11 \n$18 - $22 an hour $18 - $22 18 22 18
## 12 \n$15 - $30 an hour $15 - $30 15 30 18
## 14 \n$27 - $34 an hour $27 - $34 27 34 18
## 16 \n$18 - $27 an hour $18 - $27 18 27 18
## 18 \n$28 - $35 an hour $28 - $35 28 35 18
## 19 \n$10 - $20 an hour $10 - $20 10 20 18
## 20 \n$20 - $25 an hour $20 - $25 20 25 18
## 21 \n$25 - $35 an hour $25 - $35 25 35 18
## 25 \n$28 - $35 an hour $28 - $35 28 35 18
## 26 \n$10 - $20 an hour $10 - $20 10 20 18
## 32 \n$18 - $27 an hour $18 - $27 18 27 18
## 34 \n$28 - $35 an hour $28 - $35 28 35 18
## 35 \n$10 - $20 an hour $10 - $20 10 20 18
## 37 \n$17 an hour ++ $17 17 NA 18
## 39 \n$18 - $27 an hour $18 - $27 18 27 18
## 41 \n$28 - $35 an hour $28 - $35 28 35 18
## 42 \n$10 - $20 an hour $10 - $20 10 20 18
## 44 \n$17 an hour ++ $17 17 NA 18
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 4 28.5 22.61905 30.38889 10 65
## 6 28.5 22.61905 30.38889 10 65
## 10 28.5 22.61905 30.38889 10 65
## 11 28.5 22.61905 30.38889 10 65
## 12 28.5 22.61905 30.38889 10 65
## 14 28.5 22.61905 30.38889 10 65
## 16 28.5 22.61905 30.38889 10 65
## 18 28.5 22.61905 30.38889 10 65
## 19 28.5 22.61905 30.38889 10 65
## 20 28.5 22.61905 30.38889 10 65
## 21 28.5 22.61905 30.38889 10 65
## 25 28.5 22.61905 30.38889 10 65
## 26 28.5 22.61905 30.38889 10 65
## 32 28.5 22.61905 30.38889 10 65
## 34 28.5 22.61905 30.38889 10 65
## 35 28.5 22.61905 30.38889 10 65
## 37 28.5 22.61905 30.38889 10 65
## 39 28.5 22.61905 30.38889 10 65
## 41 28.5 22.61905 30.38889 10 65
## 42 28.5 22.61905 30.38889 10 65
## 44 28.5 22.61905 30.38889 10 65
##
## [[7]]
## city state jobTitle
## 1 aurora IL Massage Therapist
## 2 aurora IL Massage Therapist - South Elgin
## 3 aurora IL AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 4 aurora IL Massage Therapist - Independent Contractor
## 5 aurora IL Massage Therapist for a Luxury spa
## 6 aurora IL Massage Therapist
## 7 aurora IL Massage Therapist
## 8 aurora IL Massage Therapist
## 9 aurora IL Licensed Massage Therapist
## 10 aurora IL Licensed Massage Therapist- Geneva
## 11 aurora IL Massage Therapist - Independent Contractor
## 12 aurora IL Massage Therapist- Full or Part Time (Naperville, IL)
## 13 aurora IL Licensed Massage Therapist
## 14 aurora IL Licensed Massage Therapist - Lisle, IL
## 15 aurora IL Licensed Massage Therapist (for Assisted Stretching)
## 16 aurora IL Licensed Massage Therapist (LMT)
## 17 aurora IL Massage Therapist - Independent Contractor
## 18 aurora IL Licensed Massage Therapist (LMT)
## 19 aurora IL Licensed Massage Therapist (LMT)
## 20 aurora IL Flexologist (Stretch Professional)
## 21 aurora IL Licensed Massage Therapist
## 22 aurora IL Massage Therapists
## 23 aurora IL Licensed Massage Therapist LMT BUSY
## 24 aurora IL Licensed Massage Therapist- Oakbrook Center
## 25 aurora IL Licensed Massage Therapist LMT BUSY LOCATION
## 26 aurora IL Licensed Massage Therapist, Independent Contractor
## 27 aurora IL Licensed Massage Therapist - Schaumburg
## 28 aurora IL Massage therapist
## 29 aurora IL Part Time Stretch Practitioner
## 30 aurora IL Licensed Massage Therapist
## 31 aurora IL Licensed Massage Therapist (LMT)
## 32 aurora IL Massage Therapist
## 33 aurora IL Massage Therapist
## 34 aurora IL Licensed Massage Therapist (LMT)
## 35 aurora IL Massage Therapist for a Luxury spa
## 36 aurora IL Massage Therapist
## 37 aurora IL Licensed Massage Therapist LMT BUSY LOCATION
## 38 aurora IL Licensed Massage Therapist, Independent Contractor
## 39 aurora IL Licensed Massage Therapist - Schaumburg
## 40 aurora IL Massage therapist
## 41 aurora IL Part Time Stretch Practitioner
## 42 aurora IL Licensed Massage Therapist
## 43 aurora IL Licensed Massage Therapist LMT BUSY LOCATION
## 44 aurora IL Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 45 aurora IL Licensed Massage Therapist Part Time
## 46 aurora IL AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 47 aurora IL Licensed Massage Therapist (LMT) (MT)
## 48 aurora IL Massage Therapist - South Elgin
## 49 aurora IL Flexologist (Stretch Professional)
## 50 aurora IL Licensed Massage Therapist
## 51 aurora IL Massage Therapists
## 52 aurora IL Licensed Massage Therapist LMT BUSY
## 53 aurora IL Licensed Massage Therapist- Oakbrook Center
## 54 aurora IL Licensed Massage Therapist LMT BUSY LOCATION
## 55 aurora IL Licensed Massage Therapist, Independent Contractor
## 56 aurora IL Licensed Massage Therapist - Schaumburg
## 57 aurora IL Massage therapist
## 58 aurora IL Part Time Stretch Practitioner
## 59 aurora IL Licensed Massage Therapist
## 60 aurora IL Licensed Massage Therapist LMT BUSY LOCATION
## 61 aurora IL Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 62 aurora IL Massage Therapist-PART TIME HOURS
## 63 aurora IL Massage Therapist
## 64 aurora IL Flexologist (Stretch Professional)
## 65 aurora IL Licensed Massage Therapist
## 66 aurora IL Massage Therapists
## 67 aurora IL Licensed Massage Therapist LMT BUSY
## 68 aurora IL Licensed Massage Therapist- Oakbrook Center
## 69 aurora IL Licensed Massage Therapist LMT BUSY LOCATION
## 70 aurora IL Licensed Massage Therapist, Independent Contractor
## 71 aurora IL Licensed Massage Therapist - Schaumburg
## 72 aurora IL Massage therapist
## 73 aurora IL Part Time Stretch Practitioner
## 74 aurora IL Licensed Massage Therapist
## 75 aurora IL Licensed Massage Therapist LMT BUSY LOCATION
## 76 aurora IL Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 77 aurora IL Massage Therapist-PART TIME HOURS
## 78 aurora IL Massage Therapist
## HiringAgency
## 1 Elements Massage Geneva3.6Geneva, IL 60134
## 2 Hand and Stone Massage and Facial SpaSouth Elgin, IL 60177
## 3 Asha SalonSpaNaperville, IL 60540
## 4 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 5 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 6 Asha SalonSpa3.1Lombard, IL
## 7 Sycamore Integrated HealthSycamore, IL 60178
## 8 Elements3.6Geneva, IL 60134+5 locations
## 9 A Premier Massage & Day Spa3.4Aurora, IL
## 10 Mario Tricoci Hair Salon and Day SpasGeneva, IL 60134+2 locations
## 11 Indo-Pak Massage TherapyNaperville, IL•Remote work available
## 12 The NOW, LLCNaperville, IL 60564
## 13 Wellness Clinic4.0Geneva, IL+4 locations
## 14 Flamingo4.2Lisle, IL 60532+1 location
## 15 StretchLabFoxValley3.8Saint Charles, IL
## 16 Olympia Chiropractic and Physical Therapy3.8Elmhurst, IL 60126
## 17 Gym / HealthClubNaperville, IL 60563
## 18 Hand and Stone Massage and Facial Spa - South Elgi...3.0South Elgin, IL 60177+1 location
## 19 Arista Spa & SalonNaperville, IL 60563
## 20 StretchLabFoxValley3.8Saint Charles, IL
## 21 Spavia Day Spa3.3Elmhurst, IL 60126
## 22 RiverOne Health & WellnessJoliet, IL 60431
## 23 Hand and Stone Spa3.0Naperville, IL 60564
## 24 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 25 Hand and Stone3.0Naperville, IL 60540
## 26 Ascent Physical TherapyPlainfield, IL 60544
## 27 Aligned Modern Health3.0Schaumburg, IL
## 28 Roselle ChiropracticRoselle, IL 60172
## 29 Stretch Zone2.7Willowbrook, IL 60527
## 30 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 31 Elements Massage3.6Bloomingdale, IL 60108
## 32 Sycamore Integrated HealthSycamore, IL 60178
## 33 Elements Massage Geneva3.6Geneva, IL 60134
## 34 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 35 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 36 Asha SalonSpa3.1Lombard, IL
## 37 Hand and Stone3.0Naperville, IL 60540
## 38 Ascent Physical TherapyPlainfield, IL 60544
## 39 Aligned Modern Health3.0Schaumburg, IL
## 40 Roselle ChiropracticRoselle, IL 60172
## 41 Stretch Zone2.7Willowbrook, IL 60527
## 42 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 43 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 44 StretchLabFoxValley3.8Saint Charles, IL
## 45 The Center For Physical HealthSchaumburg, IL 60194
## 46 Asha SalonSpaNaperville, IL 60540
## 47 Hand & Stone Massage and Facial Spa - ShorewoodShorewood, IL 60404
## 48 Hand and Stone Massage and Facial SpaSouth Elgin, IL 60177
## 49 StretchLabFoxValley3.8Saint Charles, IL
## 50 Spavia Day Spa3.3Elmhurst, IL 60126
## 51 RiverOne Health & WellnessJoliet, IL 60431
## 52 Hand and Stone Spa3.0Naperville, IL 60564
## 53 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 54 Hand and Stone3.0Naperville, IL 60540
## 55 Ascent Physical TherapyPlainfield, IL 60544
## 56 Aligned Modern Health3.0Schaumburg, IL
## 57 Roselle ChiropracticRoselle, IL 60172
## 58 Stretch Zone2.7Willowbrook, IL 60527
## 59 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 60 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 61 StretchLabFoxValley3.8Saint Charles, IL
## 62 Massage Envy3.2Shorewood, IL 60404
## 63 Fitness Formula Clubs (FFC)Elmhurst, IL 60126
## 64 StretchLabFoxValley3.8Saint Charles, IL
## 65 Spavia Day Spa3.3Elmhurst, IL 60126
## 66 RiverOne Health & WellnessJoliet, IL 60431
## 67 Hand and Stone Spa3.0Naperville, IL 60564
## 68 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 69 Hand and Stone3.0Naperville, IL 60540
## 70 Ascent Physical TherapyPlainfield, IL 60544
## 71 Aligned Modern Health3.0Schaumburg, IL
## 72 Roselle ChiropracticRoselle, IL 60172
## 73 Stretch Zone2.7Willowbrook, IL 60527
## 74 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540+1 location
## 75 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 76 StretchLabFoxValley3.8Saint Charles, IL
## 77 Massage Envy3.2Shorewood, IL 60404
## 78 Fitness Formula Clubs (FFC)Elmhurst, IL 60126
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 21 10 65 30000 70000
## 2 30 10 65 30000 70000
## 3 26 10 65 30000 70000
## 4 9 10 65 30000 70000
## 5 17 10 65 30000 70000
## 6 30 10 65 30000 70000
## 7 30 10 65 30000 70000
## 8 20 10 65 30000 70000
## 9 30 10 65 30000 70000
## 10 30 10 65 30000 70000
## 11 5 10 65 30000 70000
## 12 30 10 65 30000 70000
## 13 11 10 65 30000 70000
## 14 30 10 65 30000 70000
## 15 6 10 65 30000 70000
## 16 8 10 65 30000 70000
## 17 8 10 65 30000 70000
## 18 30 10 65 30000 70000
## 19 29 10 65 30000 70000
## 20 6 10 65 30000 70000
## 21 26 10 65 30000 70000
## 22 12 10 65 30000 70000
## 23 7 10 65 30000 70000
## 24 30 10 65 30000 70000
## 25 14 10 65 30000 70000
## 26 18 10 65 30000 70000
## 27 30 10 65 30000 70000
## 28 30 10 65 30000 70000
## 29 7 10 65 30000 70000
## 30 27 10 65 30000 70000
## 31 30 10 65 30000 70000
## 32 30 10 65 30000 70000
## 33 21 10 65 30000 70000
## 34 28 10 65 30000 70000
## 35 17 10 65 30000 70000
## 36 30 10 65 30000 70000
## 37 14 10 65 30000 70000
## 38 18 10 65 30000 70000
## 39 30 10 65 30000 70000
## 40 30 10 65 30000 70000
## 41 7 10 65 30000 70000
## 42 27 10 65 30000 70000
## 43 14 10 65 30000 70000
## 44 6 10 65 30000 70000
## 45 22 10 65 30000 70000
## 46 26 10 65 30000 70000
## 47 30 10 65 30000 70000
## 48 30 10 65 30000 70000
## 49 6 10 65 30000 70000
## 50 26 10 65 30000 70000
## 51 12 10 65 30000 70000
## 52 7 10 65 30000 70000
## 53 30 10 65 30000 70000
## 54 14 10 65 30000 70000
## 55 18 10 65 30000 70000
## 56 30 10 65 30000 70000
## 57 30 10 65 30000 70000
## 58 7 10 65 30000 70000
## 59 27 10 65 30000 70000
## 60 14 10 65 30000 70000
## 61 6 10 65 30000 70000
## 62 30 10 65 30000 70000
## 63 17 10 65 30000 70000
## 64 6 10 65 30000 70000
## 65 26 10 65 30000 70000
## 66 12 10 65 30000 70000
## 67 7 10 65 30000 70000
## 68 30 10 65 30000 70000
## 69 14 10 65 30000 70000
## 70 18 10 65 30000 70000
## 71 30 10 65 30000 70000
## 72 30 10 65 30000 70000
## 73 7 10 65 30000 70000
## 74 27 10 65 30000 70000
## 75 14 10 65 30000 70000
## 76 6 10 65 30000 70000
## 77 30 10 65 30000 70000
## 78 17 10 65 30000 70000
getIndeedJobData5pages("massage therapist","naperville","IL")
## Warning in getIndeedJobData5pages("massage therapist", "naperville", "IL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "naperville", "IL"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "naperville", "IL"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 2 Massage Therapist - Independent Contractor
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapist
## 5 Massage Therapist - Naperville
## 6 Licensed Massage Therapist (LMT)
## 7 Massage Therapist
## 8 Massage Therapist for a Luxury spa
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Massage Therapist-Full Time
## 12 Massage Therapist
## 13 Licensed Massage Therapist - Lisle, IL
## 14 Massage Therapist- Full or Part Time (Naperville, IL)
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist LMT BUSY LOCATION
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Licensed Massage Therapist (LMT)
## 22 Licensed Massage Therapist- Geneva
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist- Oakbrook Center
## 25 Licensed Massage Therapist (for Assisted Stretching)
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapists
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist for a Luxury spa
## 32 Massage Therapist - Independent Contractor
## 33 Massage Therapist - Naperville
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 37 Licensed Massage Therapist- Oakbrook Center
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapists
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Part Time Stretch Practitioner
## 44 Licensed Massage Therapist (LMT)
## 45 Massage therapist
## 46 Flexologist (Stretch Professional)
## 47 Licensed Massage Therapist Part Time
## 48 Massage Therapist
## 49 Licensed Massage Therapist (LMT)
## 50 Flexologist (Stretch Professional)
## 51 Licensed Massage Therapist, Independent Contractor
## 52 Licensed Massage Therapist - Schaumburg
## 53 Licensed Massage Therapist (LMT) (MT)
## 54 Massage Therapist
## 55 Orland Park Health & Fitness Center Massage Therapist
## 56 Licensed Massage Therapist LMT BUSY LOCATION
## 57 Esthetician,Waxing tech.,Massage Therapist,Lash Artist, etc.
## 58 Licensed Massage Therapist
## 59 Licensed Massage Therapist Part Time
## 60 Massage Therapist - Independent Contractor
## 61 Massage Therapist
## 62 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 63 Massage Therapist for a Luxury spa
## 64 Massage Therapist
## 65 Massage Therapist - Naperville
## 66 Licensed Massage Therapist (LMT)
## 67 Licensed Massage Therapist (LMT)
## 68 Massage Therapist
## 69 Massage Therapist - Independent Contractor
## 70 Licensed Massage Therapist Part Time
## 71 Licensed Massage Therapist - $500 Bonus
## 72 Licensed Massage Therapist
## 73 Massage Therapist
## 74 Licensed Massage Therapist
## 75 Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 76 Massage Therapist-PART TIME HOURS
## 77 Licensed Massage Therapist (LMT)
## 78 Licensed Massage Therapist - BUSY Location
## 79 Massage Therapist
## 80 Licensed Massage Therapist (LMT)
## 81 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 82 Massage Therapist for a Luxury spa
## 83 Licensed Massage Therapist (LMT)
## 84 Massage Therapist - Naperville
## 85 Licensed Massage Therapist (LMT) (MT)
## 86 Massage Therapist - Up to $2000 signing bonus
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30,000 - $70,000 a year $30000 - $70000 30000.00 70000
## 2 \n$45 an hour $45 45.00 NA
## 3 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 4 \n$60,000 a year ++ $60000 60000.00 NA
## 5 \n$750 - $1,000 a week $750 - $1000 a week 750.00 NA
## 6 \n$20 - $25 an hour $20 - $25 20.00 25
## 7 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 9 \n$40,000 a year $40000 40000.00 NA
## 10 \n$60 - $65 an hour $60 - $65 60.00 65
## 11 \n$38.25 an hour $38.25 38.25 NA
## 12 \n$24 - $28 an hour $24 - $28 24.00 28
## 13 \n$33,000 - $55,000 a year $33000 - $55000 33000.00 55000
## 14 \n$34 - $42 an hour $34 - $42 34.00 42
## 15 \n$40,000 a year $40000 40000.00 NA
## 16 \n$150 a day $150 150.00 NA
## 17 \n$18 - $22 an hour $18 - $22 18.00 22
## 18 \n$150 a day $150 150.00 NA
## 19 \n$30 - $35 an hour $30 - $35 30.00 35
## 20 \n$18 - $27 an hour $18 - $27 18.00 27
## 21 \n$38,000 - $70,000 a year $38000 - $70000 38000.00 70000
## 22 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 23 \n$45 an hour $45 45.00 NA
## 24 \n$750 - $1,000 a week $750 - $1000 a week 750.00 NA
## 25 \n$20 - $25 an hour $20 - $25 20.00 25
## 26 \n$30,000 - $70,000 a year $30000 - $70000 30000.00 70000
## 27 \n$150 a day $150 150.00 NA
## 28 \n$30 - $35 an hour $30 - $35 30.00 35
## 29 \n$18 - $27 an hour $18 - $27 18.00 27
## 30 \n$10 - $20 an hour $10 - $20 10.00 20
## 31 \n$38,000 - $70,000 a year $38000 - $70000 38000.00 70000
## 32 \n$28 - $35 an hour $28 - $35 28.00 35
## 33 \n$60,000 a year ++ $60000 60000.00 NA
## 34 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 35 \n$30,000 - $60,000 a year $30000 - $60000 30000.00 60000
## 36 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 37 \n$43,906 - $74,000 a year $43906 - $74000 43906.00 74000
## 38 \n$45 an hour $45 45.00 NA
## 39 \n$30,000 - $70,000 a year $30000 - $70000 30000.00 70000
## 40 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 41 \n$60,000 a year ++ $60000 60000.00 NA
## 42 \n$750 - $1,000 a week $750 - $1000 a week 750.00 NA
## 43 \n$20 - $25 an hour $20 - $25 20.00 25
## 44 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 45 \n$45 an hour $45 45.00 NA
## 46 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 47 \n$17 an hour ++ $17 17.00 NA
## 48 \n$17 - $22 an hour $17 - $22 17.00 22
## 49 \n$18 - $20 an hour $18 - $20 18.00 20
## 50 \n$60,000 a year ++ $60000 60000.00 NA
## 51 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 52 \n$30,000 - $70,000 a year $30000 - $70000 30000.00 70000
## 53 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000
## 54 \n$20 - $25 an hour $20 - $25 20.00 25
## 55 \n$750 - $1,000 a week $750 - $1000 a week 750.00 NA
## 56 \n$30,000 - $60,000 a year $30000 - $60000 30000.00 60000
## 57 \n$18 - $42 an hour $18 - $42 18.00 42
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 750 5000 18368.32 24247.52 10
## 2 750 5000 18368.32 24247.52 10
## 3 750 5000 18368.32 24247.52 10
## 4 750 5000 18368.32 24247.52 10
## 5 750 5000 18368.32 24247.52 10
## 6 750 5000 18368.32 24247.52 10
## 7 750 5000 18368.32 24247.52 10
## 8 750 5000 18368.32 24247.52 10
## 9 750 5000 18368.32 24247.52 10
## 10 750 5000 18368.32 24247.52 10
## 11 750 5000 18368.32 24247.52 10
## 12 750 5000 18368.32 24247.52 10
## 13 750 5000 18368.32 24247.52 10
## 14 750 5000 18368.32 24247.52 10
## 15 750 5000 18368.32 24247.52 10
## 16 750 5000 18368.32 24247.52 10
## 17 750 5000 18368.32 24247.52 10
## 18 750 5000 18368.32 24247.52 10
## 19 750 5000 18368.32 24247.52 10
## 20 750 5000 18368.32 24247.52 10
## 21 750 5000 18368.32 24247.52 10
## 22 750 5000 18368.32 24247.52 10
## 23 750 5000 18368.32 24247.52 10
## 24 750 5000 18368.32 24247.52 10
## 25 750 5000 18368.32 24247.52 10
## 26 750 5000 18368.32 24247.52 10
## 27 750 5000 18368.32 24247.52 10
## 28 750 5000 18368.32 24247.52 10
## 29 750 5000 18368.32 24247.52 10
## 30 750 5000 18368.32 24247.52 10
## 31 750 5000 18368.32 24247.52 10
## 32 750 5000 18368.32 24247.52 10
## 33 750 5000 18368.32 24247.52 10
## 34 750 5000 18368.32 24247.52 10
## 35 750 5000 18368.32 24247.52 10
## 36 750 5000 18368.32 24247.52 10
## 37 750 5000 18368.32 24247.52 10
## 38 750 5000 18368.32 24247.52 10
## 39 750 5000 18368.32 24247.52 10
## 40 750 5000 18368.32 24247.52 10
## 41 750 5000 18368.32 24247.52 10
## 42 750 5000 18368.32 24247.52 10
## 43 750 5000 18368.32 24247.52 10
## 44 750 5000 18368.32 24247.52 10
## 45 750 5000 18368.32 24247.52 10
## 46 750 5000 18368.32 24247.52 10
## 47 750 5000 18368.32 24247.52 10
## 48 750 5000 18368.32 24247.52 10
## 49 750 5000 18368.32 24247.52 10
## 50 750 5000 18368.32 24247.52 10
## 51 750 5000 18368.32 24247.52 10
## 52 750 5000 18368.32 24247.52 10
## 53 750 5000 18368.32 24247.52 10
## 54 750 5000 18368.32 24247.52 10
## 55 750 5000 18368.32 24247.52 10
## 56 750 5000 18368.32 24247.52 10
## 57 750 5000 18368.32 24247.52 10
## maximumMaxSalary
## 1 74000
## 2 74000
## 3 74000
## 4 74000
## 5 74000
## 6 74000
## 7 74000
## 8 74000
## 9 74000
## 10 74000
## 11 74000
## 12 74000
## 13 74000
## 14 74000
## 15 74000
## 16 74000
## 17 74000
## 18 74000
## 19 74000
## 20 74000
## 21 74000
## 22 74000
## 23 74000
## 24 74000
## 25 74000
## 26 74000
## 27 74000
## 28 74000
## 29 74000
## 30 74000
## 31 74000
## 32 74000
## 33 74000
## 34 74000
## 35 74000
## 36 74000
## 37 74000
## 38 74000
## 39 74000
## 40 74000
## 41 74000
## 42 74000
## 43 74000
## 44 74000
## 45 74000
## 46 74000
## 47 74000
## 48 74000
## 49 74000
## 50 74000
## 51 74000
## 52 74000
## 53 74000
## 54 74000
## 55 74000
## 56 74000
## 57 74000
##
## [[3]]
## date_daysAgo
## 1 26
## 2 9
## 3 28
## 4 21
## 5 30
## 6 30
## 7 30
## 8 17
## 9 5
## 10 11
## 11 30
## 12 30
## 13 30
## 14 30
## 15 22
## 16 6
## 17 14
## 18 30
## 19 26
## 20 22
## 21 15
## 22 30
## 23 8
## 24 30
## 25 6
## 26 11
## 27 30
## 28 12
## 29 20
## 30 30
## 31 17
## 32 9
## 33 30
## 34 30
## 35 30
## 36 26
## 37 30
## 38 11
## 39 30
## 40 12
## 41 20
## 42 12
## 43 7
## 44 30
## 45 30
## 46 6
## 47 22
## 48 21
## 49 28
## 50 6
## 51 18
## 52 30
## 53 30
## 54 8
## 55 30
## 56 14
## 57 30
## 58 30
## 59 22
## 60 9
## 61 30
## 62 26
## 63 17
## 64 21
## 65 30
## 66 30
## 67 28
## 68 30
## 69 9
## 70 22
## 71 30
## 72 7
## 73 17
## 74 30
## 75 6
## 76 30
## 77 12
## 78 26
## 79 21
## 80 28
## 81 26
## 82 17
## 83 30
## 84 30
## 85 30
## 86 30
##
## [[4]]
## HiringAgency
## 1 Asha SalonSpaNaperville, IL 60540
## 2 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 3 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 4 Elements Massage Geneva3.6Geneva, IL 60134
## 5 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 6 Elements Massage3.6Wheaton, IL 60189
## 7 Asha SalonSpa3.1Lombard, IL
## 8 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 9 Indo-Pak Massage TherapyNaperville, IL+4 locations•Remote work available
## 10 Wellness Clinic4.0Naperville, IL 60563+5 locations
## 11 Life Time3.6Warrenville, IL 60555+5 locations
## 12 Elements3.6Wheaton, IL 60189+7 locations
## 13 Flamingo4.2Lisle, IL 60532+1 location
## 14 The NOW, LLCNaperville, IL 60564
## 15 C'zar Salon SpaWheaton, IL
## 16 Massage Envy3.2Naperville, IL 60540+11 locations
## 17 Hand and Stone3.0Naperville, IL 60540
## 18 Advanced Health SolutionsRoselle, IL 60172
## 19 Spavia Day Spa3.3Elmhurst, IL 60126
## 20 Body FountainFrankfort, IL 60423
## 21 Active Care Chiropractic & RehabilitationArlington Heights, IL 60004
## 22 Mario Tricoci Hair Salon and Day SpasGeneva, IL 60134+3 locations
## 23 Precision WellnessArlington Hts, IL 60004
## 24 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 25 StretchLabFoxValley3.8Saint Charles, IL
## 26 COMPLETER CHICAGO CHIROPRACTIC AND SPORTS MEDChicago, IL 60706
## 27 A Premier Massage & Day Spa3.4Aurora, IL
## 28 RiverOne Health & WellnessJoliet, IL 60431
## 29 Hand & Stone Massage and Facial Spa3.0Wheaton, IL 60189+2 locations
## 30 Hand and Stone Massage and Facial Spa - Carol Stre...3.0Carol Stream, IL 60188+2 locations
## 31 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 32 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 33 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 34 Elements Massage3.6Wheaton, IL 60189
## 35 Asha SalonSpa3.1Lombard, IL
## 36 Asha SalonSpaNaperville, IL 60540
## 37 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 38 COMPLETER CHICAGO CHIROPRACTIC AND SPORTS MEDChicago, IL 60706
## 39 A Premier Massage & Day Spa3.4Aurora, IL
## 40 RiverOne Health & WellnessJoliet, IL 60431
## 41 Hand & Stone Massage and Facial Spa3.0Wheaton, IL 60189+2 locations
## 42 A Relaxed You, Inc.Chicago, IL 60655 (Mount Greenwood area)+1 location
## 43 Stretch Zone2.7Willowbrook, IL 60527
## 44 Hand and Stone Massage and Facial Spa - Carol Stre...3.0Carol Stream, IL 60188+2 locations
## 45 Roselle ChiropracticRoselle, IL 60172
## 46 StretchLabFoxValley3.8Saint Charles, IL
## 47 The Center For Physical HealthSchaumburg, IL 60194
## 48 Elements Massage Geneva3.6Geneva, IL 60134
## 49 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 50 StretchLabFoxValley3.8Saint Charles, IL
## 51 Ascent Physical TherapyPlainfield, IL 60544
## 52 Aligned Modern Health3.0Schaumburg, IL
## 53 Hand & Stone Massage and Facial Spa - ShorewoodShorewood, IL 60404
## 54 Vive! Therapeutic MassagePark Ridge, IL 60068
## 55 Power Wellness3.1Orland Park, IL 60462
## 56 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 57 Aura SpaNiles, IL 60714
## 58 Elements3.6Park Ridge, IL 60068
## 59 The Center For Physical HealthSchaumburg, IL 60194
## 60 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 61 Asha SalonSpa3.1Lombard, IL
## 62 Asha SalonSpaNaperville, IL 60540
## 63 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 64 Elements Massage Geneva3.6Geneva, IL 60134
## 65 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 66 Elements Massage3.6Wheaton, IL 60189
## 67 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 68 Asha SalonSpa3.1Lombard, IL
## 69 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 70 The Center For Physical HealthSchaumburg, IL 60194
## 71 Heavenly Massage3.8Orland Park, IL 60462
## 72 Yoga 360Frankfort, IL 60423
## 73 Fitness Formula Clubs (FFC)Elmhurst, IL 60126+2 locations
## 74 Elements Massage - South Barrington3.6South Barrington, IL 60010
## 75 StretchLabFoxValley3.8Saint Charles, IL
## 76 Massage Envy3.2Shorewood, IL 60404
## 77 Massage Envy3.2Orland Park, IL 60462
## 78 Massage Envy3.2Oak Lawn, IL 60453
## 79 Elements Massage Geneva3.6Geneva, IL 60134
## 80 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 81 Asha SalonSpaNaperville, IL 60540
## 82 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 83 Elements Massage3.6Wheaton, IL 60189
## 84 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 85 Hand & Stone Massage and Facial Spa - ShorewoodShorewood, IL 60404
## 86 Massage EnvyFrankfort, IL 60423
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 3 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 4 \n$60,000 a year ++ $60000 60000 NA
## 7 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 9 \n$40,000 a year $40000 40000 NA
## 13 \n$33,000 - $55,000 a year $33000 - $55000 33000 55000
## 15 \n$40,000 a year $40000 40000 NA
## 21 \n$38,000 - $70,000 a year $38000 - $70000 38000 70000
## 22 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 26 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 31 \n$38,000 - $70,000 a year $38000 - $70000 38000 70000
## 33 \n$60,000 a year ++ $60000 60000 NA
## 34 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 35 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 36 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 37 \n$43,906 - $74,000 a year $43906 - $74000 43906 74000
## 39 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 40 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 41 \n$60,000 a year ++ $60000 60000 NA
## 44 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 46 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 50 \n$60,000 a year ++ $60000 60000 NA
## 51 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 52 \n$30,000 - $70,000 a year $30000 - $70000 30000 70000
## 53 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 56 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 40000 60000 39919.46 62200 25000
## 3 40000 60000 39919.46 62200 25000
## 4 40000 60000 39919.46 62200 25000
## 7 40000 60000 39919.46 62200 25000
## 9 40000 60000 39919.46 62200 25000
## 13 40000 60000 39919.46 62200 25000
## 15 40000 60000 39919.46 62200 25000
## 21 40000 60000 39919.46 62200 25000
## 22 40000 60000 39919.46 62200 25000
## 26 40000 60000 39919.46 62200 25000
## 31 40000 60000 39919.46 62200 25000
## 33 40000 60000 39919.46 62200 25000
## 34 40000 60000 39919.46 62200 25000
## 35 40000 60000 39919.46 62200 25000
## 36 40000 60000 39919.46 62200 25000
## 37 40000 60000 39919.46 62200 25000
## 39 40000 60000 39919.46 62200 25000
## 40 40000 60000 39919.46 62200 25000
## 41 40000 60000 39919.46 62200 25000
## 44 40000 60000 39919.46 62200 25000
## 46 40000 60000 39919.46 62200 25000
## 50 40000 60000 39919.46 62200 25000
## 51 40000 60000 39919.46 62200 25000
## 52 40000 60000 39919.46 62200 25000
## 53 40000 60000 39919.46 62200 25000
## 56 40000 60000 39919.46 62200 25000
## maximumMaxSalary
## 1 74000
## 3 74000
## 4 74000
## 7 74000
## 9 74000
## 13 74000
## 15 74000
## 21 74000
## 22 74000
## 26 74000
## 31 74000
## 33 74000
## 34 74000
## 35 74000
## 36 74000
## 37 74000
## 39 74000
## 40 74000
## 41 74000
## 44 74000
## 46 74000
## 50 74000
## 51 74000
## 52 74000
## 53 74000
## 56 74000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$45 an hour $45 45.00 NA 20
## 6 \n$20 - $25 an hour $20 - $25 20.00 25 20
## 10 \n$60 - $65 an hour $60 - $65 60.00 65 20
## 11 \n$38.25 an hour $38.25 38.25 NA 20
## 12 \n$24 - $28 an hour $24 - $28 24.00 28 20
## 14 \n$34 - $42 an hour $34 - $42 34.00 42 20
## 17 \n$18 - $22 an hour $18 - $22 18.00 22 20
## 19 \n$30 - $35 an hour $30 - $35 30.00 35 20
## 20 \n$18 - $27 an hour $18 - $27 18.00 27 20
## 23 \n$45 an hour $45 45.00 NA 20
## 25 \n$20 - $25 an hour $20 - $25 20.00 25 20
## 28 \n$30 - $35 an hour $30 - $35 30.00 35 20
## 29 \n$18 - $27 an hour $18 - $27 18.00 27 20
## 30 \n$10 - $20 an hour $10 - $20 10.00 20 20
## 32 \n$28 - $35 an hour $28 - $35 28.00 35 20
## 38 \n$45 an hour $45 45.00 NA 20
## 43 \n$20 - $25 an hour $20 - $25 20.00 25 20
## 45 \n$45 an hour $45 45.00 NA 20
## 47 \n$17 an hour ++ $17 17.00 NA 20
## 48 \n$17 - $22 an hour $17 - $22 17.00 22 20
## 49 \n$18 - $20 an hour $18 - $20 18.00 20 20
## 54 \n$20 - $25 an hour $20 - $25 20.00 25 20
## 57 \n$18 - $42 an hour $18 - $42 18.00 42 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 27 27.75 30.58824 10 65
## 6 27 27.75 30.58824 10 65
## 10 27 27.75 30.58824 10 65
## 11 27 27.75 30.58824 10 65
## 12 27 27.75 30.58824 10 65
## 14 27 27.75 30.58824 10 65
## 17 27 27.75 30.58824 10 65
## 19 27 27.75 30.58824 10 65
## 20 27 27.75 30.58824 10 65
## 23 27 27.75 30.58824 10 65
## 25 27 27.75 30.58824 10 65
## 28 27 27.75 30.58824 10 65
## 29 27 27.75 30.58824 10 65
## 30 27 27.75 30.58824 10 65
## 32 27 27.75 30.58824 10 65
## 38 27 27.75 30.58824 10 65
## 43 27 27.75 30.58824 10 65
## 45 27 27.75 30.58824 10 65
## 47 27 27.75 30.58824 10 65
## 48 27 27.75 30.58824 10 65
## 49 27 27.75 30.58824 10 65
## 54 27 27.75 30.58824 10 65
## 57 27 27.75 30.58824 10 65
##
## [[7]]
## city state
## 1 naperville IL
## 2 naperville IL
## 3 naperville IL
## 4 naperville IL
## 5 naperville IL
## 6 naperville IL
## 7 naperville IL
## 8 naperville IL
## 9 naperville IL
## 10 naperville IL
## 11 naperville IL
## 12 naperville IL
## 13 naperville IL
## 14 naperville IL
## 15 naperville IL
## 16 naperville IL
## 17 naperville IL
## 18 naperville IL
## 19 naperville IL
## 20 naperville IL
## 21 naperville IL
## 22 naperville IL
## 23 naperville IL
## 24 naperville IL
## 25 naperville IL
## 26 naperville IL
## 27 naperville IL
## 28 naperville IL
## 29 naperville IL
## 30 naperville IL
## 31 naperville IL
## 32 naperville IL
## 33 naperville IL
## 34 naperville IL
## 35 naperville IL
## 36 naperville IL
## 37 naperville IL
## 38 naperville IL
## 39 naperville IL
## 40 naperville IL
## 41 naperville IL
## 42 naperville IL
## 43 naperville IL
## 44 naperville IL
## 45 naperville IL
## 46 naperville IL
## 47 naperville IL
## 48 naperville IL
## 49 naperville IL
## 50 naperville IL
## 51 naperville IL
## 52 naperville IL
## 53 naperville IL
## 54 naperville IL
## 55 naperville IL
## 56 naperville IL
## 57 naperville IL
## 58 naperville IL
## 59 naperville IL
## 60 naperville IL
## 61 naperville IL
## 62 naperville IL
## 63 naperville IL
## 64 naperville IL
## 65 naperville IL
## 66 naperville IL
## 67 naperville IL
## 68 naperville IL
## 69 naperville IL
## 70 naperville IL
## 71 naperville IL
## 72 naperville IL
## 73 naperville IL
## 74 naperville IL
## 75 naperville IL
## 76 naperville IL
## 77 naperville IL
## 78 naperville IL
## 79 naperville IL
## 80 naperville IL
## 81 naperville IL
## 82 naperville IL
## 83 naperville IL
## 84 naperville IL
## 85 naperville IL
## 86 naperville IL
## jobTitle
## 1 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 2 Massage Therapist - Independent Contractor
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapist
## 5 Massage Therapist - Naperville
## 6 Licensed Massage Therapist (LMT)
## 7 Massage Therapist
## 8 Massage Therapist for a Luxury spa
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Massage Therapist-Full Time
## 12 Massage Therapist
## 13 Licensed Massage Therapist - Lisle, IL
## 14 Massage Therapist- Full or Part Time (Naperville, IL)
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist LMT BUSY LOCATION
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Licensed Massage Therapist (LMT)
## 22 Licensed Massage Therapist- Geneva
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist- Oakbrook Center
## 25 Licensed Massage Therapist (for Assisted Stretching)
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapists
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist for a Luxury spa
## 32 Massage Therapist - Independent Contractor
## 33 Massage Therapist - Naperville
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 37 Licensed Massage Therapist- Oakbrook Center
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapists
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Part Time Stretch Practitioner
## 44 Licensed Massage Therapist (LMT)
## 45 Massage therapist
## 46 Flexologist (Stretch Professional)
## 47 Licensed Massage Therapist Part Time
## 48 Massage Therapist
## 49 Licensed Massage Therapist (LMT)
## 50 Flexologist (Stretch Professional)
## 51 Licensed Massage Therapist, Independent Contractor
## 52 Licensed Massage Therapist - Schaumburg
## 53 Licensed Massage Therapist (LMT) (MT)
## 54 Massage Therapist
## 55 Orland Park Health & Fitness Center Massage Therapist
## 56 Licensed Massage Therapist LMT BUSY LOCATION
## 57 Esthetician,Waxing tech.,Massage Therapist,Lash Artist, etc.
## 58 Licensed Massage Therapist
## 59 Licensed Massage Therapist Part Time
## 60 Massage Therapist - Independent Contractor
## 61 Massage Therapist
## 62 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 63 Massage Therapist for a Luxury spa
## 64 Massage Therapist
## 65 Massage Therapist - Naperville
## 66 Licensed Massage Therapist (LMT)
## 67 Licensed Massage Therapist (LMT)
## 68 Massage Therapist
## 69 Massage Therapist - Independent Contractor
## 70 Licensed Massage Therapist Part Time
## 71 Licensed Massage Therapist - $500 Bonus
## 72 Licensed Massage Therapist
## 73 Massage Therapist
## 74 Licensed Massage Therapist
## 75 Flexologist (Assisted Stretch Professional) - Wellness/Fitne...
## 76 Massage Therapist-PART TIME HOURS
## 77 Licensed Massage Therapist (LMT)
## 78 Licensed Massage Therapist - BUSY Location
## 79 Massage Therapist
## 80 Licensed Massage Therapist (LMT)
## 81 AVEDA HAIR Stylists,Colorists, Massage Therapist,Esthetician...
## 82 Massage Therapist for a Luxury spa
## 83 Licensed Massage Therapist (LMT)
## 84 Massage Therapist - Naperville
## 85 Licensed Massage Therapist (LMT) (MT)
## 86 Massage Therapist - Up to $2000 signing bonus
## HiringAgency
## 1 Asha SalonSpaNaperville, IL 60540
## 2 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 3 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 4 Elements Massage Geneva3.6Geneva, IL 60134
## 5 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 6 Elements Massage3.6Wheaton, IL 60189
## 7 Asha SalonSpa3.1Lombard, IL
## 8 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 9 Indo-Pak Massage TherapyNaperville, IL+4 locations•Remote work available
## 10 Wellness Clinic4.0Naperville, IL 60563+5 locations
## 11 Life Time3.6Warrenville, IL 60555+5 locations
## 12 Elements3.6Wheaton, IL 60189+7 locations
## 13 Flamingo4.2Lisle, IL 60532+1 location
## 14 The NOW, LLCNaperville, IL 60564
## 15 C'zar Salon SpaWheaton, IL
## 16 Massage Envy3.2Naperville, IL 60540+11 locations
## 17 Hand and Stone3.0Naperville, IL 60540
## 18 Advanced Health SolutionsRoselle, IL 60172
## 19 Spavia Day Spa3.3Elmhurst, IL 60126
## 20 Body FountainFrankfort, IL 60423
## 21 Active Care Chiropractic & RehabilitationArlington Heights, IL 60004
## 22 Mario Tricoci Hair Salon and Day SpasGeneva, IL 60134+3 locations
## 23 Precision WellnessArlington Hts, IL 60004
## 24 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 25 StretchLabFoxValley3.8Saint Charles, IL
## 26 COMPLETER CHICAGO CHIROPRACTIC AND SPORTS MEDChicago, IL 60706
## 27 A Premier Massage & Day Spa3.4Aurora, IL
## 28 RiverOne Health & WellnessJoliet, IL 60431
## 29 Hand & Stone Massage and Facial Spa3.0Wheaton, IL 60189+2 locations
## 30 Hand and Stone Massage and Facial Spa - Carol Stre...3.0Carol Stream, IL 60188+2 locations
## 31 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 32 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 33 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 34 Elements Massage3.6Wheaton, IL 60189
## 35 Asha SalonSpa3.1Lombard, IL
## 36 Asha SalonSpaNaperville, IL 60540
## 37 Mario Tricoci Hair Salon and Day SpasOak Brook, IL 60523
## 38 COMPLETER CHICAGO CHIROPRACTIC AND SPORTS MEDChicago, IL 60706
## 39 A Premier Massage & Day Spa3.4Aurora, IL
## 40 RiverOne Health & WellnessJoliet, IL 60431
## 41 Hand & Stone Massage and Facial Spa3.0Wheaton, IL 60189+2 locations
## 42 A Relaxed You, Inc.Chicago, IL 60655 (Mount Greenwood area)+1 location
## 43 Stretch Zone2.7Willowbrook, IL 60527
## 44 Hand and Stone Massage and Facial Spa - Carol Stre...3.0Carol Stream, IL 60188+2 locations
## 45 Roselle ChiropracticRoselle, IL 60172
## 46 StretchLabFoxValley3.8Saint Charles, IL
## 47 The Center For Physical HealthSchaumburg, IL 60194
## 48 Elements Massage Geneva3.6Geneva, IL 60134
## 49 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 50 StretchLabFoxValley3.8Saint Charles, IL
## 51 Ascent Physical TherapyPlainfield, IL 60544
## 52 Aligned Modern Health3.0Schaumburg, IL
## 53 Hand & Stone Massage and Facial Spa - ShorewoodShorewood, IL 60404
## 54 Vive! Therapeutic MassagePark Ridge, IL 60068
## 55 Power Wellness3.1Orland Park, IL 60462
## 56 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 57 Aura SpaNiles, IL 60714
## 58 Elements3.6Park Ridge, IL 60068
## 59 The Center For Physical HealthSchaumburg, IL 60194
## 60 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 61 Asha SalonSpa3.1Lombard, IL
## 62 Asha SalonSpaNaperville, IL 60540
## 63 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 64 Elements Massage Geneva3.6Geneva, IL 60134
## 65 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 66 Elements Massage3.6Wheaton, IL 60189
## 67 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 68 Asha SalonSpa3.1Lombard, IL
## 69 Rose Wellness Services INCNaperville, IL 60540•Remote work available
## 70 The Center For Physical HealthSchaumburg, IL 60194
## 71 Heavenly Massage3.8Orland Park, IL 60462
## 72 Yoga 360Frankfort, IL 60423
## 73 Fitness Formula Clubs (FFC)Elmhurst, IL 60126+2 locations
## 74 Elements Massage - South Barrington3.6South Barrington, IL 60010
## 75 StretchLabFoxValley3.8Saint Charles, IL
## 76 Massage Envy3.2Shorewood, IL 60404
## 77 Massage Envy3.2Orland Park, IL 60462
## 78 Massage Envy3.2Oak Lawn, IL 60453
## 79 Elements Massage Geneva3.6Geneva, IL 60134
## 80 Hand & Stone Massage and Facial Spa3.0Naperville, IL 60540
## 81 Asha SalonSpaNaperville, IL 60540
## 82 Massage LuXe / Face LuXe3.0Naperville, IL 60540
## 83 Elements Massage3.6Wheaton, IL 60189
## 84 Hand and Stone Massage and Facial SpaNaperville, IL 60564
## 85 Hand & Stone Massage and Facial Spa - ShorewoodShorewood, IL 60404
## 86 Massage EnvyFrankfort, IL 60423
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 26 10 65 25000 74000
## 2 9 10 65 25000 74000
## 3 28 10 65 25000 74000
## 4 21 10 65 25000 74000
## 5 30 10 65 25000 74000
## 6 30 10 65 25000 74000
## 7 30 10 65 25000 74000
## 8 17 10 65 25000 74000
## 9 5 10 65 25000 74000
## 10 11 10 65 25000 74000
## 11 30 10 65 25000 74000
## 12 30 10 65 25000 74000
## 13 30 10 65 25000 74000
## 14 30 10 65 25000 74000
## 15 22 10 65 25000 74000
## 16 6 10 65 25000 74000
## 17 14 10 65 25000 74000
## 18 30 10 65 25000 74000
## 19 26 10 65 25000 74000
## 20 22 10 65 25000 74000
## 21 15 10 65 25000 74000
## 22 30 10 65 25000 74000
## 23 8 10 65 25000 74000
## 24 30 10 65 25000 74000
## 25 6 10 65 25000 74000
## 26 11 10 65 25000 74000
## 27 30 10 65 25000 74000
## 28 12 10 65 25000 74000
## 29 20 10 65 25000 74000
## 30 30 10 65 25000 74000
## 31 17 10 65 25000 74000
## 32 9 10 65 25000 74000
## 33 30 10 65 25000 74000
## 34 30 10 65 25000 74000
## 35 30 10 65 25000 74000
## 36 26 10 65 25000 74000
## 37 30 10 65 25000 74000
## 38 11 10 65 25000 74000
## 39 30 10 65 25000 74000
## 40 12 10 65 25000 74000
## 41 20 10 65 25000 74000
## 42 12 10 65 25000 74000
## 43 7 10 65 25000 74000
## 44 30 10 65 25000 74000
## 45 30 10 65 25000 74000
## 46 6 10 65 25000 74000
## 47 22 10 65 25000 74000
## 48 21 10 65 25000 74000
## 49 28 10 65 25000 74000
## 50 6 10 65 25000 74000
## 51 18 10 65 25000 74000
## 52 30 10 65 25000 74000
## 53 30 10 65 25000 74000
## 54 8 10 65 25000 74000
## 55 30 10 65 25000 74000
## 56 14 10 65 25000 74000
## 57 30 10 65 25000 74000
## 58 30 10 65 25000 74000
## 59 22 10 65 25000 74000
## 60 9 10 65 25000 74000
## 61 30 10 65 25000 74000
## 62 26 10 65 25000 74000
## 63 17 10 65 25000 74000
## 64 21 10 65 25000 74000
## 65 30 10 65 25000 74000
## 66 30 10 65 25000 74000
## 67 28 10 65 25000 74000
## 68 30 10 65 25000 74000
## 69 9 10 65 25000 74000
## 70 22 10 65 25000 74000
## 71 30 10 65 25000 74000
## 72 7 10 65 25000 74000
## 73 17 10 65 25000 74000
## 74 30 10 65 25000 74000
## 75 6 10 65 25000 74000
## 76 30 10 65 25000 74000
## 77 12 10 65 25000 74000
## 78 26 10 65 25000 74000
## 79 21 10 65 25000 74000
## 80 28 10 65 25000 74000
## 81 26 10 65 25000 74000
## 82 17 10 65 25000 74000
## 83 30 10 65 25000 74000
## 84 30 10 65 25000 74000
## 85 30 10 65 25000 74000
## 86 30 10 65 25000 74000
Indiana Indianapolis, Fort Wayne, Evansville
getIndeedJobData5pages("massage therapist", "Indianapolis","IN")
## Warning in getIndeedJobData5pages("massage therapist", "Indianapolis", "IN"):
## NAs introduced by coercion
## Warning in max(annual$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Indianapolis", "IN"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Indianapolis", "IN"):
## NAs introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT) $1,000.00 Sign on Bonus
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist
## 8 Part time Massage Therapist-Mooresville
## 9 Massage Therapist at Keystone Crossing
## 10 Massage Therapist - Independent Contractor
## 11 Weekend Massage Therapist at Keystone Crossing
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 15 Massage Therapist - Full Time
## 16 Licensed Massage Therapist
## 17 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 18 Massage Therapist- Southport- Busy Spa!
## 19 Massage Therapists
## 20 Salon Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist PT/FT
## 24 Massage Therapist (Full & Part-time)
## 25 Massage Therapist-Keystone at the Crossing
## 26 Licensed Massage Therapist
## 27 Part Time Weekend Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 32 Massage Therapist - Contract
## 33 Massage Therapist- Southport- Busy Spa!
## 34 Massage Therapist
## 35 Massage Therapists
## 36 Salon Massage Therapist
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist PT/FT
## 39 Massage Therapist (Full & Part-time)
## 40 Massage Therapist-Keystone at the Crossing
## 41 Licensed Massage Therapist
## 42 Part Time Weekend Licensed Massage Therapist
## 43 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 44 Massage Therapists
## 45 Salon Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist PT/FT
## 49 Massage Therapist (Full & Part-time)
## 50 Massage Therapist-Keystone at the Crossing
## 51 Licensed Massage Therapist
## 52 Part Time Weekend Licensed Massage Therapist
## 53 Part time Massage Therapist-Mooresville
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist (LMT)
## 56 Licensed Massage Therapist
## 57 Massage Therapist - Independent Contractor
## 58 Licensed Massage Therapist (LMT) $1,000.00 Sign on Bonus
## 59 Massage Therapist
## 60 Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 65 Massage Therapist - Contract
## 66 Massage Therapist- Southport- Busy Spa!
## 67 Massage Therapist
## 68 Massage Therapists
## 69 Salon Massage Therapist
## 70 Licensed Massage Therapist
## 71 Licensed Massage Therapist PT/FT
## 72 Massage Therapist (Full & Part-time)
## 73 Massage Therapist-Keystone at the Crossing
## 74 Licensed Massage Therapist
## 75 Part Time Weekend Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 - $28 an hour $23 - $28 23 28
## 2 \n$40 - $55 an hour $40 - $55 40 55
## 3 \n$20 - $50 an hour $20 - $50 20 50
## 4 \n$25 - $45 an hour $25 - $45 25 45
## 5 \n$20 - $35 an hour $20 - $35 20 35
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$20 - $40 an hour $20 - $40 20 40
## 8 \n$35 an hour $35 35 NA
## 9 \n$38 - $45 an hour $38 - $45 38 45
## 10 \n$18 an hour $18 18 NA
## 11 \n$17 an hour $17 17 NA
## 12 \n$18 - $25 an hour $18 - $25 18 25
## 13 \n$45,000 a year $45000 45000 NA
## 14 \n$25 - $30 an hour $25 - $30 25 30
## 15 \n$35 an hour $35 35 NA
## 16 \n$38 - $45 an hour $38 - $45 38 45
## 17 \n$18 an hour $18 18 NA
## 18 \n$17 an hour $17 17 NA
## 19 \n$18 - $25 an hour $18 - $25 18 25
## 20 \n$35 an hour $35 35 NA
## 21 \n$38 - $45 an hour $38 - $45 38 45
## 22 \n$18 an hour $18 18 NA
## 23 \n$17 an hour $17 17 NA
## 24 \n$18 - $25 an hour $18 - $25 18 25
## 25 \n$20 - $35 an hour $20 - $35 20 35
## 26 \n$25 - $45 an hour $25 - $45 25 45
## 27 \n$20 - $50 an hour $20 - $50 20 50
## 28 \n$40 - $55 an hour $40 - $55 40 55
## 29 \n$23 - $28 an hour $23 - $28 23 28
## 30 \n$45,000 a year $45000 45000 NA
## 31 \n$25 - $30 an hour $25 - $30 25 30
## 32 \n$35 an hour $35 35 NA
## 33 \n$38 - $45 an hour $38 - $45 38 45
## 34 \n$18 an hour $18 18 NA
## 35 \n$17 an hour $17 17 NA
## 36 \n$18 - $25 an hour $18 - $25 18 25
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 23 29 2661.944 1873.034 17
## 2 23 29 2661.944 1873.034 17
## 3 23 29 2661.944 1873.034 17
## 4 23 29 2661.944 1873.034 17
## 5 23 29 2661.944 1873.034 17
## 6 23 29 2661.944 1873.034 17
## 7 23 29 2661.944 1873.034 17
## 8 23 29 2661.944 1873.034 17
## 9 23 29 2661.944 1873.034 17
## 10 23 29 2661.944 1873.034 17
## 11 23 29 2661.944 1873.034 17
## 12 23 29 2661.944 1873.034 17
## 13 23 29 2661.944 1873.034 17
## 14 23 29 2661.944 1873.034 17
## 15 23 29 2661.944 1873.034 17
## 16 23 29 2661.944 1873.034 17
## 17 23 29 2661.944 1873.034 17
## 18 23 29 2661.944 1873.034 17
## 19 23 29 2661.944 1873.034 17
## 20 23 29 2661.944 1873.034 17
## 21 23 29 2661.944 1873.034 17
## 22 23 29 2661.944 1873.034 17
## 23 23 29 2661.944 1873.034 17
## 24 23 29 2661.944 1873.034 17
## 25 23 29 2661.944 1873.034 17
## 26 23 29 2661.944 1873.034 17
## 27 23 29 2661.944 1873.034 17
## 28 23 29 2661.944 1873.034 17
## 29 23 29 2661.944 1873.034 17
## 30 23 29 2661.944 1873.034 17
## 31 23 29 2661.944 1873.034 17
## 32 23 29 2661.944 1873.034 17
## 33 23 29 2661.944 1873.034 17
## 34 23 29 2661.944 1873.034 17
## 35 23 29 2661.944 1873.034 17
## 36 23 29 2661.944 1873.034 17
## maximumMaxSalary
## 1 45000
## 2 45000
## 3 45000
## 4 45000
## 5 45000
## 6 45000
## 7 45000
## 8 45000
## 9 45000
## 10 45000
## 11 45000
## 12 45000
## 13 45000
## 14 45000
## 15 45000
## 16 45000
## 17 45000
## 18 45000
## 19 45000
## 20 45000
## 21 45000
## 22 45000
## 23 45000
## 24 45000
## 25 45000
## 26 45000
## 27 45000
## 28 45000
## 29 45000
## 30 45000
## 31 45000
## 32 45000
## 33 45000
## 34 45000
## 35 45000
## 36 45000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 Today
## 4 14
## 5 30
## 6 Today
## 7 30
## 8 15
## 9 Today
## 10 5
## 11 Today
## 12 3
## 13 11
## 14 7
## 15 30
## 16 12
## 17 7
## 18 30
## 19 30
## 20 30
## 21 19
## 22 11
## 23 30
## 24 30
## 25 30
## 26 30
## 27 11
## 28 12
## 29 11
## 30 30
## 31 7
## 32 30
## 33 30
## 34 19
## 35 30
## 36 30
## 37 11
## 38 30
## 39 30
## 40 30
## 41 30
## 42 11
## 43 27
## 44 30
## 45 30
## 46 19
## 47 11
## 48 30
## 49 30
## 50 30
## 51 30
## 52 11
## 53 15
## 54 30
## 55 Today
## 56 30
## 57 Today
## 58 30
## 59 14
## 60 30
## 61 12
## 62 11
## 63 30
## 64 7
## 65 30
## 66 30
## 67 19
## 68 30
## 69 30
## 70 11
## 71 30
## 72 30
## 73 30
## 74 30
## 75 11
##
## [[4]]
## HiringAgency
## 1 Coughlin Chiropractic3.0Indianapolis, IN 46226
## 2 Hand & Stone Massage and Facial Spa Clay Terrace - Carmel, IN3.0Carmel, IN 46032
## 3 Massage Heights - Indianapolis, Carmel, & Fishers3.1Indianapolis, IN
## 4 Transitions MedSpaIndianapolis, IN
## 5 Hand & Stone Massage and Facial Spa Avon3.0Avon, IN 46234
## 6 Rejuvenate Salon and Spa4.0Carmel, IN 46032
## 7 Massage Envy3.2Brownsburg, IN 46112
## 8 Restoration Massage and ReflexologyMooresville, IN 46158
## 9 Hand and Stone Spa3.0Indianapolis, IN 46262
## 10 Indo-Pak Massage TherapyIndianapolis, IN•Remote work available
## 11 Hand and Stone Spa3.0Indianapolis, IN 46262
## 12 Phenix Salon Suites FranchisingCarmel, IN 46033+1 location
## 13 Transformations Salon and Spa4.3Indianapolis, IN 46227 (South Perry area)
## 14 Hand and Stone Spa3.0Indianapolis, IN 46262
## 15 Life Time3.6Indianapolis, IN
## 16 Bask on MainCarmel, IN 46032
## 17 Hand and Stone Spa3.0Indianapolis, IN 46262
## 18 Massage Envy3.2Indianapolis, IN 46237 (South Emerson area)
## 19 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 20 JCPenney3.7Greenwood, IN 46142
## 21 MassageLuXe3.0Carmel, IN 46032
## 22 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 23 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 24 Massage Envy3.2Greenwood, IN 46142
## 25 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 26 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 27 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
## 28 Bask on MainCarmel, IN 46032
## 29 The Woodhouse Day Spa3.3Indianapolis, IN 46262+2 locations
## 30 The Fix RxGreenwood, IN 46142
## 31 Hand and Stone Spa3.0Indianapolis, IN 46262
## 32 Franciscan Alliance3.5Greenwood, IN 46143
## 33 Massage Envy3.2Indianapolis, IN 46237 (South Emerson area)
## 34 MassageLuXe3.0Carmel, IN 46032
## 35 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 36 JCPenney3.7Greenwood, IN 46142
## 37 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 38 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 39 Massage Envy3.2Greenwood, IN 46142
## 40 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 41 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 42 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
## 43 Hand and Stone3.0Indianapolis, IN 46240
## 44 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 45 JCPenney3.7Greenwood, IN 46142
## 46 MassageLuXe3.0Carmel, IN 46032
## 47 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 48 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 49 Massage Envy3.2Greenwood, IN 46142
## 50 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 51 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 52 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
## 53 Restoration Massage and ReflexologyMooresville, IN 46158
## 54 Massage Envy3.2Brownsburg, IN 46112
## 55 Massage Heights - Indianapolis, Carmel, & Fishers3.1Indianapolis, IN
## 56 Hand & Stone Massage and Facial Spa Avon3.0Avon, IN 46234
## 57 Rejuvenate Salon and Spa4.0Carmel, IN 46032
## 58 Hand & Stone Massage and Facial Spa Clay Terrace - Carmel, IN3.0Carmel, IN 46032
## 59 Transitions MedSpaIndianapolis, IN
## 60 Coughlin Chiropractic3.0Indianapolis, IN 46226
## 61 Bask on MainCarmel, IN 46032
## 62 The Woodhouse Day Spa3.3Indianapolis, IN 46262+2 locations
## 63 The Fix RxGreenwood, IN 46142
## 64 Hand and Stone Spa3.0Indianapolis, IN 46262
## 65 Franciscan Alliance3.5Greenwood, IN 46143
## 66 Massage Envy3.2Indianapolis, IN 46237 (South Emerson area)
## 67 MassageLuXe3.0Carmel, IN 46032
## 68 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 69 JCPenney3.7Greenwood, IN 46142
## 70 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 71 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 72 Massage Envy3.2Greenwood, IN 46142
## 73 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 74 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 75 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
##
## [[5]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 13 \n$45,000 a year $45000 45000 NA 45000 NA
## 30 \n$45,000 a year $45000 45000 NA 45000 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 13 45000 NaN 45000 -Inf
## 30 45000 NaN 45000 -Inf
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$23 - $28 an hour $23 - $28 23 28 20
## 2 \n$40 - $55 an hour $40 - $55 40 55 20
## 3 \n$20 - $50 an hour $20 - $50 20 50 20
## 4 \n$25 - $45 an hour $25 - $45 25 45 20
## 5 \n$20 - $35 an hour $20 - $35 20 35 20
## 7 \n$20 - $40 an hour $20 - $40 20 40 20
## 8 \n$35 an hour $35 35 NA 20
## 9 \n$38 - $45 an hour $38 - $45 38 45 20
## 10 \n$18 an hour $18 18 NA 20
## 11 \n$17 an hour $17 17 NA 20
## 12 \n$18 - $25 an hour $18 - $25 18 25 20
## 14 \n$25 - $30 an hour $25 - $30 25 30 20
## 15 \n$35 an hour $35 35 NA 20
## 16 \n$38 - $45 an hour $38 - $45 38 45 20
## 17 \n$18 an hour $18 18 NA 20
## 18 \n$17 an hour $17 17 NA 20
## 19 \n$18 - $25 an hour $18 - $25 18 25 20
## 20 \n$35 an hour $35 35 NA 20
## 21 \n$38 - $45 an hour $38 - $45 38 45 20
## 22 \n$18 an hour $18 18 NA 20
## 23 \n$17 an hour $17 17 NA 20
## 24 \n$18 - $25 an hour $18 - $25 18 25 20
## 25 \n$20 - $35 an hour $20 - $35 20 35 20
## 26 \n$25 - $45 an hour $25 - $45 25 45 20
## 27 \n$20 - $50 an hour $20 - $50 20 50 20
## 28 \n$40 - $55 an hour $40 - $55 40 55 20
## 29 \n$23 - $28 an hour $23 - $28 23 28 20
## 31 \n$25 - $30 an hour $25 - $30 25 30 20
## 32 \n$35 an hour $35 35 NA 20
## 33 \n$38 - $45 an hour $38 - $45 38 45 20
## 34 \n$18 an hour $18 18 NA 20
## 35 \n$17 an hour $17 17 NA 20
## 36 \n$18 - $25 an hour $18 - $25 18 25 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 25.15152 38.38095 17 55
## 2 40 25.15152 38.38095 17 55
## 3 40 25.15152 38.38095 17 55
## 4 40 25.15152 38.38095 17 55
## 5 40 25.15152 38.38095 17 55
## 7 40 25.15152 38.38095 17 55
## 8 40 25.15152 38.38095 17 55
## 9 40 25.15152 38.38095 17 55
## 10 40 25.15152 38.38095 17 55
## 11 40 25.15152 38.38095 17 55
## 12 40 25.15152 38.38095 17 55
## 14 40 25.15152 38.38095 17 55
## 15 40 25.15152 38.38095 17 55
## 16 40 25.15152 38.38095 17 55
## 17 40 25.15152 38.38095 17 55
## 18 40 25.15152 38.38095 17 55
## 19 40 25.15152 38.38095 17 55
## 20 40 25.15152 38.38095 17 55
## 21 40 25.15152 38.38095 17 55
## 22 40 25.15152 38.38095 17 55
## 23 40 25.15152 38.38095 17 55
## 24 40 25.15152 38.38095 17 55
## 25 40 25.15152 38.38095 17 55
## 26 40 25.15152 38.38095 17 55
## 27 40 25.15152 38.38095 17 55
## 28 40 25.15152 38.38095 17 55
## 29 40 25.15152 38.38095 17 55
## 31 40 25.15152 38.38095 17 55
## 32 40 25.15152 38.38095 17 55
## 33 40 25.15152 38.38095 17 55
## 34 40 25.15152 38.38095 17 55
## 35 40 25.15152 38.38095 17 55
## 36 40 25.15152 38.38095 17 55
##
## [[7]]
## city state
## 1 Indianapolis IN
## 2 Indianapolis IN
## 3 Indianapolis IN
## 4 Indianapolis IN
## 5 Indianapolis IN
## 6 Indianapolis IN
## 7 Indianapolis IN
## 8 Indianapolis IN
## 9 Indianapolis IN
## 10 Indianapolis IN
## 11 Indianapolis IN
## 12 Indianapolis IN
## 13 Indianapolis IN
## 14 Indianapolis IN
## 15 Indianapolis IN
## 16 Indianapolis IN
## 17 Indianapolis IN
## 18 Indianapolis IN
## 19 Indianapolis IN
## 20 Indianapolis IN
## 21 Indianapolis IN
## 22 Indianapolis IN
## 23 Indianapolis IN
## 24 Indianapolis IN
## 25 Indianapolis IN
## 26 Indianapolis IN
## 27 Indianapolis IN
## 28 Indianapolis IN
## 29 Indianapolis IN
## 30 Indianapolis IN
## 31 Indianapolis IN
## 32 Indianapolis IN
## 33 Indianapolis IN
## 34 Indianapolis IN
## 35 Indianapolis IN
## 36 Indianapolis IN
## 37 Indianapolis IN
## 38 Indianapolis IN
## 39 Indianapolis IN
## 40 Indianapolis IN
## 41 Indianapolis IN
## 42 Indianapolis IN
## 43 Indianapolis IN
## 44 Indianapolis IN
## 45 Indianapolis IN
## 46 Indianapolis IN
## 47 Indianapolis IN
## 48 Indianapolis IN
## 49 Indianapolis IN
## 50 Indianapolis IN
## 51 Indianapolis IN
## 52 Indianapolis IN
## 53 Indianapolis IN
## 54 Indianapolis IN
## 55 Indianapolis IN
## 56 Indianapolis IN
## 57 Indianapolis IN
## 58 Indianapolis IN
## 59 Indianapolis IN
## 60 Indianapolis IN
## 61 Indianapolis IN
## 62 Indianapolis IN
## 63 Indianapolis IN
## 64 Indianapolis IN
## 65 Indianapolis IN
## 66 Indianapolis IN
## 67 Indianapolis IN
## 68 Indianapolis IN
## 69 Indianapolis IN
## 70 Indianapolis IN
## 71 Indianapolis IN
## 72 Indianapolis IN
## 73 Indianapolis IN
## 74 Indianapolis IN
## 75 Indianapolis IN
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT) $1,000.00 Sign on Bonus
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist
## 8 Part time Massage Therapist-Mooresville
## 9 Massage Therapist at Keystone Crossing
## 10 Massage Therapist - Independent Contractor
## 11 Weekend Massage Therapist at Keystone Crossing
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 15 Massage Therapist - Full Time
## 16 Licensed Massage Therapist
## 17 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 18 Massage Therapist- Southport- Busy Spa!
## 19 Massage Therapists
## 20 Salon Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist PT/FT
## 24 Massage Therapist (Full & Part-time)
## 25 Massage Therapist-Keystone at the Crossing
## 26 Licensed Massage Therapist
## 27 Part Time Weekend Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 32 Massage Therapist - Contract
## 33 Massage Therapist- Southport- Busy Spa!
## 34 Massage Therapist
## 35 Massage Therapists
## 36 Salon Massage Therapist
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist PT/FT
## 39 Massage Therapist (Full & Part-time)
## 40 Massage Therapist-Keystone at the Crossing
## 41 Licensed Massage Therapist
## 42 Part Time Weekend Licensed Massage Therapist
## 43 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 44 Massage Therapists
## 45 Salon Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist PT/FT
## 49 Massage Therapist (Full & Part-time)
## 50 Massage Therapist-Keystone at the Crossing
## 51 Licensed Massage Therapist
## 52 Part Time Weekend Licensed Massage Therapist
## 53 Part time Massage Therapist-Mooresville
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist (LMT)
## 56 Licensed Massage Therapist
## 57 Massage Therapist - Independent Contractor
## 58 Licensed Massage Therapist (LMT) $1,000.00 Sign on Bonus
## 59 Massage Therapist
## 60 Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 Sports/Chronic Pain Massage Therapist at Keystone Crossing
## 65 Massage Therapist - Contract
## 66 Massage Therapist- Southport- Busy Spa!
## 67 Massage Therapist
## 68 Massage Therapists
## 69 Salon Massage Therapist
## 70 Licensed Massage Therapist
## 71 Licensed Massage Therapist PT/FT
## 72 Massage Therapist (Full & Part-time)
## 73 Massage Therapist-Keystone at the Crossing
## 74 Licensed Massage Therapist
## 75 Part Time Weekend Licensed Massage Therapist
## HiringAgency
## 1 Coughlin Chiropractic3.0Indianapolis, IN 46226
## 2 Hand & Stone Massage and Facial Spa Clay Terrace - Carmel, IN3.0Carmel, IN 46032
## 3 Massage Heights - Indianapolis, Carmel, & Fishers3.1Indianapolis, IN
## 4 Transitions MedSpaIndianapolis, IN
## 5 Hand & Stone Massage and Facial Spa Avon3.0Avon, IN 46234
## 6 Rejuvenate Salon and Spa4.0Carmel, IN 46032
## 7 Massage Envy3.2Brownsburg, IN 46112
## 8 Restoration Massage and ReflexologyMooresville, IN 46158
## 9 Hand and Stone Spa3.0Indianapolis, IN 46262
## 10 Indo-Pak Massage TherapyIndianapolis, IN•Remote work available
## 11 Hand and Stone Spa3.0Indianapolis, IN 46262
## 12 Phenix Salon Suites FranchisingCarmel, IN 46033+1 location
## 13 Transformations Salon and Spa4.3Indianapolis, IN 46227 (South Perry area)
## 14 Hand and Stone Spa3.0Indianapolis, IN 46262
## 15 Life Time3.6Indianapolis, IN
## 16 Bask on MainCarmel, IN 46032
## 17 Hand and Stone Spa3.0Indianapolis, IN 46262
## 18 Massage Envy3.2Indianapolis, IN 46237 (South Emerson area)
## 19 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 20 JCPenney3.7Greenwood, IN 46142
## 21 MassageLuXe3.0Carmel, IN 46032
## 22 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 23 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 24 Massage Envy3.2Greenwood, IN 46142
## 25 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 26 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 27 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
## 28 Bask on MainCarmel, IN 46032
## 29 The Woodhouse Day Spa3.3Indianapolis, IN 46262+2 locations
## 30 The Fix RxGreenwood, IN 46142
## 31 Hand and Stone Spa3.0Indianapolis, IN 46262
## 32 Franciscan Alliance3.5Greenwood, IN 46143
## 33 Massage Envy3.2Indianapolis, IN 46237 (South Emerson area)
## 34 MassageLuXe3.0Carmel, IN 46032
## 35 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 36 JCPenney3.7Greenwood, IN 46142
## 37 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 38 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 39 Massage Envy3.2Greenwood, IN 46142
## 40 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 41 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 42 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
## 43 Hand and Stone3.0Indianapolis, IN 46240
## 44 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 45 JCPenney3.7Greenwood, IN 46142
## 46 MassageLuXe3.0Carmel, IN 46032
## 47 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 48 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 49 Massage Envy3.2Greenwood, IN 46142
## 50 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 51 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 52 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
## 53 Restoration Massage and ReflexologyMooresville, IN 46158
## 54 Massage Envy3.2Brownsburg, IN 46112
## 55 Massage Heights - Indianapolis, Carmel, & Fishers3.1Indianapolis, IN
## 56 Hand & Stone Massage and Facial Spa Avon3.0Avon, IN 46234
## 57 Rejuvenate Salon and Spa4.0Carmel, IN 46032
## 58 Hand & Stone Massage and Facial Spa Clay Terrace - Carmel, IN3.0Carmel, IN 46032
## 59 Transitions MedSpaIndianapolis, IN
## 60 Coughlin Chiropractic3.0Indianapolis, IN 46226
## 61 Bask on MainCarmel, IN 46032
## 62 The Woodhouse Day Spa3.3Indianapolis, IN 46262+2 locations
## 63 The Fix RxGreenwood, IN 46142
## 64 Hand and Stone Spa3.0Indianapolis, IN 46262
## 65 Franciscan Alliance3.5Greenwood, IN 46143
## 66 Massage Envy3.2Indianapolis, IN 46237 (South Emerson area)
## 67 MassageLuXe3.0Carmel, IN 46032
## 68 Robert's Salon and Day Spa3.2Greenwood, IN 46142
## 69 JCPenney3.7Greenwood, IN 46142
## 70 The Woodhouse Day Spa - IndianapolisFishers, IN 46037+2 locations
## 71 Hand and Stone3.0Indianapolis, IN 46240+1 location
## 72 Massage Envy3.2Greenwood, IN 46142
## 73 Massage Envy3.2Indianapolis, IN 46240 (Keystone at the Crossing area)
## 74 Massage Heights3.1Indianapolis, IN 46240 (Nora-Far Northside area)+2 locations
## 75 The Woodhouse Day Spa - IndianapolisZionsville, IN 46077
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 17 55 45000 45000
## 2 30 17 55 45000 45000
## 3 Today 17 55 45000 45000
## 4 14 17 55 45000 45000
## 5 30 17 55 45000 45000
## 6 Today 17 55 45000 45000
## 7 30 17 55 45000 45000
## 8 15 17 55 45000 45000
## 9 Today 17 55 45000 45000
## 10 5 17 55 45000 45000
## 11 Today 17 55 45000 45000
## 12 3 17 55 45000 45000
## 13 11 17 55 45000 45000
## 14 7 17 55 45000 45000
## 15 30 17 55 45000 45000
## 16 12 17 55 45000 45000
## 17 7 17 55 45000 45000
## 18 30 17 55 45000 45000
## 19 30 17 55 45000 45000
## 20 30 17 55 45000 45000
## 21 19 17 55 45000 45000
## 22 11 17 55 45000 45000
## 23 30 17 55 45000 45000
## 24 30 17 55 45000 45000
## 25 30 17 55 45000 45000
## 26 30 17 55 45000 45000
## 27 11 17 55 45000 45000
## 28 12 17 55 45000 45000
## 29 11 17 55 45000 45000
## 30 30 17 55 45000 45000
## 31 7 17 55 45000 45000
## 32 30 17 55 45000 45000
## 33 30 17 55 45000 45000
## 34 19 17 55 45000 45000
## 35 30 17 55 45000 45000
## 36 30 17 55 45000 45000
## 37 11 17 55 45000 45000
## 38 30 17 55 45000 45000
## 39 30 17 55 45000 45000
## 40 30 17 55 45000 45000
## 41 30 17 55 45000 45000
## 42 11 17 55 45000 45000
## 43 27 17 55 45000 45000
## 44 30 17 55 45000 45000
## 45 30 17 55 45000 45000
## 46 19 17 55 45000 45000
## 47 11 17 55 45000 45000
## 48 30 17 55 45000 45000
## 49 30 17 55 45000 45000
## 50 30 17 55 45000 45000
## 51 30 17 55 45000 45000
## 52 11 17 55 45000 45000
## 53 15 17 55 45000 45000
## 54 30 17 55 45000 45000
## 55 Today 17 55 45000 45000
## 56 30 17 55 45000 45000
## 57 Today 17 55 45000 45000
## 58 30 17 55 45000 45000
## 59 14 17 55 45000 45000
## 60 30 17 55 45000 45000
## 61 12 17 55 45000 45000
## 62 11 17 55 45000 45000
## 63 30 17 55 45000 45000
## 64 7 17 55 45000 45000
## 65 30 17 55 45000 45000
## 66 30 17 55 45000 45000
## 67 19 17 55 45000 45000
## 68 30 17 55 45000 45000
## 69 30 17 55 45000 45000
## 70 11 17 55 45000 45000
## 71 30 17 55 45000 45000
## 72 30 17 55 45000 45000
## 73 30 17 55 45000 45000
## 74 30 17 55 45000 45000
## 75 11 17 55 45000 45000
getIndeedJobData5pages("massage therapist", "Fort Wayne","IN")
## Warning in getIndeedJobData5pages("massage therapist", "Fort Wayne", "IN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Fort Wayne", "IN"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist Full and Part Time
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist Full and Part Time
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist Full and Part Time
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist Full and Part Time
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Massage Therapist
## 20 Massage Therapist Full and Part Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$24 - $36 an hour $24 - $36 24 36
## 2 \n$25,000 a year $25000 25000 NA
## 3 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 4 \n$25,000 a year $25000 25000 NA
## 5 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 6 \n$24 - $36 an hour $24 - $36 24 36
## 7 \n$25,000 a year $25000 25000 NA
## 8 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 9 \n$24 - $36 an hour $24 - $36 24 36
## 10 \n$25,000 a year $25000 25000 NA
## 11 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 12 \n$24 - $36 an hour $24 - $36 24 36
## 13 \n$25,000 a year $25000 25000 NA
## 14 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 15 \n$24 - $36 an hour $24 - $36 24 36
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25000 25000 21674.67 29012 24
## 2 25000 25000 21674.67 29012 24
## 3 25000 25000 21674.67 29012 24
## 4 25000 25000 21674.67 29012 24
## 5 25000 25000 21674.67 29012 24
## 6 25000 25000 21674.67 29012 24
## 7 25000 25000 21674.67 29012 24
## 8 25000 25000 21674.67 29012 24
## 9 25000 25000 21674.67 29012 24
## 10 25000 25000 21674.67 29012 24
## 11 25000 25000 21674.67 29012 24
## 12 25000 25000 21674.67 29012 24
## 13 25000 25000 21674.67 29012 24
## 14 25000 25000 21674.67 29012 24
## 15 25000 25000 21674.67 29012 24
## maximumMaxSalary
## 1 80000
## 2 80000
## 3 80000
## 4 80000
## 5 80000
## 6 80000
## 7 80000
## 8 80000
## 9 80000
## 10 80000
## 11 80000
## 12 80000
## 13 80000
## 14 80000
## 15 80000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 20
## 4 30
## 5 30
## 6 20
## 7 30
## 8 30
## 9 30
## 10 20
## 11 30
## 12 30
## 13 30
## 14 20
## 15 30
## 16 30
## 17 30
## 18 20
## 19 30
## 20 30
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Fort Wayne, IN 46818
## 2 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area)
## 3 Massage Envy3.2Fort Wayne, IN 46804
## 4 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area)
## 5 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area)
## 6 Massage Envy3.2Fort Wayne, IN 46804
## 7 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area)
## 8 Elements Massage3.6Fort Wayne, IN 46818
## 9 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area)
## 10 Massage Envy3.2Fort Wayne, IN 46804
## 11 Elements Massage3.6Fort Wayne, IN 46818
## 12 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area)
## 13 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area)
## 14 Massage Envy3.2Fort Wayne, IN 46804
## 15 Elements Massage3.6Fort Wayne, IN 46818
## 16 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area)
## 17 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area)
## 18 Massage Envy3.2Fort Wayne, IN 46804
## 19 Elements Massage3.6Fort Wayne, IN 46818
## 20 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$25,000 a year $25000 25000 NA
## 3 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 4 \n$25,000 a year $25000 25000 NA
## 5 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 7 \n$25,000 a year $25000 25000 NA
## 8 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 10 \n$25,000 a year $25000 25000 NA
## 11 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 13 \n$25,000 a year $25000 25000 NA
## 14 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 32500 80000 32500 80000 25000
## 3 32500 80000 32500 80000 25000
## 4 32500 80000 32500 80000 25000
## 5 32500 80000 32500 80000 25000
## 7 32500 80000 32500 80000 25000
## 8 32500 80000 32500 80000 25000
## 10 32500 80000 32500 80000 25000
## 11 32500 80000 32500 80000 25000
## 13 32500 80000 32500 80000 25000
## 14 32500 80000 32500 80000 25000
## maximumMaxSalary
## 2 80000
## 3 80000
## 4 80000
## 5 80000
## 7 80000
## 8 80000
## 10 80000
## 11 80000
## 13 80000
## 14 80000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$24 - $36 an hour $24 - $36 24 36 24
## 6 \n$24 - $36 an hour $24 - $36 24 36 24
## 9 \n$24 - $36 an hour $24 - $36 24 36 24
## 12 \n$24 - $36 an hour $24 - $36 24 36 24
## 15 \n$24 - $36 an hour $24 - $36 24 36 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 36 24 36 24 36
## 6 36 24 36 24 36
## 9 36 24 36 24 36
## 12 36 24 36 24 36
## 15 36 24 36 24 36
##
## [[7]]
## city state jobTitle
## 1 Fort Wayne IN Massage Therapist
## 2 Fort Wayne IN Massage Therapist
## 3 Fort Wayne IN Massage Therapist
## 4 Fort Wayne IN Massage Therapist Full and Part Time
## 5 Fort Wayne IN Massage Therapist
## 6 Fort Wayne IN Massage Therapist
## 7 Fort Wayne IN Massage Therapist Full and Part Time
## 8 Fort Wayne IN Massage Therapist
## 9 Fort Wayne IN Massage Therapist
## 10 Fort Wayne IN Massage Therapist
## 11 Fort Wayne IN Massage Therapist
## 12 Fort Wayne IN Massage Therapist Full and Part Time
## 13 Fort Wayne IN Massage Therapist
## 14 Fort Wayne IN Massage Therapist
## 15 Fort Wayne IN Massage Therapist
## 16 Fort Wayne IN Massage Therapist Full and Part Time
## 17 Fort Wayne IN Massage Therapist
## 18 Fort Wayne IN Massage Therapist
## 19 Fort Wayne IN Massage Therapist
## 20 Fort Wayne IN Massage Therapist Full and Part Time
## HiringAgency date_daysAgo
## 1 Elements Massage3.6Fort Wayne, IN 46818 30
## 2 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area) 30
## 3 Massage Envy3.2Fort Wayne, IN 46804 20
## 4 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area) 30
## 5 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area) 30
## 6 Massage Envy3.2Fort Wayne, IN 46804 20
## 7 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area) 30
## 8 Elements Massage3.6Fort Wayne, IN 46818 30
## 9 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area) 30
## 10 Massage Envy3.2Fort Wayne, IN 46804 20
## 11 Elements Massage3.6Fort Wayne, IN 46818 30
## 12 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area) 30
## 13 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area) 30
## 14 Massage Envy3.2Fort Wayne, IN 46804 20
## 15 Elements Massage3.6Fort Wayne, IN 46818 30
## 16 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area) 30
## 17 Elements3.6Fort Wayne, IN 46825 (Wallen Chase area) 30
## 18 Massage Envy3.2Fort Wayne, IN 46804 20
## 19 Elements Massage3.6Fort Wayne, IN 46818 30
## 20 Massage Envy3.2Fort Wayne, IN 46825 (Wallen Chase area) 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 24 36 25000 80000
## 2 24 36 25000 80000
## 3 24 36 25000 80000
## 4 24 36 25000 80000
## 5 24 36 25000 80000
## 6 24 36 25000 80000
## 7 24 36 25000 80000
## 8 24 36 25000 80000
## 9 24 36 25000 80000
## 10 24 36 25000 80000
## 11 24 36 25000 80000
## 12 24 36 25000 80000
## 13 24 36 25000 80000
## 14 24 36 25000 80000
## 15 24 36 25000 80000
## 16 24 36 25000 80000
## 17 24 36 25000 80000
## 18 24 36 25000 80000
## 19 24 36 25000 80000
## 20 24 36 25000 80000
getIndeedJobData5pages("massage therapist", "Evansville","IN")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 20 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$40 - $60 an hour $40 - $60 40 60 30
## 2 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 3 \n$40 - $60 an hour $40 - $60 40 60 30
## 4 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 5 \n$40 - $60 an hour $40 - $60 40 60 30
## 6 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 7 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 8 \n$40 - $60 an hour $40 - $60 40 60 30
## 9 \n$40 - $60 an hour $40 - $60 40 60 30
## 10 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 32.5 30 36.25 20 60
## 2 32.5 30 36.25 20 60
## 3 32.5 30 36.25 20 60
## 4 32.5 30 36.25 20 60
## 5 32.5 30 36.25 20 60
## 6 32.5 30 36.25 20 60
## 7 32.5 30 36.25 20 60
## 8 32.5 30 36.25 20 60
## 9 32.5 30 36.25 20 60
## 10 32.5 30 36.25 20 60
##
## [[3]]
## date_daysAgo
## 1 30
## 2 5
## 3 30
## 4 30
## 5 30
## 6 5
## 7 30
## 8 30
## 9 30
## 10 5
## 11 30
## 12 30
## 13 5
## 14 30
## 15 30
## 16 30
## 17 30
## 18 5
## 19 30
## 20 30
##
## [[4]]
## HiringAgency
## 1 Confidential - Health Care organizationEvansville, IN 47714
## 2 Jim Roll3.1Evansville, IN 47747
## 3 Massage Envy3.2Evansville, IN 47715
## 4 Fusion Spa & Boutique3.0Evansville, IN 47715
## 5 Confidential - Health Care organizationEvansville, IN 47714
## 6 Jim Roll3.1Evansville, IN 47747
## 7 Massage Envy3.2Evansville, IN 47715
## 8 Fusion Spa & Boutique3.0Evansville, IN 47715
## 9 Confidential - Health Care organizationEvansville, IN 47714
## 10 Jim Roll3.1Evansville, IN 47747
## 11 Massage Envy3.2Evansville, IN 47715
## 12 Fusion Spa & Boutique3.0Evansville, IN 47715
## 13 Jim Roll3.1Evansville, IN 47747
## 14 Massage Envy3.2Evansville, IN 47715
## 15 Fusion Spa & Boutique3.0Evansville, IN 47715
## 16 Confidential - Health Care organizationEvansville, IN 47714
## 17 Confidential - Health Care organizationEvansville, IN 47714
## 18 Jim Roll3.1Evansville, IN 47747
## 19 Massage Envy3.2Evansville, IN 47715
## 20 Fusion Spa & Boutique3.0Evansville, IN 47715
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$40 - $60 an hour $40 - $60 40 60 30
## 2 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 3 \n$40 - $60 an hour $40 - $60 40 60 30
## 4 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 5 \n$40 - $60 an hour $40 - $60 40 60 30
## 6 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 7 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## 8 \n$40 - $60 an hour $40 - $60 40 60 30
## 9 \n$40 - $60 an hour $40 - $60 40 60 30
## 10 \n$20 - $25 an hour ++ $20 - $25 20 25 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 42.5 30 42.5 20 60
## 2 42.5 30 42.5 20 60
## 3 42.5 30 42.5 20 60
## 4 42.5 30 42.5 20 60
## 5 42.5 30 42.5 20 60
## 6 42.5 30 42.5 20 60
## 7 42.5 30 42.5 20 60
## 8 42.5 30 42.5 20 60
## 9 42.5 30 42.5 20 60
## 10 42.5 30 42.5 20 60
##
## [[7]]
## city state
## 1 Evansville IN
## 2 Evansville IN
## 3 Evansville IN
## 4 Evansville IN
## 5 Evansville IN
## 6 Evansville IN
## 7 Evansville IN
## 8 Evansville IN
## 9 Evansville IN
## 10 Evansville IN
## 11 Evansville IN
## 12 Evansville IN
## 13 Evansville IN
## 14 Evansville IN
## 15 Evansville IN
## 16 Evansville IN
## 17 Evansville IN
## 18 Evansville IN
## 19 Evansville IN
## 20 Evansville IN
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist - Missed Appointments Daily - Nee...
## 20 Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Confidential - Health Care organizationEvansville, IN 47714 30
## 2 Jim Roll3.1Evansville, IN 47747 5
## 3 Massage Envy3.2Evansville, IN 47715 30
## 4 Fusion Spa & Boutique3.0Evansville, IN 47715 30
## 5 Confidential - Health Care organizationEvansville, IN 47714 30
## 6 Jim Roll3.1Evansville, IN 47747 5
## 7 Massage Envy3.2Evansville, IN 47715 30
## 8 Fusion Spa & Boutique3.0Evansville, IN 47715 30
## 9 Confidential - Health Care organizationEvansville, IN 47714 30
## 10 Jim Roll3.1Evansville, IN 47747 5
## 11 Massage Envy3.2Evansville, IN 47715 30
## 12 Fusion Spa & Boutique3.0Evansville, IN 47715 30
## 13 Jim Roll3.1Evansville, IN 47747 5
## 14 Massage Envy3.2Evansville, IN 47715 30
## 15 Fusion Spa & Boutique3.0Evansville, IN 47715 30
## 16 Confidential - Health Care organizationEvansville, IN 47714 30
## 17 Confidential - Health Care organizationEvansville, IN 47714 30
## 18 Jim Roll3.1Evansville, IN 47747 5
## 19 Massage Envy3.2Evansville, IN 47715 30
## 20 Fusion Spa & Boutique3.0Evansville, IN 47715 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 20 60 NA NA
## 2 20 60 NA NA
## 3 20 60 NA NA
## 4 20 60 NA NA
## 5 20 60 NA NA
## 6 20 60 NA NA
## 7 20 60 NA NA
## 8 20 60 NA NA
## 9 20 60 NA NA
## 10 20 60 NA NA
## 11 20 60 NA NA
## 12 20 60 NA NA
## 13 20 60 NA NA
## 14 20 60 NA NA
## 15 20 60 NA NA
## 16 20 60 NA NA
## 17 20 60 NA NA
## 18 20 60 NA NA
## 19 20 60 NA NA
## 20 20 60 NA NA
Iowa Des Moines, Cedar Rapids, Davenport
getIndeedJobData5pages("massage therapist","Des Moines","IA")
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist - Independent Contractor
## 4 LifeSpa-Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Retreat Manager/Massage Therapist
## 8 Licensed Massage Therapist
## 9 Retreat Manager/Massage Therapist
## 10 Massage Therapist - Part-Time
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Dual Licensed Therapist - Massage and Skincare
## 14 Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 Massage Therapist - Independent Contractor
## 17 LifeSpa-Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Retreat Manager/Massage Therapist
## 21 Licensed Massage Therapist
## 22 Retreat Manager/Massage Therapist
## 23 Massage Therapist - Part-Time
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Dual Licensed Therapist - Massage and Skincare
## 27 Massage Therapist
## 28 Licensed Massage Therapist (LMT)
## 29 Massage Therapist - Independent Contractor
## 30 LifeSpa-Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist
## 33 Retreat Manager/Massage Therapist
## 34 Retreat Manager/Massage Therapist
## 35 Licensed Massage Therapist
## 36 Massage Therapist - Part-Time
## 37 Licensed Massage Therapist
## 38 Massage Therapist
## 39 Dual Licensed Therapist - Massage and Skincare
## 40 LifeSpa-Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Retreat Manager/Massage Therapist
## 44 Retreat Manager/Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist - Part-Time
## 47 Licensed Massage Therapist
## 48 Massage Therapist
## 49 Dual Licensed Therapist - Massage and Skincare
## 50 Massage Therapist
## 51 Licensed Massage Therapist (LMT)
## 52 Massage Therapist - Independent Contractor
## 53 LifeSpa-Massage Therapist
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Retreat Manager/Massage Therapist
## 57 Licensed Massage Therapist
## 58 Retreat Manager/Massage Therapist
## 59 Massage Therapist - Part-Time
## 60 Licensed Massage Therapist
## 61 Massage Therapist
## 62 Dual Licensed Therapist - Massage and Skincare
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $35 an hour $20 - $35 20 35
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 4 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 5 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 6 \n$20 - $35 an hour $20 - $35 20 35
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 9 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 10 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 11 \n$20 - $35 an hour $20 - $35 20 35
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 14 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 15 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 16 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 17 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 18 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 19 \n$20 - $35 an hour $20 - $35 20 35
## 20 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 21 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 22 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 23 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35000 35000 24351.3 27787.39 20
## 2 35000 35000 24351.3 27787.39 20
## 3 35000 35000 24351.3 27787.39 20
## 4 35000 35000 24351.3 27787.39 20
## 5 35000 35000 24351.3 27787.39 20
## 6 35000 35000 24351.3 27787.39 20
## 7 35000 35000 24351.3 27787.39 20
## 8 35000 35000 24351.3 27787.39 20
## 9 35000 35000 24351.3 27787.39 20
## 10 35000 35000 24351.3 27787.39 20
## 11 35000 35000 24351.3 27787.39 20
## 12 35000 35000 24351.3 27787.39 20
## 13 35000 35000 24351.3 27787.39 20
## 14 35000 35000 24351.3 27787.39 20
## 15 35000 35000 24351.3 27787.39 20
## 16 35000 35000 24351.3 27787.39 20
## 17 35000 35000 24351.3 27787.39 20
## 18 35000 35000 24351.3 27787.39 20
## 19 35000 35000 24351.3 27787.39 20
## 20 35000 35000 24351.3 27787.39 20
## 21 35000 35000 24351.3 27787.39 20
## 22 35000 35000 24351.3 27787.39 20
## 23 35000 35000 24351.3 27787.39 20
## maximumMaxSalary
## 1 54000
## 2 54000
## 3 54000
## 4 54000
## 5 54000
## 6 54000
## 7 54000
## 8 54000
## 9 54000
## 10 54000
## 11 54000
## 12 54000
## 13 54000
## 14 54000
## 15 54000
## 16 54000
## 17 54000
## 18 54000
## 19 54000
## 20 54000
## 21 54000
## 22 54000
## 23 54000
##
## [[3]]
## date_daysAgo
## 1 1
## 2 28
## 3 17
## 4 30
## 5 30
## 6 30
## 7 25
## 8 30
## 9 25
## 10 30
## 11 30
## 12 30
## 13 30
## 14 1
## 15 28
## 16 17
## 17 30
## 18 30
## 19 30
## 20 25
## 21 30
## 22 25
## 23 30
## 24 30
## 25 30
## 26 30
## 27 1
## 28 28
## 29 17
## 30 30
## 31 30
## 32 30
## 33 25
## 34 25
## 35 30
## 36 30
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 25
## 44 25
## 45 30
## 46 30
## 47 30
## 48 30
## 49 30
## 50 1
## 51 28
## 52 17
## 53 30
## 54 30
## 55 30
## 56 25
## 57 30
## 58 25
## 59 30
## 60 30
## 61 30
## 62 30
##
## [[4]]
## HiringAgency
## 1 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 2 Revive ChiropracticGrimes, IA 50111
## 3 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 4 Life Time3.6Urbandale, IA 50323
## 5 Elite Health + PerformanceBondurant, IA 50035
## 6 Spavia Day Spa3.3Ankeny, IA 50023
## 7 Massage Heights3.1West Des Moines, IA 50265
## 8 Massage Heights3.1Johnston, IA 50131+2 locations
## 9 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 10 Life Time3.6Urbandale, IA 50323
## 11 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 12 Massage Envy3.2Clive, IA 50325
## 13 Massage Heights3.1Clive, IA 50325
## 14 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 15 Revive ChiropracticGrimes, IA 50111
## 16 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 17 Life Time3.6Urbandale, IA 50323
## 18 Elite Health + PerformanceBondurant, IA 50035
## 19 Spavia Day Spa3.3Ankeny, IA 50023
## 20 Massage Heights3.1West Des Moines, IA 50265
## 21 Massage Heights3.1Johnston, IA 50131+2 locations
## 22 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 23 Life Time3.6Urbandale, IA 50323
## 24 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 25 Massage Envy3.2Clive, IA 50325
## 26 Massage Heights3.1Clive, IA 50325
## 27 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 28 Revive ChiropracticGrimes, IA 50111
## 29 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 30 Life Time3.6Urbandale, IA 50323
## 31 Elite Health + PerformanceBondurant, IA 50035
## 32 Spavia Day Spa3.3Ankeny, IA 50023
## 33 Massage Heights3.1West Des Moines, IA 50265
## 34 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 35 Massage Heights3.1Johnston, IA 50131+2 locations
## 36 Life Time3.6Urbandale, IA 50323
## 37 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 38 Massage Envy3.2Clive, IA 50325
## 39 Massage Heights3.1Clive, IA 50325
## 40 Life Time3.6Urbandale, IA 50323
## 41 Elite Health + PerformanceBondurant, IA 50035
## 42 Spavia Day Spa3.3Ankeny, IA 50023
## 43 Massage Heights3.1West Des Moines, IA 50265
## 44 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 45 Massage Heights3.1Johnston, IA 50131+2 locations
## 46 Life Time3.6Urbandale, IA 50323
## 47 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 48 Massage Envy3.2Clive, IA 50325
## 49 Massage Heights3.1Clive, IA 50325
## 50 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 51 Revive ChiropracticGrimes, IA 50111
## 52 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 53 Life Time3.6Urbandale, IA 50323
## 54 Elite Health + PerformanceBondurant, IA 50035
## 55 Spavia Day Spa3.3Ankeny, IA 50023
## 56 Massage Heights3.1West Des Moines, IA 50265
## 57 Massage Heights3.1Johnston, IA 50131+2 locations
## 58 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 59 Life Time3.6Urbandale, IA 50323
## 60 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 61 Massage Envy3.2Clive, IA 50325
## 62 Massage Heights3.1Clive, IA 50325
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 4 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 5 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 8 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 9 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 10 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 13 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 14 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 15 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 16 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 17 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 18 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 21 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 22 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## 23 \n$35,000 - $40,000 a year $35000 - $40000 35000 40000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 35000 40000 36000 44666.67 35000
## 4 35000 40000 36000 44666.67 35000
## 5 35000 40000 36000 44666.67 35000
## 8 35000 40000 36000 44666.67 35000
## 9 35000 40000 36000 44666.67 35000
## 10 35000 40000 36000 44666.67 35000
## 13 35000 40000 36000 44666.67 35000
## 14 35000 40000 36000 44666.67 35000
## 15 35000 40000 36000 44666.67 35000
## 16 35000 40000 36000 44666.67 35000
## 17 35000 40000 36000 44666.67 35000
## 18 35000 40000 36000 44666.67 35000
## 21 35000 40000 36000 44666.67 35000
## 22 35000 40000 36000 44666.67 35000
## 23 35000 40000 36000 44666.67 35000
## maximumMaxSalary
## 3 54000
## 4 54000
## 5 54000
## 8 54000
## 9 54000
## 10 54000
## 13 54000
## 14 54000
## 15 54000
## 16 54000
## 17 54000
## 18 54000
## 21 54000
## 22 54000
## 23 54000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 - $35 an hour $20 - $35 20 35 20
## 6 \n$20 - $35 an hour $20 - $35 20 35 20
## 11 \n$20 - $35 an hour $20 - $35 20 35 20
## 19 \n$20 - $35 an hour $20 - $35 20 35 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 35 20 35 20 35
## 6 35 20 35 20 35
## 11 35 20 35 20 35
## 19 35 20 35 20 35
##
## [[7]]
## city state jobTitle
## 1 Des Moines IA Massage Therapist
## 2 Des Moines IA Licensed Massage Therapist (LMT)
## 3 Des Moines IA Massage Therapist - Independent Contractor
## 4 Des Moines IA LifeSpa-Massage Therapist
## 5 Des Moines IA Licensed Massage Therapist
## 6 Des Moines IA Licensed Massage Therapist
## 7 Des Moines IA Retreat Manager/Massage Therapist
## 8 Des Moines IA Licensed Massage Therapist
## 9 Des Moines IA Retreat Manager/Massage Therapist
## 10 Des Moines IA Massage Therapist - Part-Time
## 11 Des Moines IA Licensed Massage Therapist
## 12 Des Moines IA Massage Therapist
## 13 Des Moines IA Dual Licensed Therapist - Massage and Skincare
## 14 Des Moines IA Massage Therapist
## 15 Des Moines IA Licensed Massage Therapist (LMT)
## 16 Des Moines IA Massage Therapist - Independent Contractor
## 17 Des Moines IA LifeSpa-Massage Therapist
## 18 Des Moines IA Licensed Massage Therapist
## 19 Des Moines IA Licensed Massage Therapist
## 20 Des Moines IA Retreat Manager/Massage Therapist
## 21 Des Moines IA Licensed Massage Therapist
## 22 Des Moines IA Retreat Manager/Massage Therapist
## 23 Des Moines IA Massage Therapist - Part-Time
## 24 Des Moines IA Licensed Massage Therapist
## 25 Des Moines IA Massage Therapist
## 26 Des Moines IA Dual Licensed Therapist - Massage and Skincare
## 27 Des Moines IA Massage Therapist
## 28 Des Moines IA Licensed Massage Therapist (LMT)
## 29 Des Moines IA Massage Therapist - Independent Contractor
## 30 Des Moines IA LifeSpa-Massage Therapist
## 31 Des Moines IA Licensed Massage Therapist
## 32 Des Moines IA Licensed Massage Therapist
## 33 Des Moines IA Retreat Manager/Massage Therapist
## 34 Des Moines IA Retreat Manager/Massage Therapist
## 35 Des Moines IA Licensed Massage Therapist
## 36 Des Moines IA Massage Therapist - Part-Time
## 37 Des Moines IA Licensed Massage Therapist
## 38 Des Moines IA Massage Therapist
## 39 Des Moines IA Dual Licensed Therapist - Massage and Skincare
## 40 Des Moines IA LifeSpa-Massage Therapist
## 41 Des Moines IA Licensed Massage Therapist
## 42 Des Moines IA Licensed Massage Therapist
## 43 Des Moines IA Retreat Manager/Massage Therapist
## 44 Des Moines IA Retreat Manager/Massage Therapist
## 45 Des Moines IA Licensed Massage Therapist
## 46 Des Moines IA Massage Therapist - Part-Time
## 47 Des Moines IA Licensed Massage Therapist
## 48 Des Moines IA Massage Therapist
## 49 Des Moines IA Dual Licensed Therapist - Massage and Skincare
## 50 Des Moines IA Massage Therapist
## 51 Des Moines IA Licensed Massage Therapist (LMT)
## 52 Des Moines IA Massage Therapist - Independent Contractor
## 53 Des Moines IA LifeSpa-Massage Therapist
## 54 Des Moines IA Licensed Massage Therapist
## 55 Des Moines IA Licensed Massage Therapist
## 56 Des Moines IA Retreat Manager/Massage Therapist
## 57 Des Moines IA Licensed Massage Therapist
## 58 Des Moines IA Retreat Manager/Massage Therapist
## 59 Des Moines IA Massage Therapist - Part-Time
## 60 Des Moines IA Licensed Massage Therapist
## 61 Des Moines IA Massage Therapist
## 62 Des Moines IA Dual Licensed Therapist - Massage and Skincare
## HiringAgency
## 1 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 2 Revive ChiropracticGrimes, IA 50111
## 3 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 4 Life Time3.6Urbandale, IA 50323
## 5 Elite Health + PerformanceBondurant, IA 50035
## 6 Spavia Day Spa3.3Ankeny, IA 50023
## 7 Massage Heights3.1West Des Moines, IA 50265
## 8 Massage Heights3.1Johnston, IA 50131+2 locations
## 9 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 10 Life Time3.6Urbandale, IA 50323
## 11 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 12 Massage Envy3.2Clive, IA 50325
## 13 Massage Heights3.1Clive, IA 50325
## 14 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 15 Revive ChiropracticGrimes, IA 50111
## 16 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 17 Life Time3.6Urbandale, IA 50323
## 18 Elite Health + PerformanceBondurant, IA 50035
## 19 Spavia Day Spa3.3Ankeny, IA 50023
## 20 Massage Heights3.1West Des Moines, IA 50265
## 21 Massage Heights3.1Johnston, IA 50131+2 locations
## 22 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 23 Life Time3.6Urbandale, IA 50323
## 24 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 25 Massage Envy3.2Clive, IA 50325
## 26 Massage Heights3.1Clive, IA 50325
## 27 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 28 Revive ChiropracticGrimes, IA 50111
## 29 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 30 Life Time3.6Urbandale, IA 50323
## 31 Elite Health + PerformanceBondurant, IA 50035
## 32 Spavia Day Spa3.3Ankeny, IA 50023
## 33 Massage Heights3.1West Des Moines, IA 50265
## 34 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 35 Massage Heights3.1Johnston, IA 50131+2 locations
## 36 Life Time3.6Urbandale, IA 50323
## 37 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 38 Massage Envy3.2Clive, IA 50325
## 39 Massage Heights3.1Clive, IA 50325
## 40 Life Time3.6Urbandale, IA 50323
## 41 Elite Health + PerformanceBondurant, IA 50035
## 42 Spavia Day Spa3.3Ankeny, IA 50023
## 43 Massage Heights3.1West Des Moines, IA 50265
## 44 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 45 Massage Heights3.1Johnston, IA 50131+2 locations
## 46 Life Time3.6Urbandale, IA 50323
## 47 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 48 Massage Envy3.2Clive, IA 50325
## 49 Massage Heights3.1Clive, IA 50325
## 50 KC CORE - Hospital LocationDes Moines, IA 50314 (New Vision area)
## 51 Revive ChiropracticGrimes, IA 50111
## 52 Indo-Pak Massage TherapyAnkeny, IA+1 location•Remote work available
## 53 Life Time3.6Urbandale, IA 50323
## 54 Elite Health + PerformanceBondurant, IA 50035
## 55 Spavia Day Spa3.3Ankeny, IA 50023
## 56 Massage Heights3.1West Des Moines, IA 50265
## 57 Massage Heights3.1Johnston, IA 50131+2 locations
## 58 Massage Heights - Des Moines3.1West Des Moines, IA 50265
## 59 Life Time3.6Urbandale, IA 50323
## 60 Massage Heights - Des Moines3.1Johnston, IA 50131+1 location
## 61 Massage Envy3.2Clive, IA 50325
## 62 Massage Heights3.1Clive, IA 50325
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 1 20 35 35000 54000
## 2 28 20 35 35000 54000
## 3 17 20 35 35000 54000
## 4 30 20 35 35000 54000
## 5 30 20 35 35000 54000
## 6 30 20 35 35000 54000
## 7 25 20 35 35000 54000
## 8 30 20 35 35000 54000
## 9 25 20 35 35000 54000
## 10 30 20 35 35000 54000
## 11 30 20 35 35000 54000
## 12 30 20 35 35000 54000
## 13 30 20 35 35000 54000
## 14 1 20 35 35000 54000
## 15 28 20 35 35000 54000
## 16 17 20 35 35000 54000
## 17 30 20 35 35000 54000
## 18 30 20 35 35000 54000
## 19 30 20 35 35000 54000
## 20 25 20 35 35000 54000
## 21 30 20 35 35000 54000
## 22 25 20 35 35000 54000
## 23 30 20 35 35000 54000
## 24 30 20 35 35000 54000
## 25 30 20 35 35000 54000
## 26 30 20 35 35000 54000
## 27 1 20 35 35000 54000
## 28 28 20 35 35000 54000
## 29 17 20 35 35000 54000
## 30 30 20 35 35000 54000
## 31 30 20 35 35000 54000
## 32 30 20 35 35000 54000
## 33 25 20 35 35000 54000
## 34 25 20 35 35000 54000
## 35 30 20 35 35000 54000
## 36 30 20 35 35000 54000
## 37 30 20 35 35000 54000
## 38 30 20 35 35000 54000
## 39 30 20 35 35000 54000
## 40 30 20 35 35000 54000
## 41 30 20 35 35000 54000
## 42 30 20 35 35000 54000
## 43 25 20 35 35000 54000
## 44 25 20 35 35000 54000
## 45 30 20 35 35000 54000
## 46 30 20 35 35000 54000
## 47 30 20 35 35000 54000
## 48 30 20 35 35000 54000
## 49 30 20 35 35000 54000
## 50 1 20 35 35000 54000
## 51 28 20 35 35000 54000
## 52 17 20 35 35000 54000
## 53 30 20 35 35000 54000
## 54 30 20 35 35000 54000
## 55 30 20 35 35000 54000
## 56 25 20 35 35000 54000
## 57 30 20 35 35000 54000
## 58 25 20 35 35000 54000
## 59 30 20 35 35000 54000
## 60 30 20 35 35000 54000
## 61 30 20 35 35000 54000
## 62 30 20 35 35000 54000
getIndeedJobData5pages("massage therapist","Cedar Rapids","IA")
## Warning in getIndeedJobData5pages("massage therapist", "Cedar Rapids", "IA"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Cedar Rapids", "IA"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Cedar Rapids", "IA"):
## NAs introduced by coercion
## [[1]]
## jobTitle
## 1 MASSAGE THERAPIST
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Dual Licensed Therapist - Massage & Skincare
## 7 MASSAGE THERAPIST
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Dual Licensed Therapist - Massage & Skincare
## 13 MASSAGE THERAPIST
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Dual Licensed Therapist - Massage & Skincare
## 18 Licensed Massage Therapist
## 19 MASSAGE THERAPIST
## 20 Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Dual Licensed Therapist - Massage & Skincare
## 25 MASSAGE THERAPIST
## 26 Massage Therapist
## 27 Massage Therapist
## 28 Licensed Massage Therapist
## 29 Dual Licensed Therapist - Massage & Skincare
## 30 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$27 - $31 an hour $27 - $31 27 31
## 2 \nUp to $53,000 a year ++ $53000 53000 NA
## 3 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 4 \n$27 an hour ++ $27 27 NA
## 5 \n$27 - $31 an hour $27 - $31 27 31
## 6 \nUp to $53,000 a year ++ $53000 53000 NA
## 7 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 8 \n$27 an hour ++ $27 27 NA
## 9 \n$27 - $31 an hour $27 - $31 27 31
## 10 \nUp to $53,000 a year ++ $53000 53000 NA
## 11 \n$27 an hour ++ $27 27 NA
## 12 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 13 \n$27 - $31 an hour $27 - $31 27 31
## 14 \nUp to $53,000 a year ++ $53000 53000 NA
## 15 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 16 \n$27 an hour ++ $27 27 NA
## 17 \n$27 - $31 an hour $27 - $31 27 31
## 18 \nUp to $53,000 a year ++ $53000 53000 NA
## 19 \n$27 an hour ++ $27 27 NA
## 20 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5013.5 5015.5 15763.5 21347.5 27
## 2 5013.5 5015.5 15763.5 21347.5 27
## 3 5013.5 5015.5 15763.5 21347.5 27
## 4 5013.5 5015.5 15763.5 21347.5 27
## 5 5013.5 5015.5 15763.5 21347.5 27
## 6 5013.5 5015.5 15763.5 21347.5 27
## 7 5013.5 5015.5 15763.5 21347.5 27
## 8 5013.5 5015.5 15763.5 21347.5 27
## 9 5013.5 5015.5 15763.5 21347.5 27
## 10 5013.5 5015.5 15763.5 21347.5 27
## 11 5013.5 5015.5 15763.5 21347.5 27
## 12 5013.5 5015.5 15763.5 21347.5 27
## 13 5013.5 5015.5 15763.5 21347.5 27
## 14 5013.5 5015.5 15763.5 21347.5 27
## 15 5013.5 5015.5 15763.5 21347.5 27
## 16 5013.5 5015.5 15763.5 21347.5 27
## 17 5013.5 5015.5 15763.5 21347.5 27
## 18 5013.5 5015.5 15763.5 21347.5 27
## 19 5013.5 5015.5 15763.5 21347.5 27
## 20 5013.5 5015.5 15763.5 21347.5 27
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
##
## [[3]]
## date_daysAgo
## 1 26
## 2 30
## 3 4
## 4 27
## 5 30
## 6 30
## 7 26
## 8 30
## 9 4
## 10 27
## 11 30
## 12 30
## 13 26
## 14 30
## 15 27
## 16 30
## 17 30
## 18 4
## 19 26
## 20 30
## 21 4
## 22 27
## 23 30
## 24 30
## 25 26
## 26 30
## 27 27
## 28 30
## 29 30
## 30 4
##
## [[4]]
## HiringAgency
## 1 Massage Envy, Cedar Rapids3.2Marion, IA 52302
## 2 Massage Heights3.1Cedar Rapids, IA 52402
## 3 Peaceful Nature Massage, Inc.Coralville, IA 52241
## 4 Massage Envy3.2Marion, IA 52302
## 5 Massage Heights3.1Coralville, IA 52241
## 6 Massage Heights3.1Coralville, IA 52241
## 7 Massage Envy, Cedar Rapids3.2Marion, IA 52302
## 8 Massage Heights3.1Cedar Rapids, IA 52402
## 9 Peaceful Nature Massage, Inc.Coralville, IA 52241
## 10 Massage Envy3.2Marion, IA 52302
## 11 Massage Heights3.1Coralville, IA 52241
## 12 Massage Heights3.1Coralville, IA 52241
## 13 Massage Envy, Cedar Rapids3.2Marion, IA 52302
## 14 Massage Heights3.1Cedar Rapids, IA 52402
## 15 Massage Envy3.2Marion, IA 52302
## 16 Massage Heights3.1Coralville, IA 52241
## 17 Massage Heights3.1Coralville, IA 52241
## 18 Peaceful Nature Massage, Inc.Coralville, IA 52241
## 19 Massage Envy, Cedar Rapids3.2Marion, IA 52302
## 20 Massage Heights3.1Cedar Rapids, IA 52402
## 21 Peaceful Nature Massage, Inc.Coralville, IA 52241
## 22 Massage Envy3.2Marion, IA 52302
## 23 Massage Heights3.1Coralville, IA 52241
## 24 Massage Heights3.1Coralville, IA 52241
## 25 Massage Envy, Cedar Rapids3.2Marion, IA 52302
## 26 Massage Heights3.1Cedar Rapids, IA 52402
## 27 Massage Envy3.2Marion, IA 52302
## 28 Massage Heights3.1Coralville, IA 52241
## 29 Massage Heights3.1Coralville, IA 52241
## 30 Peaceful Nature Massage, Inc.Coralville, IA 52241
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \nUp to $53,000 a year ++ $53000 53000 NA
## 3 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 6 \nUp to $53,000 a year ++ $53000 53000 NA
## 7 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 10 \nUp to $53,000 a year ++ $53000 53000 NA
## 12 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 14 \nUp to $53,000 a year ++ $53000 53000 NA
## 15 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## 18 \nUp to $53,000 a year ++ $53000 53000 NA
## 20 \n$10,000 - $65,000 a year $10000 - $65000 10000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 31500 65000 31500 65000 10000
## 3 31500 65000 31500 65000 10000
## 6 31500 65000 31500 65000 10000
## 7 31500 65000 31500 65000 10000
## 10 31500 65000 31500 65000 10000
## 12 31500 65000 31500 65000 10000
## 14 31500 65000 31500 65000 10000
## 15 31500 65000 31500 65000 10000
## 18 31500 65000 31500 65000 10000
## 20 31500 65000 31500 65000 10000
## maximumMaxSalary
## 2 65000
## 3 65000
## 6 65000
## 7 65000
## 10 65000
## 12 65000
## 14 65000
## 15 65000
## 18 65000
## 20 65000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$27 - $31 an hour $27 - $31 27 31 27
## 4 \n$27 an hour ++ $27 27 NA 27
## 5 \n$27 - $31 an hour $27 - $31 27 31 27
## 8 \n$27 an hour ++ $27 27 NA 27
## 9 \n$27 - $31 an hour $27 - $31 27 31 27
## 11 \n$27 an hour ++ $27 27 NA 27
## 13 \n$27 - $31 an hour $27 - $31 27 31 27
## 16 \n$27 an hour ++ $27 27 NA 27
## 17 \n$27 - $31 an hour $27 - $31 27 31 27
## 19 \n$27 an hour ++ $27 27 NA 27
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 31 27 31 27 31
## 4 31 27 31 27 31
## 5 31 27 31 27 31
## 8 31 27 31 27 31
## 9 31 27 31 27 31
## 11 31 27 31 27 31
## 13 31 27 31 27 31
## 16 31 27 31 27 31
## 17 31 27 31 27 31
## 19 31 27 31 27 31
##
## [[7]]
## city state jobTitle
## 1 Cedar Rapids IA MASSAGE THERAPIST
## 2 Cedar Rapids IA Massage Therapist
## 3 Cedar Rapids IA Licensed Massage Therapist
## 4 Cedar Rapids IA Massage Therapist
## 5 Cedar Rapids IA Licensed Massage Therapist
## 6 Cedar Rapids IA Dual Licensed Therapist - Massage & Skincare
## 7 Cedar Rapids IA MASSAGE THERAPIST
## 8 Cedar Rapids IA Massage Therapist
## 9 Cedar Rapids IA Licensed Massage Therapist
## 10 Cedar Rapids IA Massage Therapist
## 11 Cedar Rapids IA Licensed Massage Therapist
## 12 Cedar Rapids IA Dual Licensed Therapist - Massage & Skincare
## 13 Cedar Rapids IA MASSAGE THERAPIST
## 14 Cedar Rapids IA Massage Therapist
## 15 Cedar Rapids IA Massage Therapist
## 16 Cedar Rapids IA Licensed Massage Therapist
## 17 Cedar Rapids IA Dual Licensed Therapist - Massage & Skincare
## 18 Cedar Rapids IA Licensed Massage Therapist
## 19 Cedar Rapids IA MASSAGE THERAPIST
## 20 Cedar Rapids IA Massage Therapist
## 21 Cedar Rapids IA Licensed Massage Therapist
## 22 Cedar Rapids IA Massage Therapist
## 23 Cedar Rapids IA Licensed Massage Therapist
## 24 Cedar Rapids IA Dual Licensed Therapist - Massage & Skincare
## 25 Cedar Rapids IA MASSAGE THERAPIST
## 26 Cedar Rapids IA Massage Therapist
## 27 Cedar Rapids IA Massage Therapist
## 28 Cedar Rapids IA Licensed Massage Therapist
## 29 Cedar Rapids IA Dual Licensed Therapist - Massage & Skincare
## 30 Cedar Rapids IA Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Massage Envy, Cedar Rapids3.2Marion, IA 52302 26
## 2 Massage Heights3.1Cedar Rapids, IA 52402 30
## 3 Peaceful Nature Massage, Inc.Coralville, IA 52241 4
## 4 Massage Envy3.2Marion, IA 52302 27
## 5 Massage Heights3.1Coralville, IA 52241 30
## 6 Massage Heights3.1Coralville, IA 52241 30
## 7 Massage Envy, Cedar Rapids3.2Marion, IA 52302 26
## 8 Massage Heights3.1Cedar Rapids, IA 52402 30
## 9 Peaceful Nature Massage, Inc.Coralville, IA 52241 4
## 10 Massage Envy3.2Marion, IA 52302 27
## 11 Massage Heights3.1Coralville, IA 52241 30
## 12 Massage Heights3.1Coralville, IA 52241 30
## 13 Massage Envy, Cedar Rapids3.2Marion, IA 52302 26
## 14 Massage Heights3.1Cedar Rapids, IA 52402 30
## 15 Massage Envy3.2Marion, IA 52302 27
## 16 Massage Heights3.1Coralville, IA 52241 30
## 17 Massage Heights3.1Coralville, IA 52241 30
## 18 Peaceful Nature Massage, Inc.Coralville, IA 52241 4
## 19 Massage Envy, Cedar Rapids3.2Marion, IA 52302 26
## 20 Massage Heights3.1Cedar Rapids, IA 52402 30
## 21 Peaceful Nature Massage, Inc.Coralville, IA 52241 4
## 22 Massage Envy3.2Marion, IA 52302 27
## 23 Massage Heights3.1Coralville, IA 52241 30
## 24 Massage Heights3.1Coralville, IA 52241 30
## 25 Massage Envy, Cedar Rapids3.2Marion, IA 52302 26
## 26 Massage Heights3.1Cedar Rapids, IA 52402 30
## 27 Massage Envy3.2Marion, IA 52302 27
## 28 Massage Heights3.1Coralville, IA 52241 30
## 29 Massage Heights3.1Coralville, IA 52241 30
## 30 Peaceful Nature Massage, Inc.Coralville, IA 52241 4
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 27 31 10000 65000
## 2 27 31 10000 65000
## 3 27 31 10000 65000
## 4 27 31 10000 65000
## 5 27 31 10000 65000
## 6 27 31 10000 65000
## 7 27 31 10000 65000
## 8 27 31 10000 65000
## 9 27 31 10000 65000
## 10 27 31 10000 65000
## 11 27 31 10000 65000
## 12 27 31 10000 65000
## 13 27 31 10000 65000
## 14 27 31 10000 65000
## 15 27 31 10000 65000
## 16 27 31 10000 65000
## 17 27 31 10000 65000
## 18 27 31 10000 65000
## 19 27 31 10000 65000
## 20 27 31 10000 65000
## 21 27 31 10000 65000
## 22 27 31 10000 65000
## 23 27 31 10000 65000
## 24 27 31 10000 65000
## 25 27 31 10000 65000
## 26 27 31 10000 65000
## 27 27 31 10000 65000
## 28 27 31 10000 65000
## 29 27 31 10000 65000
## 30 27 31 10000 65000
getIndeedJobData5pages("massage therapist","Davenport","IA")
## Warning in getIndeedJobData5pages("massage therapist", "Davenport", "IA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Davenport", "IA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 6 Massage Therapist - Join Our Team of Caring Professionals
## 7 Licensed Massage Therapist (LMT)
## 8 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist
## 12 Massage Therapist - Join Our Team of Caring Professionals
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist (LMT)
## 18 Licensed Massage Therapist
## 19 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 20 Massage Therapist - Join Our Team of Caring Professionals
## 21 Licensed Massage Therapist (LMT)
## 22 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist (LMT)
## 25 Licensed Massage Therapist
## 26 Massage Therapist - Join Our Team of Caring Professionals
## 27 Licensed Massage Therapist (LMT)
## 28 Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Licensed Massage Therapist
## 33 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 34 Massage Therapist - Join Our Team of Caring Professionals
## 35 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$26 - $31 an hour $26 - $31 26 31 24
## 2 \n$15 an hour $15 15 NA 24
## 3 \n$24 - $38 an hour $24 - $38 24 38 24
## 4 \n$30 an hour $30 30 NA 24
## 5 \n$20 - $25 an hour $20 - $25 20 25 24
## 6 \n$15 an hour $15 15 NA 24
## 7 \n$24 - $38 an hour $24 - $38 24 38 24
## 8 \n$30 an hour $30 30 NA 24
## 9 \n$20 - $25 an hour $20 - $25 20 25 24
## 10 \n$26 - $31 an hour $26 - $31 26 31 24
## 11 \n$26 - $31 an hour $26 - $31 26 31 24
## 12 \n$15 an hour $15 15 NA 24
## 13 \n$24 - $38 an hour $24 - $38 24 38 24
## 14 \n$30 an hour $30 30 NA 24
## 15 \n$20 - $25 an hour $20 - $25 20 25 24
## 16 \n$15 an hour $15 15 NA 24
## 17 \n$24 - $38 an hour $24 - $38 24 38 24
## 18 \n$30 an hour $30 30 NA 24
## 19 \n$20 - $25 an hour $20 - $25 20 25 24
## 20 \n$26 - $31 an hour $26 - $31 26 31 24
## 21 \n$26 - $31 an hour $26 - $31 26 31 24
## 22 \n$15 an hour $15 15 NA 24
## 23 \n$24 - $38 an hour $24 - $38 24 38 24
## 24 \n$30 an hour $30 30 NA 24
## 25 \n$20 - $25 an hour $20 - $25 20 25 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 25.5 23 26.125 15 38
## 2 25.5 23 26.125 15 38
## 3 25.5 23 26.125 15 38
## 4 25.5 23 26.125 15 38
## 5 25.5 23 26.125 15 38
## 6 25.5 23 26.125 15 38
## 7 25.5 23 26.125 15 38
## 8 25.5 23 26.125 15 38
## 9 25.5 23 26.125 15 38
## 10 25.5 23 26.125 15 38
## 11 25.5 23 26.125 15 38
## 12 25.5 23 26.125 15 38
## 13 25.5 23 26.125 15 38
## 14 25.5 23 26.125 15 38
## 15 25.5 23 26.125 15 38
## 16 25.5 23 26.125 15 38
## 17 25.5 23 26.125 15 38
## 18 25.5 23 26.125 15 38
## 19 25.5 23 26.125 15 38
## 20 25.5 23 26.125 15 38
## 21 25.5 23 26.125 15 38
## 22 25.5 23 26.125 15 38
## 23 25.5 23 26.125 15 38
## 24 25.5 23 26.125 15 38
## 25 25.5 23 26.125 15 38
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 7
## 4 30
## 5 30
## 6 30
## 7 12
## 8 30
## 9 30
## 10 7
## 11 30
## 12 30
## 13 12
## 14 30
## 15 30
## 16 30
## 17 7
## 18 30
## 19 30
## 20 30
## 21 12
## 22 30
## 23 30
## 24 7
## 25 30
## 26 30
## 27 12
## 28 30
## 29 30
## 30 30
## 31 7
## 32 30
## 33 30
## 34 30
## 35 12
##
## [[4]]
## HiringAgency
## 1 William Wesley Grand Salon and SpaDavenport, IA 52807
## 2 The Outing Club4.6Davenport, IA 52803
## 3 AMC HealthRock Island, IL 61201
## 4 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 5 Frontline Spine & SportEast Moline, IL 61244
## 6 Massage Envy3.2Davenport, IA 52807
## 7 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 8 Frontline Spine & SportEast Moline, IL 61244
## 9 The Outing Club4.6Davenport, IA 52803
## 10 AMC HealthRock Island, IL 61201
## 11 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 12 Massage Envy3.2Davenport, IA 52807
## 13 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 14 William Wesley Grand Salon and SpaDavenport, IA 52807
## 15 William Wesley Grand Salon and SpaDavenport, IA 52807
## 16 The Outing Club4.6Davenport, IA 52803
## 17 AMC HealthRock Island, IL 61201
## 18 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 19 Frontline Spine & SportEast Moline, IL 61244
## 20 Massage Envy3.2Davenport, IA 52807
## 21 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 22 Frontline Spine & SportEast Moline, IL 61244
## 23 The Outing Club4.6Davenport, IA 52803
## 24 AMC HealthRock Island, IL 61201
## 25 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 26 Massage Envy3.2Davenport, IA 52807
## 27 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 28 William Wesley Grand Salon and SpaDavenport, IA 52807
## 29 William Wesley Grand Salon and SpaDavenport, IA 52807
## 30 The Outing Club4.6Davenport, IA 52803
## 31 AMC HealthRock Island, IL 61201
## 32 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 33 Frontline Spine & SportEast Moline, IL 61244
## 34 Massage Envy3.2Davenport, IA 52807
## 35 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$26 - $31 an hour $26 - $31 26 31 24
## 2 \n$15 an hour $15 15 NA 24
## 3 \n$24 - $38 an hour $24 - $38 24 38 24
## 4 \n$30 an hour $30 30 NA 24
## 5 \n$20 - $25 an hour $20 - $25 20 25 24
## 6 \n$15 an hour $15 15 NA 24
## 7 \n$24 - $38 an hour $24 - $38 24 38 24
## 8 \n$30 an hour $30 30 NA 24
## 9 \n$20 - $25 an hour $20 - $25 20 25 24
## 10 \n$26 - $31 an hour $26 - $31 26 31 24
## 11 \n$26 - $31 an hour $26 - $31 26 31 24
## 12 \n$15 an hour $15 15 NA 24
## 13 \n$24 - $38 an hour $24 - $38 24 38 24
## 14 \n$30 an hour $30 30 NA 24
## 15 \n$20 - $25 an hour $20 - $25 20 25 24
## 16 \n$15 an hour $15 15 NA 24
## 17 \n$24 - $38 an hour $24 - $38 24 38 24
## 18 \n$30 an hour $30 30 NA 24
## 19 \n$20 - $25 an hour $20 - $25 20 25 24
## 20 \n$26 - $31 an hour $26 - $31 26 31 24
## 21 \n$26 - $31 an hour $26 - $31 26 31 24
## 22 \n$15 an hour $15 15 NA 24
## 23 \n$24 - $38 an hour $24 - $38 24 38 24
## 24 \n$30 an hour $30 30 NA 24
## 25 \n$20 - $25 an hour $20 - $25 20 25 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 31 23 31.33333 15 38
## 2 31 23 31.33333 15 38
## 3 31 23 31.33333 15 38
## 4 31 23 31.33333 15 38
## 5 31 23 31.33333 15 38
## 6 31 23 31.33333 15 38
## 7 31 23 31.33333 15 38
## 8 31 23 31.33333 15 38
## 9 31 23 31.33333 15 38
## 10 31 23 31.33333 15 38
## 11 31 23 31.33333 15 38
## 12 31 23 31.33333 15 38
## 13 31 23 31.33333 15 38
## 14 31 23 31.33333 15 38
## 15 31 23 31.33333 15 38
## 16 31 23 31.33333 15 38
## 17 31 23 31.33333 15 38
## 18 31 23 31.33333 15 38
## 19 31 23 31.33333 15 38
## 20 31 23 31.33333 15 38
## 21 31 23 31.33333 15 38
## 22 31 23 31.33333 15 38
## 23 31 23 31.33333 15 38
## 24 31 23 31.33333 15 38
## 25 31 23 31.33333 15 38
##
## [[7]]
## city state
## 1 Davenport IA
## 2 Davenport IA
## 3 Davenport IA
## 4 Davenport IA
## 5 Davenport IA
## 6 Davenport IA
## 7 Davenport IA
## 8 Davenport IA
## 9 Davenport IA
## 10 Davenport IA
## 11 Davenport IA
## 12 Davenport IA
## 13 Davenport IA
## 14 Davenport IA
## 15 Davenport IA
## 16 Davenport IA
## 17 Davenport IA
## 18 Davenport IA
## 19 Davenport IA
## 20 Davenport IA
## 21 Davenport IA
## 22 Davenport IA
## 23 Davenport IA
## 24 Davenport IA
## 25 Davenport IA
## 26 Davenport IA
## 27 Davenport IA
## 28 Davenport IA
## 29 Davenport IA
## 30 Davenport IA
## 31 Davenport IA
## 32 Davenport IA
## 33 Davenport IA
## 34 Davenport IA
## 35 Davenport IA
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 6 Massage Therapist - Join Our Team of Caring Professionals
## 7 Licensed Massage Therapist (LMT)
## 8 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist
## 12 Massage Therapist - Join Our Team of Caring Professionals
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist (LMT)
## 18 Licensed Massage Therapist
## 19 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 20 Massage Therapist - Join Our Team of Caring Professionals
## 21 Licensed Massage Therapist (LMT)
## 22 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist (LMT)
## 25 Licensed Massage Therapist
## 26 Massage Therapist - Join Our Team of Caring Professionals
## 27 Licensed Massage Therapist (LMT)
## 28 Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Licensed Massage Therapist
## 33 Office/Room for Rent: Massage Therapist, Nutritionist, Healt...
## 34 Massage Therapist - Join Our Team of Caring Professionals
## 35 Licensed Massage Therapist (LMT)
## HiringAgency
## 1 William Wesley Grand Salon and SpaDavenport, IA 52807
## 2 The Outing Club4.6Davenport, IA 52803
## 3 AMC HealthRock Island, IL 61201
## 4 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 5 Frontline Spine & SportEast Moline, IL 61244
## 6 Massage Envy3.2Davenport, IA 52807
## 7 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 8 Frontline Spine & SportEast Moline, IL 61244
## 9 The Outing Club4.6Davenport, IA 52803
## 10 AMC HealthRock Island, IL 61201
## 11 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 12 Massage Envy3.2Davenport, IA 52807
## 13 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 14 William Wesley Grand Salon and SpaDavenport, IA 52807
## 15 William Wesley Grand Salon and SpaDavenport, IA 52807
## 16 The Outing Club4.6Davenport, IA 52803
## 17 AMC HealthRock Island, IL 61201
## 18 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 19 Frontline Spine & SportEast Moline, IL 61244
## 20 Massage Envy3.2Davenport, IA 52807
## 21 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 22 Frontline Spine & SportEast Moline, IL 61244
## 23 The Outing Club4.6Davenport, IA 52803
## 24 AMC HealthRock Island, IL 61201
## 25 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 26 Massage Envy3.2Davenport, IA 52807
## 27 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## 28 William Wesley Grand Salon and SpaDavenport, IA 52807
## 29 William Wesley Grand Salon and SpaDavenport, IA 52807
## 30 The Outing Club4.6Davenport, IA 52803
## 31 AMC HealthRock Island, IL 61201
## 32 Discover Chiropractic3.9Moline, IL 61265 (Greater Prospect area)
## 33 Frontline Spine & SportEast Moline, IL 61244
## 34 Massage Envy3.2Davenport, IA 52807
## 35 Serenity Salon and Day Spa5.0Moline, IL 61265 (Greater Prospect area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 15 38 NA NA
## 2 30 15 38 NA NA
## 3 7 15 38 NA NA
## 4 30 15 38 NA NA
## 5 30 15 38 NA NA
## 6 30 15 38 NA NA
## 7 12 15 38 NA NA
## 8 30 15 38 NA NA
## 9 30 15 38 NA NA
## 10 7 15 38 NA NA
## 11 30 15 38 NA NA
## 12 30 15 38 NA NA
## 13 12 15 38 NA NA
## 14 30 15 38 NA NA
## 15 30 15 38 NA NA
## 16 30 15 38 NA NA
## 17 7 15 38 NA NA
## 18 30 15 38 NA NA
## 19 30 15 38 NA NA
## 20 30 15 38 NA NA
## 21 12 15 38 NA NA
## 22 30 15 38 NA NA
## 23 30 15 38 NA NA
## 24 7 15 38 NA NA
## 25 30 15 38 NA NA
## 26 30 15 38 NA NA
## 27 12 15 38 NA NA
## 28 30 15 38 NA NA
## 29 30 15 38 NA NA
## 30 30 15 38 NA NA
## 31 7 15 38 NA NA
## 32 30 15 38 NA NA
## 33 30 15 38 NA NA
## 34 30 15 38 NA NA
## 35 12 15 38 NA NA
Kansas Wichita, Overland Park, Kansas City
getIndeedJobData5pages("massage therapist","Wichita","KS")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist
## 4 Total Body Stretch Service Provider
## 5 Licensed Massage Therapist
## 6 Massage Therapists (Full OR Part Time)
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Total Body Stretch Service Provider
## 10 Licensed Massage Therapist
## 11 Massage Therapists (Full OR Part Time)
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Total Body Stretch Service Provider
## 15 Licensed Massage Therapist
## 16 Massage Therapists (Full OR Part Time)
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 Total Body Stretch Service Provider
## 20 Licensed Massage Therapist
## 21 Massage Therapists (Full OR Part Time)
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist
## 25 Total Body Stretch Service Provider
## 26 Licensed Massage Therapist
## 27 Massage Therapists (Full OR Part Time)
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 7
## 2 22
## 3 4
## 4 4
## 5 15
## 6 28
## 7 22
## 8 4
## 9 4
## 10 15
## 11 28
## 12 22
## 13 4
## 14 4
## 15 15
## 16 28
## 17 22
## 18 4
## 19 4
## 20 15
## 21 28
## 22 7
## 23 22
## 24 4
## 25 4
## 26 15
## 27 28
##
## [[4]]
## HiringAgency
## 1 Hand and Stone Spa3.0Wichita, KS 67232
## 2 Hand and Stone3.0Wichita, KS 67205
## 3 Massage Envy3.2Wichita, KS 67206
## 4 Massage Envy3.2Wichita, KS 67206
## 5 Hand & Stone - WichitaWichita, KS 67205
## 6 Genesis Health Clubs2.9Wichita, KS 67212
## 7 Hand and Stone3.0Wichita, KS 67205
## 8 Massage Envy3.2Wichita, KS 67206
## 9 Massage Envy3.2Wichita, KS 67206
## 10 Hand & Stone - WichitaWichita, KS 67205
## 11 Genesis Health Clubs2.9Wichita, KS 67212
## 12 Hand and Stone3.0Wichita, KS 67205
## 13 Massage Envy3.2Wichita, KS 67206
## 14 Massage Envy3.2Wichita, KS 67206
## 15 Hand & Stone - WichitaWichita, KS 67205
## 16 Genesis Health Clubs2.9Wichita, KS 67212
## 17 Hand and Stone3.0Wichita, KS 67205
## 18 Massage Envy3.2Wichita, KS 67206
## 19 Massage Envy3.2Wichita, KS 67206
## 20 Hand & Stone - WichitaWichita, KS 67205
## 21 Genesis Health Clubs2.9Wichita, KS 67212
## 22 Hand and Stone Spa3.0Wichita, KS 67232
## 23 Hand and Stone3.0Wichita, KS 67205
## 24 Massage Envy3.2Wichita, KS 67206
## 25 Massage Envy3.2Wichita, KS 67206
## 26 Hand & Stone - WichitaWichita, KS 67205
## 27 Genesis Health Clubs2.9Wichita, KS 67212
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Wichita KS Licensed Massage Therapist
## 2 Wichita KS Licensed Massage Therapist
## 3 Wichita KS Massage Therapist
## 4 Wichita KS Total Body Stretch Service Provider
## 5 Wichita KS Licensed Massage Therapist
## 6 Wichita KS Massage Therapists (Full OR Part Time)
## 7 Wichita KS Licensed Massage Therapist
## 8 Wichita KS Massage Therapist
## 9 Wichita KS Total Body Stretch Service Provider
## 10 Wichita KS Licensed Massage Therapist
## 11 Wichita KS Massage Therapists (Full OR Part Time)
## 12 Wichita KS Licensed Massage Therapist
## 13 Wichita KS Massage Therapist
## 14 Wichita KS Total Body Stretch Service Provider
## 15 Wichita KS Licensed Massage Therapist
## 16 Wichita KS Massage Therapists (Full OR Part Time)
## 17 Wichita KS Licensed Massage Therapist
## 18 Wichita KS Massage Therapist
## 19 Wichita KS Total Body Stretch Service Provider
## 20 Wichita KS Licensed Massage Therapist
## 21 Wichita KS Massage Therapists (Full OR Part Time)
## 22 Wichita KS Licensed Massage Therapist
## 23 Wichita KS Licensed Massage Therapist
## 24 Wichita KS Massage Therapist
## 25 Wichita KS Total Body Stretch Service Provider
## 26 Wichita KS Licensed Massage Therapist
## 27 Wichita KS Massage Therapists (Full OR Part Time)
## HiringAgency date_daysAgo MinHourlySalary
## 1 Hand and Stone Spa3.0Wichita, KS 67232 7 NA
## 2 Hand and Stone3.0Wichita, KS 67205 22 NA
## 3 Massage Envy3.2Wichita, KS 67206 4 NA
## 4 Massage Envy3.2Wichita, KS 67206 4 NA
## 5 Hand & Stone - WichitaWichita, KS 67205 15 NA
## 6 Genesis Health Clubs2.9Wichita, KS 67212 28 NA
## 7 Hand and Stone3.0Wichita, KS 67205 22 NA
## 8 Massage Envy3.2Wichita, KS 67206 4 NA
## 9 Massage Envy3.2Wichita, KS 67206 4 NA
## 10 Hand & Stone - WichitaWichita, KS 67205 15 NA
## 11 Genesis Health Clubs2.9Wichita, KS 67212 28 NA
## 12 Hand and Stone3.0Wichita, KS 67205 22 NA
## 13 Massage Envy3.2Wichita, KS 67206 4 NA
## 14 Massage Envy3.2Wichita, KS 67206 4 NA
## 15 Hand & Stone - WichitaWichita, KS 67205 15 NA
## 16 Genesis Health Clubs2.9Wichita, KS 67212 28 NA
## 17 Hand and Stone3.0Wichita, KS 67205 22 NA
## 18 Massage Envy3.2Wichita, KS 67206 4 NA
## 19 Massage Envy3.2Wichita, KS 67206 4 NA
## 20 Hand & Stone - WichitaWichita, KS 67205 15 NA
## 21 Genesis Health Clubs2.9Wichita, KS 67212 28 NA
## 22 Hand and Stone Spa3.0Wichita, KS 67232 7 NA
## 23 Hand and Stone3.0Wichita, KS 67205 22 NA
## 24 Massage Envy3.2Wichita, KS 67206 4 NA
## 25 Massage Envy3.2Wichita, KS 67206 4 NA
## 26 Hand & Stone - WichitaWichita, KS 67205 15 NA
## 27 Genesis Health Clubs2.9Wichita, KS 67212 28 NA
## MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA
## 2 NA NA NA
## 3 NA NA NA
## 4 NA NA NA
## 5 NA NA NA
## 6 NA NA NA
## 7 NA NA NA
## 8 NA NA NA
## 9 NA NA NA
## 10 NA NA NA
## 11 NA NA NA
## 12 NA NA NA
## 13 NA NA NA
## 14 NA NA NA
## 15 NA NA NA
## 16 NA NA NA
## 17 NA NA NA
## 18 NA NA NA
## 19 NA NA NA
## 20 NA NA NA
## 21 NA NA NA
## 22 NA NA NA
## 23 NA NA NA
## 24 NA NA NA
## 25 NA NA NA
## 26 NA NA NA
## 27 NA NA NA
getIndeedJobData5pages("massage therapist","Overland Park","KS")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist with Hiring Bonus
## 3 Massage Therapist
## 4 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 5 Massage Therapist
## 6 LEAD Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Professional Massage Therapist
## 11 Total Body Stretch Service Provider
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 LifeSpa-Massage Therapist
## 15 Licensed Massage Therapist - Passionate Healer
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapy Career Training Tuition Reimbursement Opport...
## 19 Massage Therapy Career Training Tuition Reimbursement Progra...
## 20 Licensed Massage Therapist
## 21 Dual Licensed Therapist - Massage and Skincare
## 22 Massage Therapist Guaranteed Pay and Hiring Bonus
## 23 Dual Licensed Therapist - Massage and Skincare
## 24 Full Time Massage Therapist (No MBLEx required)
## 25 Massage Therapist ($1,500 Sign on Bonus)
## 26 Massage Therapist - Independent Contractor
## 27 Hair, Skin, Nails and Massage Professional
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapy Career Training Tuition Reimbursement Opport...
## 34 Massage Therapy Career Training Tuition Reimbursement Progra...
## 35 Licensed Massage Therapist
## 36 Dual Licensed Therapist - Massage and Skincare
## 37 Massage Therapist Guaranteed Pay and Hiring Bonus
## 38 Dual Licensed Therapist - Massage and Skincare
## 39 Full Time Massage Therapist (No MBLEx required)
## 40 Massage Therapist ($1,500 Sign on Bonus)
## 41 Massage Therapist - Independent Contractor
## 42 Hair, Skin, Nails and Massage Professional
## 43 Licensed Massage Therapist
## 44 Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapy Career Training Tuition Reimbursement Opport...
## 49 Massage Therapy Career Training Tuition Reimbursement Progra...
## 50 Licensed Massage Therapist
## 51 Dual Licensed Therapist - Massage and Skincare
## 52 Massage Therapist Guaranteed Pay and Hiring Bonus
## 53 Dual Licensed Therapist - Massage and Skincare
## 54 Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Massage Therapy Career Training Tuition Reimbursement Opport...
## 58 Massage Therapy Career Training Tuition Reimbursement Progra...
## 59 Licensed Massage Therapist
## 60 Dual Licensed Therapist - Massage and Skincare
## 61 Massage Therapist Guaranteed Pay and Hiring Bonus
## 62 Dual Licensed Therapist - Massage and Skincare
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist ($1,500 Sign on Bonus)
## 65 Massage Therapist Guaranteed Pay and Hiring Bonus
## 66 Massage Therapist - Signing Bonus
## 67 Massage Therapist
## 68 Licensed Massage Therapist with Hiring Bonus
## 69 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 70 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $35 an hour $20 - $35 20 35
## 2 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 3 \n$35 - $50 an hour $35 - $50 35 50
## 4 \n$30 - $45 an hour $30 - $45 30 45
## 5 \n$37,491 - $54,776 a year $37491 - $54776 37491 54776
## 6 \n$45,000 - $52,000 a year $45000 - $52000 45000 52000
## 7 \n$26 - $40 an hour $26 - $40 26 40
## 8 \n$26 - $40 an hour $26 - $40 26 40
## 9 \n$30 - $45 an hour $30 - $45 30 45
## 10 \n$25 - $30 an hour $25 - $30 25 30
## 11 \n$15 - $20 an hour $15 - $20 15 20
## 12 \n$30 - $50 an hour $30 - $50 30 50
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$25 - $30 an hour $25 - $30 25 30
## 15 \n$15 - $20 an hour $15 - $20 15 20
## 16 \n$30 - $50 an hour $30 - $50 30 50
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$25 - $30 an hour $25 - $30 25 30
## 19 \n$15 - $20 an hour $15 - $20 15 20
## 20 \n$25 - $30 an hour $25 - $30 25 30
## 21 \n$15 - $20 an hour $15 - $20 15 20
## 22 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 23 \n$30 - $50 an hour $30 - $50 30 50
## 24 \n$30 - $45 an hour $30 - $45 30 45
## 25 \n$35 - $50 an hour $35 - $50 35 50
## 26 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 27 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 28 \n$20 - $35 an hour $20 - $35 20 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 35 9714.036 11134 15
## 2 30 35 9714.036 11134 15
## 3 30 35 9714.036 11134 15
## 4 30 35 9714.036 11134 15
## 5 30 35 9714.036 11134 15
## 6 30 35 9714.036 11134 15
## 7 30 35 9714.036 11134 15
## 8 30 35 9714.036 11134 15
## 9 30 35 9714.036 11134 15
## 10 30 35 9714.036 11134 15
## 11 30 35 9714.036 11134 15
## 12 30 35 9714.036 11134 15
## 13 30 35 9714.036 11134 15
## 14 30 35 9714.036 11134 15
## 15 30 35 9714.036 11134 15
## 16 30 35 9714.036 11134 15
## 17 30 35 9714.036 11134 15
## 18 30 35 9714.036 11134 15
## 19 30 35 9714.036 11134 15
## 20 30 35 9714.036 11134 15
## 21 30 35 9714.036 11134 15
## 22 30 35 9714.036 11134 15
## 23 30 35 9714.036 11134 15
## 24 30 35 9714.036 11134 15
## 25 30 35 9714.036 11134 15
## 26 30 35 9714.036 11134 15
## 27 30 35 9714.036 11134 15
## 28 30 35 9714.036 11134 15
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
##
## [[3]]
## date_daysAgo
## 1 2
## 2 14
## 3 30
## 4 1
## 5 10
## 6 Today
## 7 30
## 8 3
## 9 30
## 10 30
## 11 4
## 12 6
## 13 18
## 14 30
## 15 2
## 16 30
## 17 8
## 18 30
## 19 30
## 20 30
## 21 Today
## 22 30
## 23 30
## 24 21
## 25 11
## 26 17
## 27 30
## 28 30
## 29 30
## 30 30
## 31 30
## 32 8
## 33 30
## 34 30
## 35 30
## 36 Today
## 37 30
## 38 30
## 39 21
## 40 11
## 41 17
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 8
## 48 30
## 49 30
## 50 30
## 51 Today
## 52 30
## 53 30
## 54 30
## 55 30
## 56 8
## 57 30
## 58 30
## 59 30
## 60 Today
## 61 30
## 62 30
## 63 30
## 64 11
## 65 4
## 66 30
## 67 30
## 68 14
## 69 22
## 70 2
##
## [[4]]
## HiringAgency
## 1 The Spring in Winter LLCOverland Park, KS 66212
## 2 Massage Heights Overland Park3.1Overland Park, KS 66210
## 3 Zen Massage3.5Overland Park, KS 66209
## 4 Ramsey InsightLeawood, KS
## 5 Salonspa ConnectionOverland Park, KS
## 6 Massage Heights - College Metcalf Plaza3.1Overland Park, KS 66210
## 7 PS Lifestyle3.0Overland Park, KS
## 8 Massage Heights - Lenexa City3.1Lenexa, KS 66219+2 locations
## 9 Natural Way ChiropracticOverland Park, KS 66212
## 10 Ultimate Escape Day Spa4.0Overland Park, KS 66221
## 11 Massage Envy3.2Olathe, KS 66062
## 12 Alliance Physical Therapy Partners4.6Shawnee, KS 66226
## 13 Chateau AvalonKansas City, KS 66111
## 14 Life Time3.6Overland Park, KS 66223
## 15 Ramsey InsightKansas City, MO
## 16 Hampton ChiropracticBelton, MO 64012
## 17 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 18 Massage Envy3.2Kansas City, MO 64151
## 19 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 20 Dr. Mary HasleyLee's Summit, MO 64086
## 21 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 22 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 23 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 24 Massage Envy3.2Lenexa, KS 66215
## 25 Massage Heights3.1Kansas City, MO 64157
## 26 Indo-Pak Massage TherapyKansas City, MO•Remote work available
## 27 Par Exsalonce3.6Overland Park, KS 66214
## 28 Massage Heights3.1Overland Park, KS 66210+2 locations
## 29 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 30 Raintree Medical and Chiropractic CenterLees Summit, MO
## 31 Hampton ChiropracticBelton, MO 64012
## 32 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 33 Massage Envy3.2Kansas City, MO 64151
## 34 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 35 Dr. Mary HasleyLee's Summit, MO 64086
## 36 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 37 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 38 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 39 Massage Envy3.2Lenexa, KS 66215
## 40 Massage Heights3.1Kansas City, MO 64157
## 41 Indo-Pak Massage TherapyKansas City, MO•Remote work available
## 42 Par Exsalonce3.6Overland Park, KS 66214
## 43 Massage Heights3.1Overland Park, KS 66210+2 locations
## 44 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 45 Raintree Medical and Chiropractic CenterLees Summit, MO
## 46 Hampton ChiropracticBelton, MO 64012
## 47 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 48 Massage Envy3.2Kansas City, MO 64151
## 49 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 50 Dr. Mary HasleyLee's Summit, MO 64086
## 51 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 52 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 53 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 54 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 55 Hampton ChiropracticBelton, MO 64012
## 56 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 57 Massage Envy3.2Kansas City, MO 64151
## 58 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 59 Dr. Mary HasleyLee's Summit, MO 64086
## 60 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 61 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 62 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 63 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 64 Massage Heights3.1Kansas City, MO 64157
## 65 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 66 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 67 Zen Massage3.5Overland Park, KS 66209
## 68 Massage Heights Overland Park3.1Overland Park, KS 66210
## 69 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 70 The Spring in Winter LLCOverland Park, KS 66212
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 5 \n$37,491 - $54,776 a year $37491 - $54776 37491 54776
## 6 \n$45,000 - $52,000 a year $45000 - $52000 45000 52000
## 22 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 26 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 27 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 43500 53388 43581.83 54462.67 37491
## 5 43500 53388 43581.83 54462.67 37491
## 6 43500 53388 43581.83 54462.67 37491
## 22 43500 53388 43581.83 54462.67 37491
## 26 43500 53388 43581.83 54462.67 37491
## 27 43500 53388 43581.83 54462.67 37491
## maximumMaxSalary
## 2 60000
## 5 60000
## 6 60000
## 22 60000
## 26 60000
## 27 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 - $35 an hour $20 - $35 20 35 25.5
## 3 \n$35 - $50 an hour $35 - $50 35 50 25.5
## 4 \n$30 - $45 an hour $30 - $45 30 45 25.5
## 7 \n$26 - $40 an hour $26 - $40 26 40 25.5
## 8 \n$26 - $40 an hour $26 - $40 26 40 25.5
## 9 \n$30 - $45 an hour $30 - $45 30 45 25.5
## 10 \n$25 - $30 an hour $25 - $30 25 30 25.5
## 11 \n$15 - $20 an hour $15 - $20 15 20 25.5
## 12 \n$30 - $50 an hour $30 - $50 30 50 25.5
## 14 \n$25 - $30 an hour $25 - $30 25 30 25.5
## 15 \n$15 - $20 an hour $15 - $20 15 20 25.5
## 16 \n$30 - $50 an hour $30 - $50 30 50 25.5
## 18 \n$25 - $30 an hour $25 - $30 25 30 25.5
## 19 \n$15 - $20 an hour $15 - $20 15 20 25.5
## 20 \n$25 - $30 an hour $25 - $30 25 30 25.5
## 21 \n$15 - $20 an hour $15 - $20 15 20 25.5
## 23 \n$30 - $50 an hour $30 - $50 30 50 25.5
## 24 \n$30 - $45 an hour $30 - $45 30 45 25.5
## 25 \n$35 - $50 an hour $35 - $50 35 50 25.5
## 28 \n$20 - $35 an hour $20 - $35 20 35 25.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 37.5 25.1 36.75 15 50
## 3 37.5 25.1 36.75 15 50
## 4 37.5 25.1 36.75 15 50
## 7 37.5 25.1 36.75 15 50
## 8 37.5 25.1 36.75 15 50
## 9 37.5 25.1 36.75 15 50
## 10 37.5 25.1 36.75 15 50
## 11 37.5 25.1 36.75 15 50
## 12 37.5 25.1 36.75 15 50
## 14 37.5 25.1 36.75 15 50
## 15 37.5 25.1 36.75 15 50
## 16 37.5 25.1 36.75 15 50
## 18 37.5 25.1 36.75 15 50
## 19 37.5 25.1 36.75 15 50
## 20 37.5 25.1 36.75 15 50
## 21 37.5 25.1 36.75 15 50
## 23 37.5 25.1 36.75 15 50
## 24 37.5 25.1 36.75 15 50
## 25 37.5 25.1 36.75 15 50
## 28 37.5 25.1 36.75 15 50
##
## [[7]]
## city state
## 1 Overland Park KS
## 2 Overland Park KS
## 3 Overland Park KS
## 4 Overland Park KS
## 5 Overland Park KS
## 6 Overland Park KS
## 7 Overland Park KS
## 8 Overland Park KS
## 9 Overland Park KS
## 10 Overland Park KS
## 11 Overland Park KS
## 12 Overland Park KS
## 13 Overland Park KS
## 14 Overland Park KS
## 15 Overland Park KS
## 16 Overland Park KS
## 17 Overland Park KS
## 18 Overland Park KS
## 19 Overland Park KS
## 20 Overland Park KS
## 21 Overland Park KS
## 22 Overland Park KS
## 23 Overland Park KS
## 24 Overland Park KS
## 25 Overland Park KS
## 26 Overland Park KS
## 27 Overland Park KS
## 28 Overland Park KS
## 29 Overland Park KS
## 30 Overland Park KS
## 31 Overland Park KS
## 32 Overland Park KS
## 33 Overland Park KS
## 34 Overland Park KS
## 35 Overland Park KS
## 36 Overland Park KS
## 37 Overland Park KS
## 38 Overland Park KS
## 39 Overland Park KS
## 40 Overland Park KS
## 41 Overland Park KS
## 42 Overland Park KS
## 43 Overland Park KS
## 44 Overland Park KS
## 45 Overland Park KS
## 46 Overland Park KS
## 47 Overland Park KS
## 48 Overland Park KS
## 49 Overland Park KS
## 50 Overland Park KS
## 51 Overland Park KS
## 52 Overland Park KS
## 53 Overland Park KS
## 54 Overland Park KS
## 55 Overland Park KS
## 56 Overland Park KS
## 57 Overland Park KS
## 58 Overland Park KS
## 59 Overland Park KS
## 60 Overland Park KS
## 61 Overland Park KS
## 62 Overland Park KS
## 63 Overland Park KS
## 64 Overland Park KS
## 65 Overland Park KS
## 66 Overland Park KS
## 67 Overland Park KS
## 68 Overland Park KS
## 69 Overland Park KS
## 70 Overland Park KS
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist with Hiring Bonus
## 3 Massage Therapist
## 4 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 5 Massage Therapist
## 6 LEAD Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Professional Massage Therapist
## 11 Total Body Stretch Service Provider
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 LifeSpa-Massage Therapist
## 15 Licensed Massage Therapist - Passionate Healer
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapy Career Training Tuition Reimbursement Opport...
## 19 Massage Therapy Career Training Tuition Reimbursement Progra...
## 20 Licensed Massage Therapist
## 21 Dual Licensed Therapist - Massage and Skincare
## 22 Massage Therapist Guaranteed Pay and Hiring Bonus
## 23 Dual Licensed Therapist - Massage and Skincare
## 24 Full Time Massage Therapist (No MBLEx required)
## 25 Massage Therapist ($1,500 Sign on Bonus)
## 26 Massage Therapist - Independent Contractor
## 27 Hair, Skin, Nails and Massage Professional
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapy Career Training Tuition Reimbursement Opport...
## 34 Massage Therapy Career Training Tuition Reimbursement Progra...
## 35 Licensed Massage Therapist
## 36 Dual Licensed Therapist - Massage and Skincare
## 37 Massage Therapist Guaranteed Pay and Hiring Bonus
## 38 Dual Licensed Therapist - Massage and Skincare
## 39 Full Time Massage Therapist (No MBLEx required)
## 40 Massage Therapist ($1,500 Sign on Bonus)
## 41 Massage Therapist - Independent Contractor
## 42 Hair, Skin, Nails and Massage Professional
## 43 Licensed Massage Therapist
## 44 Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapy Career Training Tuition Reimbursement Opport...
## 49 Massage Therapy Career Training Tuition Reimbursement Progra...
## 50 Licensed Massage Therapist
## 51 Dual Licensed Therapist - Massage and Skincare
## 52 Massage Therapist Guaranteed Pay and Hiring Bonus
## 53 Dual Licensed Therapist - Massage and Skincare
## 54 Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Massage Therapy Career Training Tuition Reimbursement Opport...
## 58 Massage Therapy Career Training Tuition Reimbursement Progra...
## 59 Licensed Massage Therapist
## 60 Dual Licensed Therapist - Massage and Skincare
## 61 Massage Therapist Guaranteed Pay and Hiring Bonus
## 62 Dual Licensed Therapist - Massage and Skincare
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist ($1,500 Sign on Bonus)
## 65 Massage Therapist Guaranteed Pay and Hiring Bonus
## 66 Massage Therapist - Signing Bonus
## 67 Massage Therapist
## 68 Licensed Massage Therapist with Hiring Bonus
## 69 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 70 Licensed Massage Therapist
## HiringAgency
## 1 The Spring in Winter LLCOverland Park, KS 66212
## 2 Massage Heights Overland Park3.1Overland Park, KS 66210
## 3 Zen Massage3.5Overland Park, KS 66209
## 4 Ramsey InsightLeawood, KS
## 5 Salonspa ConnectionOverland Park, KS
## 6 Massage Heights - College Metcalf Plaza3.1Overland Park, KS 66210
## 7 PS Lifestyle3.0Overland Park, KS
## 8 Massage Heights - Lenexa City3.1Lenexa, KS 66219+2 locations
## 9 Natural Way ChiropracticOverland Park, KS 66212
## 10 Ultimate Escape Day Spa4.0Overland Park, KS 66221
## 11 Massage Envy3.2Olathe, KS 66062
## 12 Alliance Physical Therapy Partners4.6Shawnee, KS 66226
## 13 Chateau AvalonKansas City, KS 66111
## 14 Life Time3.6Overland Park, KS 66223
## 15 Ramsey InsightKansas City, MO
## 16 Hampton ChiropracticBelton, MO 64012
## 17 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 18 Massage Envy3.2Kansas City, MO 64151
## 19 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 20 Dr. Mary HasleyLee's Summit, MO 64086
## 21 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 22 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 23 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 24 Massage Envy3.2Lenexa, KS 66215
## 25 Massage Heights3.1Kansas City, MO 64157
## 26 Indo-Pak Massage TherapyKansas City, MO•Remote work available
## 27 Par Exsalonce3.6Overland Park, KS 66214
## 28 Massage Heights3.1Overland Park, KS 66210+2 locations
## 29 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 30 Raintree Medical and Chiropractic CenterLees Summit, MO
## 31 Hampton ChiropracticBelton, MO 64012
## 32 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 33 Massage Envy3.2Kansas City, MO 64151
## 34 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 35 Dr. Mary HasleyLee's Summit, MO 64086
## 36 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 37 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 38 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 39 Massage Envy3.2Lenexa, KS 66215
## 40 Massage Heights3.1Kansas City, MO 64157
## 41 Indo-Pak Massage TherapyKansas City, MO•Remote work available
## 42 Par Exsalonce3.6Overland Park, KS 66214
## 43 Massage Heights3.1Overland Park, KS 66210+2 locations
## 44 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 45 Raintree Medical and Chiropractic CenterLees Summit, MO
## 46 Hampton ChiropracticBelton, MO 64012
## 47 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 48 Massage Envy3.2Kansas City, MO 64151
## 49 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 50 Dr. Mary HasleyLee's Summit, MO 64086
## 51 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 52 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 53 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 54 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 55 Hampton ChiropracticBelton, MO 64012
## 56 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 57 Massage Envy3.2Kansas City, MO 64151
## 58 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 59 Dr. Mary HasleyLee's Summit, MO 64086
## 60 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 61 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 62 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 63 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 64 Massage Heights3.1Kansas City, MO 64157
## 65 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 66 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 67 Zen Massage3.5Overland Park, KS 66209
## 68 Massage Heights Overland Park3.1Overland Park, KS 66210
## 69 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 70 The Spring in Winter LLCOverland Park, KS 66212
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 2 15 50 37491 60000
## 2 14 15 50 37491 60000
## 3 30 15 50 37491 60000
## 4 1 15 50 37491 60000
## 5 10 15 50 37491 60000
## 6 Today 15 50 37491 60000
## 7 30 15 50 37491 60000
## 8 3 15 50 37491 60000
## 9 30 15 50 37491 60000
## 10 30 15 50 37491 60000
## 11 4 15 50 37491 60000
## 12 6 15 50 37491 60000
## 13 18 15 50 37491 60000
## 14 30 15 50 37491 60000
## 15 2 15 50 37491 60000
## 16 30 15 50 37491 60000
## 17 8 15 50 37491 60000
## 18 30 15 50 37491 60000
## 19 30 15 50 37491 60000
## 20 30 15 50 37491 60000
## 21 Today 15 50 37491 60000
## 22 30 15 50 37491 60000
## 23 30 15 50 37491 60000
## 24 21 15 50 37491 60000
## 25 11 15 50 37491 60000
## 26 17 15 50 37491 60000
## 27 30 15 50 37491 60000
## 28 30 15 50 37491 60000
## 29 30 15 50 37491 60000
## 30 30 15 50 37491 60000
## 31 30 15 50 37491 60000
## 32 8 15 50 37491 60000
## 33 30 15 50 37491 60000
## 34 30 15 50 37491 60000
## 35 30 15 50 37491 60000
## 36 Today 15 50 37491 60000
## 37 30 15 50 37491 60000
## 38 30 15 50 37491 60000
## 39 21 15 50 37491 60000
## 40 11 15 50 37491 60000
## 41 17 15 50 37491 60000
## 42 30 15 50 37491 60000
## 43 30 15 50 37491 60000
## 44 30 15 50 37491 60000
## 45 30 15 50 37491 60000
## 46 30 15 50 37491 60000
## 47 8 15 50 37491 60000
## 48 30 15 50 37491 60000
## 49 30 15 50 37491 60000
## 50 30 15 50 37491 60000
## 51 Today 15 50 37491 60000
## 52 30 15 50 37491 60000
## 53 30 15 50 37491 60000
## 54 30 15 50 37491 60000
## 55 30 15 50 37491 60000
## 56 8 15 50 37491 60000
## 57 30 15 50 37491 60000
## 58 30 15 50 37491 60000
## 59 30 15 50 37491 60000
## 60 Today 15 50 37491 60000
## 61 30 15 50 37491 60000
## 62 30 15 50 37491 60000
## 63 30 15 50 37491 60000
## 64 11 15 50 37491 60000
## 65 4 15 50 37491 60000
## 66 30 15 50 37491 60000
## 67 30 15 50 37491 60000
## 68 14 15 50 37491 60000
## 69 22 15 50 37491 60000
## 70 2 15 50 37491 60000
getIndeedJobData5pages("massage therapist","Kansas City","KS")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 3 Massage Therapist - Signing Bonus
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist ($1,500 Sign on Bonus)
## 6 Massage Therapist
## 7 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 LEAD Massage Therapist
## 11 Licensed Massage Therapist - Passionate Healer
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Massage Therapist Guaranteed Pay and Hiring Bonus
## 16 Licensed Massage Therapist with Hiring Bonus
## 17 Massage Therapy Career Training Tuition Reimbursement Opport...
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapy Career Training Tuition Reimbursement Progra...
## 21 Licensed Massage Therapist
## 22 Massage Therapist Guaranteed Pay and Hiring Bonus
## 23 Dual Licensed Therapist - Massage and Skincare
## 24 Dual Licensed Therapist - Massage and Skincare
## 25 Massage Therapist ($1,500 Sign on Bonus)
## 26 Licensed Massage Therapist
## 27 Massage Therapist
## 28 Licensed Massage Therapist (LMT)
## 29 Massage Therapist - Signing Bonus
## 30 Licensed Massage Therapist with Hiring Bonus
## 31 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 32 Massage Therapist Guaranteed Pay and Hiring Bonus
## 33 Massage Therapist Guaranteed Pay and Hiring Bonus
## 34 Dual Licensed Therapist - Massage and Skincare
## 35 Dual Licensed Therapist - Massage and Skincare
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist
## 39 LEAD Massage Therapist
## 40 Full Time Massage Therapist (No MBLEx required)
## 41 Hair, Skin, Nails and Massage Professional
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapy Career Training Tuition Reimbursement Opport...
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapy Career Training Tuition Reimbursement Progra...
## 48 Licensed Massage Therapist
## 49 Massage Therapist Guaranteed Pay and Hiring Bonus
## 50 Dual Licensed Therapist - Massage and Skincare
## 51 Dual Licensed Therapist - Massage and Skincare
## 52 Massage Therapist
## 53 Massage Therapist
## 54 LEAD Massage Therapist
## 55 Full Time Massage Therapist (No MBLEx required)
## 56 Hair, Skin, Nails and Massage Professional
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapy Career Training Tuition Reimbursement Opport...
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Massage Therapy Career Training Tuition Reimbursement Progra...
## 63 Licensed Massage Therapist
## 64 Massage Therapist Guaranteed Pay and Hiring Bonus
## 65 Dual Licensed Therapist - Massage and Skincare
## 66 Dual Licensed Therapist - Massage and Skincare
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $35 an hour $20 - $35 20 35
## 2 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 3 \n$30 - $45 an hour $30 - $45 30 45
## 4 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 5 \n$30 - $50 an hour $30 - $50 30 50
## 6 \n$35 - $50 an hour $35 - $50 35 50
## 7 \n$30 - $45 an hour $30 - $45 30 45
## 8 \n$26 - $40 an hour $26 - $40 26 40
## 9 \n$37,491 - $54,776 a year $37491 - $54776 37491 54776
## 10 \n$45,000 - $52,000 a year $45000 - $52000 45000 52000
## 11 \n$30 - $45 an hour $30 - $45 30 45
## 12 \n$26 - $40 an hour $26 - $40 26 40
## 13 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 14 \n$15 - $20 an hour $15 - $20 15 20
## 15 \n$30 - $50 an hour $30 - $50 30 50
## 16 \n$35 - $50 an hour $35 - $50 35 50
## 17 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 18 \n$30 - $45 an hour $30 - $45 30 45
## 19 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 21 \n$20 - $35 an hour $20 - $35 20 35
## 22 \n$25 - $30 an hour $25 - $30 25 30
## 23 \n$15 - $20 an hour $15 - $20 15 20
## 24 \n$25 - $30 an hour $25 - $30 25 30
## 25 \n$15 - $20 an hour $15 - $20 15 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 40 14277.12 16087.08 15
## 2 30 40 14277.12 16087.08 15
## 3 30 40 14277.12 16087.08 15
## 4 30 40 14277.12 16087.08 15
## 5 30 40 14277.12 16087.08 15
## 6 30 40 14277.12 16087.08 15
## 7 30 40 14277.12 16087.08 15
## 8 30 40 14277.12 16087.08 15
## 9 30 40 14277.12 16087.08 15
## 10 30 40 14277.12 16087.08 15
## 11 30 40 14277.12 16087.08 15
## 12 30 40 14277.12 16087.08 15
## 13 30 40 14277.12 16087.08 15
## 14 30 40 14277.12 16087.08 15
## 15 30 40 14277.12 16087.08 15
## 16 30 40 14277.12 16087.08 15
## 17 30 40 14277.12 16087.08 15
## 18 30 40 14277.12 16087.08 15
## 19 30 40 14277.12 16087.08 15
## 20 30 40 14277.12 16087.08 15
## 21 30 40 14277.12 16087.08 15
## 22 30 40 14277.12 16087.08 15
## 23 30 40 14277.12 16087.08 15
## 24 30 40 14277.12 16087.08 15
## 25 30 40 14277.12 16087.08 15
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
##
## [[3]]
## date_daysAgo
## 1 2
## 2 22
## 3 30
## 4 30
## 5 11
## 6 30
## 7 1
## 8 18
## 9 10
## 10 Today
## 11 2
## 12 30
## 13 6
## 14 3
## 15 4
## 16 14
## 17 30
## 18 8
## 19 30
## 20 30
## 21 30
## 22 30
## 23 Today
## 24 30
## 25 11
## 26 30
## 27 30
## 28 30
## 29 30
## 30 14
## 31 22
## 32 4
## 33 30
## 34 Today
## 35 30
## 36 2
## 37 30
## 38 28
## 39 30
## 40 21
## 41 30
## 42 30
## 43 30
## 44 30
## 45 8
## 46 30
## 47 30
## 48 30
## 49 30
## 50 Today
## 51 30
## 52 30
## 53 28
## 54 30
## 55 21
## 56 30
## 57 30
## 58 30
## 59 30
## 60 8
## 61 30
## 62 30
## 63 30
## 64 30
## 65 Today
## 66 30
##
## [[4]]
## HiringAgency
## 1 The Spring in Winter LLCOverland Park, KS 66212
## 2 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 3 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 4 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 5 Massage Heights3.1Kansas City, MO 64157
## 6 Zen Massage3.5Overland Park, KS 66209
## 7 Ramsey InsightLeawood, KS
## 8 Chateau AvalonKansas City, KS 66111
## 9 Salonspa ConnectionOverland Park, KS
## 10 Massage Heights - College Metcalf Plaza3.1Overland Park, KS 66210
## 11 Ramsey InsightKansas City, MO
## 12 PS Lifestyle3.0Overland Park, KS
## 13 Alliance Physical Therapy Partners4.6Shawnee, KS 66226
## 14 Massage Heights - Lenexa City3.1Lenexa, KS 66219+2 locations
## 15 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 16 Massage Heights Overland Park3.1Overland Park, KS 66210
## 17 Massage Envy3.2Kansas City, MO 64151
## 18 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 19 Massage Heights3.1Overland Park, KS 66210+2 locations
## 20 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 21 Dr. Mary HasleyLee's Summit, MO 64086
## 22 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 23 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 24 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 25 Massage Heights3.1Kansas City, MO 64157
## 26 Raintree Medical and Chiropractic CenterLees Summit, MO
## 27 Zen Massage3.5Overland Park, KS 66209
## 28 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 29 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 30 Massage Heights Overland Park3.1Overland Park, KS 66210
## 31 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 32 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 33 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 34 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 35 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 36 The Spring in Winter LLCOverland Park, KS 66212
## 37 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 38 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 39 Massage Heights3.1Overland Park, KS 66210
## 40 Massage Envy3.2Lenexa, KS 66215
## 41 Par Exsalonce3.6Overland Park, KS 66214
## 42 Raintree Medical and Chiropractic CenterLees Summit, MO
## 43 Hampton ChiropracticBelton, MO 64012
## 44 Massage Envy3.2Kansas City, MO 64151
## 45 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 46 Massage Heights3.1Overland Park, KS 66210+2 locations
## 47 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 48 Dr. Mary HasleyLee's Summit, MO 64086
## 49 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 50 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 51 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 52 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 53 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 54 Massage Heights3.1Overland Park, KS 66210
## 55 Massage Envy3.2Lenexa, KS 66215
## 56 Par Exsalonce3.6Overland Park, KS 66214
## 57 Raintree Medical and Chiropractic CenterLees Summit, MO
## 58 Hampton ChiropracticBelton, MO 64012
## 59 Massage Envy3.2Kansas City, MO 64151
## 60 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 61 Massage Heights3.1Overland Park, KS 66210+2 locations
## 62 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 63 Dr. Mary HasleyLee's Summit, MO 64086
## 64 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 65 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 66 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 4 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 9 \n$37,491 - $54,776 a year $37491 - $54776 37491 54776
## 10 \n$45,000 - $52,000 a year $45000 - $52000 45000 52000
## 13 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 17 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 19 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 45000 57388 44561.38 55847 37491
## 4 45000 57388 44561.38 55847 37491
## 9 45000 57388 44561.38 55847 37491
## 10 45000 57388 44561.38 55847 37491
## 13 45000 57388 44561.38 55847 37491
## 17 45000 57388 44561.38 55847 37491
## 19 45000 57388 44561.38 55847 37491
## 20 45000 57388 44561.38 55847 37491
## maximumMaxSalary
## 2 60000
## 4 60000
## 9 60000
## 10 60000
## 13 60000
## 17 60000
## 19 60000
## 20 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 - $35 an hour $20 - $35 20 35 26
## 3 \n$30 - $45 an hour $30 - $45 30 45 26
## 5 \n$30 - $50 an hour $30 - $50 30 50 26
## 6 \n$35 - $50 an hour $35 - $50 35 50 26
## 7 \n$30 - $45 an hour $30 - $45 30 45 26
## 8 \n$26 - $40 an hour $26 - $40 26 40 26
## 11 \n$30 - $45 an hour $30 - $45 30 45 26
## 12 \n$26 - $40 an hour $26 - $40 26 40 26
## 14 \n$15 - $20 an hour $15 - $20 15 20 26
## 15 \n$30 - $50 an hour $30 - $50 30 50 26
## 16 \n$35 - $50 an hour $35 - $50 35 50 26
## 18 \n$30 - $45 an hour $30 - $45 30 45 26
## 21 \n$20 - $35 an hour $20 - $35 20 35 26
## 22 \n$25 - $30 an hour $25 - $30 25 30 26
## 23 \n$15 - $20 an hour $15 - $20 15 20 26
## 24 \n$25 - $30 an hour $25 - $30 25 30 26
## 25 \n$15 - $20 an hour $15 - $20 15 20 26
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 25.70588 38.23529 15 50
## 3 40 25.70588 38.23529 15 50
## 5 40 25.70588 38.23529 15 50
## 6 40 25.70588 38.23529 15 50
## 7 40 25.70588 38.23529 15 50
## 8 40 25.70588 38.23529 15 50
## 11 40 25.70588 38.23529 15 50
## 12 40 25.70588 38.23529 15 50
## 14 40 25.70588 38.23529 15 50
## 15 40 25.70588 38.23529 15 50
## 16 40 25.70588 38.23529 15 50
## 18 40 25.70588 38.23529 15 50
## 21 40 25.70588 38.23529 15 50
## 22 40 25.70588 38.23529 15 50
## 23 40 25.70588 38.23529 15 50
## 24 40 25.70588 38.23529 15 50
## 25 40 25.70588 38.23529 15 50
##
## [[7]]
## city state
## 1 Kansas City KS
## 2 Kansas City KS
## 3 Kansas City KS
## 4 Kansas City KS
## 5 Kansas City KS
## 6 Kansas City KS
## 7 Kansas City KS
## 8 Kansas City KS
## 9 Kansas City KS
## 10 Kansas City KS
## 11 Kansas City KS
## 12 Kansas City KS
## 13 Kansas City KS
## 14 Kansas City KS
## 15 Kansas City KS
## 16 Kansas City KS
## 17 Kansas City KS
## 18 Kansas City KS
## 19 Kansas City KS
## 20 Kansas City KS
## 21 Kansas City KS
## 22 Kansas City KS
## 23 Kansas City KS
## 24 Kansas City KS
## 25 Kansas City KS
## 26 Kansas City KS
## 27 Kansas City KS
## 28 Kansas City KS
## 29 Kansas City KS
## 30 Kansas City KS
## 31 Kansas City KS
## 32 Kansas City KS
## 33 Kansas City KS
## 34 Kansas City KS
## 35 Kansas City KS
## 36 Kansas City KS
## 37 Kansas City KS
## 38 Kansas City KS
## 39 Kansas City KS
## 40 Kansas City KS
## 41 Kansas City KS
## 42 Kansas City KS
## 43 Kansas City KS
## 44 Kansas City KS
## 45 Kansas City KS
## 46 Kansas City KS
## 47 Kansas City KS
## 48 Kansas City KS
## 49 Kansas City KS
## 50 Kansas City KS
## 51 Kansas City KS
## 52 Kansas City KS
## 53 Kansas City KS
## 54 Kansas City KS
## 55 Kansas City KS
## 56 Kansas City KS
## 57 Kansas City KS
## 58 Kansas City KS
## 59 Kansas City KS
## 60 Kansas City KS
## 61 Kansas City KS
## 62 Kansas City KS
## 63 Kansas City KS
## 64 Kansas City KS
## 65 Kansas City KS
## 66 Kansas City KS
## jobTitle
## 1 Licensed Massage Therapist
## 2 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 3 Massage Therapist - Signing Bonus
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist ($1,500 Sign on Bonus)
## 6 Massage Therapist
## 7 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 LEAD Massage Therapist
## 11 Licensed Massage Therapist - Passionate Healer
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Massage Therapist Guaranteed Pay and Hiring Bonus
## 16 Licensed Massage Therapist with Hiring Bonus
## 17 Massage Therapy Career Training Tuition Reimbursement Opport...
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapy Career Training Tuition Reimbursement Progra...
## 21 Licensed Massage Therapist
## 22 Massage Therapist Guaranteed Pay and Hiring Bonus
## 23 Dual Licensed Therapist - Massage and Skincare
## 24 Dual Licensed Therapist - Massage and Skincare
## 25 Massage Therapist ($1,500 Sign on Bonus)
## 26 Licensed Massage Therapist
## 27 Massage Therapist
## 28 Licensed Massage Therapist (LMT)
## 29 Massage Therapist - Signing Bonus
## 30 Licensed Massage Therapist with Hiring Bonus
## 31 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 32 Massage Therapist Guaranteed Pay and Hiring Bonus
## 33 Massage Therapist Guaranteed Pay and Hiring Bonus
## 34 Dual Licensed Therapist - Massage and Skincare
## 35 Dual Licensed Therapist - Massage and Skincare
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist
## 39 LEAD Massage Therapist
## 40 Full Time Massage Therapist (No MBLEx required)
## 41 Hair, Skin, Nails and Massage Professional
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapy Career Training Tuition Reimbursement Opport...
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapy Career Training Tuition Reimbursement Progra...
## 48 Licensed Massage Therapist
## 49 Massage Therapist Guaranteed Pay and Hiring Bonus
## 50 Dual Licensed Therapist - Massage and Skincare
## 51 Dual Licensed Therapist - Massage and Skincare
## 52 Massage Therapist
## 53 Massage Therapist
## 54 LEAD Massage Therapist
## 55 Full Time Massage Therapist (No MBLEx required)
## 56 Hair, Skin, Nails and Massage Professional
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapy Career Training Tuition Reimbursement Opport...
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Massage Therapy Career Training Tuition Reimbursement Progra...
## 63 Licensed Massage Therapist
## 64 Massage Therapist Guaranteed Pay and Hiring Bonus
## 65 Dual Licensed Therapist - Massage and Skincare
## 66 Dual Licensed Therapist - Massage and Skincare
## HiringAgency
## 1 The Spring in Winter LLCOverland Park, KS 66212
## 2 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 3 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 4 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 5 Massage Heights3.1Kansas City, MO 64157
## 6 Zen Massage3.5Overland Park, KS 66209
## 7 Ramsey InsightLeawood, KS
## 8 Chateau AvalonKansas City, KS 66111
## 9 Salonspa ConnectionOverland Park, KS
## 10 Massage Heights - College Metcalf Plaza3.1Overland Park, KS 66210
## 11 Ramsey InsightKansas City, MO
## 12 PS Lifestyle3.0Overland Park, KS
## 13 Alliance Physical Therapy Partners4.6Shawnee, KS 66226
## 14 Massage Heights - Lenexa City3.1Lenexa, KS 66219+2 locations
## 15 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 16 Massage Heights Overland Park3.1Overland Park, KS 66210
## 17 Massage Envy3.2Kansas City, MO 64151
## 18 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 19 Massage Heights3.1Overland Park, KS 66210+2 locations
## 20 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 21 Dr. Mary HasleyLee's Summit, MO 64086
## 22 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 23 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 24 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 25 Massage Heights3.1Kansas City, MO 64157
## 26 Raintree Medical and Chiropractic CenterLees Summit, MO
## 27 Zen Massage3.5Overland Park, KS 66209
## 28 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 29 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 30 Massage Heights Overland Park3.1Overland Park, KS 66210
## 31 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 32 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 33 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 34 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 35 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 36 The Spring in Winter LLCOverland Park, KS 66212
## 37 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 38 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 39 Massage Heights3.1Overland Park, KS 66210
## 40 Massage Envy3.2Lenexa, KS 66215
## 41 Par Exsalonce3.6Overland Park, KS 66214
## 42 Raintree Medical and Chiropractic CenterLees Summit, MO
## 43 Hampton ChiropracticBelton, MO 64012
## 44 Massage Envy3.2Kansas City, MO 64151
## 45 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 46 Massage Heights3.1Overland Park, KS 66210+2 locations
## 47 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 48 Dr. Mary HasleyLee's Summit, MO 64086
## 49 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 50 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 51 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 52 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 53 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 54 Massage Heights3.1Overland Park, KS 66210
## 55 Massage Envy3.2Lenexa, KS 66215
## 56 Par Exsalonce3.6Overland Park, KS 66214
## 57 Raintree Medical and Chiropractic CenterLees Summit, MO
## 58 Hampton ChiropracticBelton, MO 64012
## 59 Massage Envy3.2Kansas City, MO 64151
## 60 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 61 Massage Heights3.1Overland Park, KS 66210+2 locations
## 62 Massage Envy3.2Kansas City, MO 64112 (Country Club Plaza area)
## 63 Dr. Mary HasleyLee's Summit, MO 64086
## 64 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 65 Massage Heights - Ward Parkway3.1Kansas City, MO 64114
## 66 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 2 15 50 37491 60000
## 2 22 15 50 37491 60000
## 3 30 15 50 37491 60000
## 4 30 15 50 37491 60000
## 5 11 15 50 37491 60000
## 6 30 15 50 37491 60000
## 7 1 15 50 37491 60000
## 8 18 15 50 37491 60000
## 9 10 15 50 37491 60000
## 10 Today 15 50 37491 60000
## 11 2 15 50 37491 60000
## 12 30 15 50 37491 60000
## 13 6 15 50 37491 60000
## 14 3 15 50 37491 60000
## 15 4 15 50 37491 60000
## 16 14 15 50 37491 60000
## 17 30 15 50 37491 60000
## 18 8 15 50 37491 60000
## 19 30 15 50 37491 60000
## 20 30 15 50 37491 60000
## 21 30 15 50 37491 60000
## 22 30 15 50 37491 60000
## 23 Today 15 50 37491 60000
## 24 30 15 50 37491 60000
## 25 11 15 50 37491 60000
## 26 30 15 50 37491 60000
## 27 30 15 50 37491 60000
## 28 30 15 50 37491 60000
## 29 30 15 50 37491 60000
## 30 14 15 50 37491 60000
## 31 22 15 50 37491 60000
## 32 4 15 50 37491 60000
## 33 30 15 50 37491 60000
## 34 Today 15 50 37491 60000
## 35 30 15 50 37491 60000
## 36 2 15 50 37491 60000
## 37 30 15 50 37491 60000
## 38 28 15 50 37491 60000
## 39 30 15 50 37491 60000
## 40 21 15 50 37491 60000
## 41 30 15 50 37491 60000
## 42 30 15 50 37491 60000
## 43 30 15 50 37491 60000
## 44 30 15 50 37491 60000
## 45 8 15 50 37491 60000
## 46 30 15 50 37491 60000
## 47 30 15 50 37491 60000
## 48 30 15 50 37491 60000
## 49 30 15 50 37491 60000
## 50 Today 15 50 37491 60000
## 51 30 15 50 37491 60000
## 52 30 15 50 37491 60000
## 53 28 15 50 37491 60000
## 54 30 15 50 37491 60000
## 55 21 15 50 37491 60000
## 56 30 15 50 37491 60000
## 57 30 15 50 37491 60000
## 58 30 15 50 37491 60000
## 59 30 15 50 37491 60000
## 60 8 15 50 37491 60000
## 61 30 15 50 37491 60000
## 62 30 15 50 37491 60000
## 63 30 15 50 37491 60000
## 64 30 15 50 37491 60000
## 65 Today 15 50 37491 60000
## 66 30 15 50 37491 60000
Kentucky Louisville, Lexington, Bowling Green
getIndeedJobData5pages("massage therapist","Louisville","KY")
## Warning in getIndeedJobData5pages("massage therapist", "Louisville", "KY"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Louisville", "KY"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Louisville", "KY"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Goal Oriented Licensed Massage Therapist
## 2 Massage Therapist - Rental Space
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 7 Massage Therapist
## 8 Licensed Massage Therapist (LMT) -1 position left - LUCRATIV...
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT) -1 position left - LUCRATIV...
## 19 Licensed Massage Therapist (LMT)
## 20 Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist - Independent Contractor
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 25 Licensed Massage Therapist
## 26 Deep Tissue Massage Therapist
## 27 Licensed Massage Therapist- LUCRATIVE POSITION
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist - Weekends Only
## 31 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 32 Massage Therapist
## 33 Licensed Massage Therapist (LMT) -1 position left - LUCRATIV...
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Massage Therapist - Independent Contractor
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 40 Licensed Massage Therapist
## 41 Deep Tissue Massage Therapist
## 42 Licensed Massage Therapist- LUCRATIVE POSITION
## 43 Licensed Massage Therapist
## 44 Massage Therapist
## 45 Licensed Massage Therapist - Weekends Only
## 46 Licensed Massage Therapist (LMT)
## 47 Massage Therapist
## 48 Massage Therapist - Independent Contractor
## 49 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 50 Licensed Massage Therapist
## 51 Deep Tissue Massage Therapist
## 52 Licensed Massage Therapist- LUCRATIVE POSITION
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Licensed Massage Therapist - Weekends Only
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Massage Therapist - Rental Space
## 59 Goal Oriented Licensed Massage Therapist
## 60 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist
## 65 Massage Therapist - Independent Contractor
## 66 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 67 Licensed Massage Therapist
## 68 Deep Tissue Massage Therapist
## 69 Licensed Massage Therapist- LUCRATIVE POSITION
## 70 Licensed Massage Therapist
## 71 Massage Therapist
## 72 Licensed Massage Therapist - Weekends Only
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist
## 76 Goal Oriented Licensed Massage Therapist
## 77 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 78 Licensed Massage Therapist
## 79 Massage Therapist - Rental Space
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$34 - $44 an hour $34 - $44 34 44
## 2 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 3 \n$25 - $30 an hour $25 - $30 25 30
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$62,000 a year $62000 62000 NA
## 6 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 7 \n$29 an hour $29 29 NA
## 8 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 9 \n$29 - $35 an hour $29 - $35 29 35
## 10 \nUp to $33 an hour $33 33 NA
## 11 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 12 \n$35,000 a year ++ $35000 35000 NA
## 13 \n$62,000 a year $62000 62000 NA
## 14 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 15 \n$29 an hour $29 29 NA
## 16 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 17 \n$29 - $35 an hour $29 - $35 29 35
## 18 \nUp to $33 an hour $33 33 NA
## 19 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 20 \n$35,000 a year ++ $35000 35000 NA
## 21 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 22 \n$35,000 a year ++ $35000 35000 NA
## 23 \n$62,000 a year $62000 62000 NA
## 24 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 25 \n$29 an hour $29 29 NA
## 26 \n$29 - $35 an hour $29 - $35 29 35
## 27 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 28 \nUp to $33 an hour $33 33 NA
## 29 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 30 \n$35,000 a year ++ $35000 35000 NA
## 31 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 32 \n$35,000 a year ++ $35000 35000 NA
## 33 \n$29 an hour $29 29 NA
## 34 \n$29 - $35 an hour $29 - $35 29 35
## 35 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 36 \n$35,000 a year ++ $35000 35000 NA
## 37 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 38 \n$35,000 a year ++ $35000 35000 NA
## 39 \nUp to $33 an hour $33 33 NA
## 40 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 41 \n$34 - $44 an hour $34 - $44 34 44
## 42 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 43 \n$25 - $30 an hour $25 - $30 25 30
## 44 \n$29 an hour $29 29 NA
## 45 \n$29 - $35 an hour $29 - $35 29 35
## 46 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 47 \n$35,000 a year ++ $35000 35000 NA
## 48 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 49 \n$35,000 a year ++ $35000 35000 NA
## 50 \nUp to $33 an hour $33 33 NA
## 51 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 52 \n$25 - $30 an hour $25 - $30 25 30
## 53 \n$34 - $44 an hour $34 - $44 34 44
## 54 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35000 35283.5 23735.83 28420.14 25
## 2 35000 35283.5 23735.83 28420.14 25
## 3 35000 35283.5 23735.83 28420.14 25
## 4 35000 35283.5 23735.83 28420.14 25
## 5 35000 35283.5 23735.83 28420.14 25
## 6 35000 35283.5 23735.83 28420.14 25
## 7 35000 35283.5 23735.83 28420.14 25
## 8 35000 35283.5 23735.83 28420.14 25
## 9 35000 35283.5 23735.83 28420.14 25
## 10 35000 35283.5 23735.83 28420.14 25
## 11 35000 35283.5 23735.83 28420.14 25
## 12 35000 35283.5 23735.83 28420.14 25
## 13 35000 35283.5 23735.83 28420.14 25
## 14 35000 35283.5 23735.83 28420.14 25
## 15 35000 35283.5 23735.83 28420.14 25
## 16 35000 35283.5 23735.83 28420.14 25
## 17 35000 35283.5 23735.83 28420.14 25
## 18 35000 35283.5 23735.83 28420.14 25
## 19 35000 35283.5 23735.83 28420.14 25
## 20 35000 35283.5 23735.83 28420.14 25
## 21 35000 35283.5 23735.83 28420.14 25
## 22 35000 35283.5 23735.83 28420.14 25
## 23 35000 35283.5 23735.83 28420.14 25
## 24 35000 35283.5 23735.83 28420.14 25
## 25 35000 35283.5 23735.83 28420.14 25
## 26 35000 35283.5 23735.83 28420.14 25
## 27 35000 35283.5 23735.83 28420.14 25
## 28 35000 35283.5 23735.83 28420.14 25
## 29 35000 35283.5 23735.83 28420.14 25
## 30 35000 35283.5 23735.83 28420.14 25
## 31 35000 35283.5 23735.83 28420.14 25
## 32 35000 35283.5 23735.83 28420.14 25
## 33 35000 35283.5 23735.83 28420.14 25
## 34 35000 35283.5 23735.83 28420.14 25
## 35 35000 35283.5 23735.83 28420.14 25
## 36 35000 35283.5 23735.83 28420.14 25
## 37 35000 35283.5 23735.83 28420.14 25
## 38 35000 35283.5 23735.83 28420.14 25
## 39 35000 35283.5 23735.83 28420.14 25
## 40 35000 35283.5 23735.83 28420.14 25
## 41 35000 35283.5 23735.83 28420.14 25
## 42 35000 35283.5 23735.83 28420.14 25
## 43 35000 35283.5 23735.83 28420.14 25
## 44 35000 35283.5 23735.83 28420.14 25
## 45 35000 35283.5 23735.83 28420.14 25
## 46 35000 35283.5 23735.83 28420.14 25
## 47 35000 35283.5 23735.83 28420.14 25
## 48 35000 35283.5 23735.83 28420.14 25
## 49 35000 35283.5 23735.83 28420.14 25
## 50 35000 35283.5 23735.83 28420.14 25
## 51 35000 35283.5 23735.83 28420.14 25
## 52 35000 35283.5 23735.83 28420.14 25
## 53 35000 35283.5 23735.83 28420.14 25
## 54 35000 35283.5 23735.83 28420.14 25
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
## 26 62000
## 27 62000
## 28 62000
## 29 62000
## 30 62000
## 31 62000
## 32 62000
## 33 62000
## 34 62000
## 35 62000
## 36 62000
## 37 62000
## 38 62000
## 39 62000
## 40 62000
## 41 62000
## 42 62000
## 43 62000
## 44 62000
## 45 62000
## 46 62000
## 47 62000
## 48 62000
## 49 62000
## 50 62000
## 51 62000
## 52 62000
## 53 62000
## 54 62000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 Just posted
## 3 26
## 4 30
## 5 5
## 6 30
## 7 20
## 8 12
## 9 30
## 10 3
## 11 30
## 12 30
## 13 30
## 14 12
## 15 30
## 16 30
## 17 20
## 18 12
## 19 30
## 20 3
## 21 30
## 22 30
## 23 30
## 24 12
## 25 30
## 26 30
## 27 12
## 28 6
## 29 30
## 30 30
## 31 30
## 32 20
## 33 12
## 34 30
## 35 3
## 36 30
## 37 30
## 38 30
## 39 12
## 40 30
## 41 30
## 42 12
## 43 6
## 44 30
## 45 30
## 46 30
## 47 3
## 48 30
## 49 12
## 50 30
## 51 30
## 52 12
## 53 6
## 54 30
## 55 30
## 56 30
## 57 30
## 58 Just posted
## 59 30
## 60 30
## 61 26
## 62 30
## 63 30
## 64 3
## 65 30
## 66 12
## 67 30
## 68 30
## 69 12
## 70 6
## 71 30
## 72 30
## 73 30
## 74 30
## 75 30
## 76 30
## 77 30
## 78 26
## 79 Just posted
##
## [[4]]
## HiringAgency
## 1 The Spa at Norton CommonsProspect, KY 40059
## 2 Eagle Freight SolutionsLouisville, KY 40223
## 3 Spa Natur LLCJeffersonville, IN 47130
## 4 Plus Care Chiropractic & Wellness CenterJeffersonville, IN 47130
## 5 Indo-Pak Massage TherapyLouisville, KY•Remote work available
## 6 Elements Massage - Middletown3.6Louisville, KY 40223
## 7 Elements3.6Louisville, KY 40222
## 8 Wellness Clinic4.0Hurstbourne Acres, KY 40220 (Hikes Point area)
## 9 Louisville Family ChiropracticLouisville, KY 40222
## 10 Z Salon & Spa3.6Louisville, KY 40222
## 11 Elements Massage - Middletown3.6Louisville, KY 40223
## 12 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 13 The Radiant TouchShepherdsville, KY 40165
## 14 Wellness Clinic4.0Louisville, KY 40222
## 15 Elements3.6Louisville, KY 40223
## 16 Elements Massage - Middletown3.6Louisville, KY 40223
## 17 Elements3.6Louisville, KY 40222
## 18 Wellness Clinic4.0Hurstbourne Acres, KY 40220 (Hikes Point area)
## 19 Louisville Family ChiropracticLouisville, KY 40222
## 20 Z Salon & Spa3.6Louisville, KY 40222
## 21 Elements Massage - Middletown3.6Louisville, KY 40223
## 22 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 23 The Radiant TouchShepherdsville, KY 40165
## 24 Wellness Clinic4.0Louisville, KY 40222
## 25 Elements3.6Louisville, KY 40223
## 26 Elements3.6Louisville, KY 40222
## 27 Wellness Clinic4.0Louisville, KY 40241
## 28 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 29 Massage Envy3.2Louisville, KY 40207
## 30 Elements3.6Louisville, KY 40223
## 31 Elements Massage - Middletown3.6Louisville, KY 40223
## 32 Elements3.6Louisville, KY 40222
## 33 Wellness Clinic4.0Hurstbourne Acres, KY 40220 (Hikes Point area)
## 34 Louisville Family ChiropracticLouisville, KY 40222
## 35 Z Salon & Spa3.6Louisville, KY 40222
## 36 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 37 Elements Massage - Middletown3.6Louisville, KY 40223
## 38 The Radiant TouchShepherdsville, KY 40165
## 39 Wellness Clinic4.0Louisville, KY 40222
## 40 Elements3.6Louisville, KY 40223
## 41 Elements3.6Louisville, KY 40222
## 42 Wellness Clinic4.0Louisville, KY 40241
## 43 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 44 Massage Envy3.2Louisville, KY 40207
## 45 Elements3.6Louisville, KY 40223
## 46 Louisville Family ChiropracticLouisville, KY 40222
## 47 Z Salon & Spa3.6Louisville, KY 40222
## 48 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 49 Wellness Clinic4.0Louisville, KY 40222
## 50 Elements3.6Louisville, KY 40223
## 51 Elements3.6Louisville, KY 40222
## 52 Wellness Clinic4.0Louisville, KY 40241
## 53 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 54 Massage Envy3.2Louisville, KY 40207
## 55 Elements3.6Louisville, KY 40223
## 56 The Radiant TouchShepherdsville, KY 40165
## 57 Elements Massage - Middletown3.6Louisville, KY 40223
## 58 Eagle Freight SolutionsLouisville, KY 40223
## 59 The Spa at Norton CommonsProspect, KY 40059
## 60 Elements Massage - Middletown3.6Louisville, KY 40223
## 61 Spa Natur LLCJeffersonville, IN 47130
## 62 Plus Care Chiropractic & Wellness CenterJeffersonville, IN 47130
## 63 Louisville Family ChiropracticLouisville, KY 40222
## 64 Z Salon & Spa3.6Louisville, KY 40222
## 65 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 66 Wellness Clinic4.0Louisville, KY 40222
## 67 Elements3.6Louisville, KY 40223
## 68 Elements3.6Louisville, KY 40222
## 69 Wellness Clinic4.0Louisville, KY 40241
## 70 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 71 Massage Envy3.2Louisville, KY 40207
## 72 Elements3.6Louisville, KY 40223
## 73 The Radiant TouchShepherdsville, KY 40165
## 74 Elements Massage - Middletown3.6Louisville, KY 40223
## 75 Plus Care Chiropractic & Wellness CenterJeffersonville, IN 47130
## 76 The Spa at Norton CommonsProspect, KY 40059
## 77 Elements Massage - Middletown3.6Louisville, KY 40223
## 78 Spa Natur LLCJeffersonville, IN 47130
## 79 Eagle Freight SolutionsLouisville, KY 40223
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 5 \n$62,000 a year $62000 62000 NA
## 6 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 8 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 11 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 12 \n$35,000 a year ++ $35000 35000 NA
## 13 \n$62,000 a year $62000 62000 NA
## 14 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 16 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 19 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 20 \n$35,000 a year ++ $35000 35000 NA
## 21 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 22 \n$35,000 a year ++ $35000 35000 NA
## 23 \n$62,000 a year $62000 62000 NA
## 24 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 27 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 29 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 30 \n$35,000 a year ++ $35000 35000 NA
## 31 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 32 \n$35,000 a year ++ $35000 35000 NA
## 35 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 36 \n$35,000 a year ++ $35000 35000 NA
## 37 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 38 \n$35,000 a year ++ $35000 35000 NA
## 40 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 42 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 46 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 47 \n$35,000 a year ++ $35000 35000 NA
## 48 \n$35,567 - $55,000 a year $35567 - $55000 35567 55000
## 49 \n$35,000 a year ++ $35000 35000 NA
## 51 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 54 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 35567 55000 39878.22 57500 35000
## 5 35567 55000 39878.22 57500 35000
## 6 35567 55000 39878.22 57500 35000
## 8 35567 55000 39878.22 57500 35000
## 11 35567 55000 39878.22 57500 35000
## 12 35567 55000 39878.22 57500 35000
## 13 35567 55000 39878.22 57500 35000
## 14 35567 55000 39878.22 57500 35000
## 16 35567 55000 39878.22 57500 35000
## 19 35567 55000 39878.22 57500 35000
## 20 35567 55000 39878.22 57500 35000
## 21 35567 55000 39878.22 57500 35000
## 22 35567 55000 39878.22 57500 35000
## 23 35567 55000 39878.22 57500 35000
## 24 35567 55000 39878.22 57500 35000
## 27 35567 55000 39878.22 57500 35000
## 29 35567 55000 39878.22 57500 35000
## 30 35567 55000 39878.22 57500 35000
## 31 35567 55000 39878.22 57500 35000
## 32 35567 55000 39878.22 57500 35000
## 35 35567 55000 39878.22 57500 35000
## 36 35567 55000 39878.22 57500 35000
## 37 35567 55000 39878.22 57500 35000
## 38 35567 55000 39878.22 57500 35000
## 40 35567 55000 39878.22 57500 35000
## 42 35567 55000 39878.22 57500 35000
## 46 35567 55000 39878.22 57500 35000
## 47 35567 55000 39878.22 57500 35000
## 48 35567 55000 39878.22 57500 35000
## 49 35567 55000 39878.22 57500 35000
## 51 35567 55000 39878.22 57500 35000
## 54 35567 55000 39878.22 57500 35000
## maximumMaxSalary
## 2 62000
## 5 62000
## 6 62000
## 8 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 16 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 27 62000
## 29 62000
## 30 62000
## 31 62000
## 32 62000
## 35 62000
## 36 62000
## 37 62000
## 38 62000
## 40 62000
## 42 62000
## 46 62000
## 47 62000
## 48 62000
## 49 62000
## 51 62000
## 54 62000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$34 - $44 an hour $34 - $44 34 44 29
## 3 \n$25 - $30 an hour $25 - $30 25 30 29
## 7 \n$29 an hour $29 29 NA 29
## 9 \n$29 - $35 an hour $29 - $35 29 35 29
## 10 \nUp to $33 an hour $33 33 NA 29
## 15 \n$29 an hour $29 29 NA 29
## 17 \n$29 - $35 an hour $29 - $35 29 35 29
## 18 \nUp to $33 an hour $33 33 NA 29
## 25 \n$29 an hour $29 29 NA 29
## 26 \n$29 - $35 an hour $29 - $35 29 35 29
## 28 \nUp to $33 an hour $33 33 NA 29
## 33 \n$29 an hour $29 29 NA 29
## 34 \n$29 - $35 an hour $29 - $35 29 35 29
## 39 \nUp to $33 an hour $33 33 NA 29
## 41 \n$34 - $44 an hour $34 - $44 34 44 29
## 43 \n$25 - $30 an hour $25 - $30 25 30 29
## 44 \n$29 an hour $29 29 NA 29
## 45 \n$29 - $35 an hour $29 - $35 29 35 29
## 50 \nUp to $33 an hour $33 33 NA 29
## 52 \n$25 - $30 an hour $25 - $30 25 30 29
## 53 \n$34 - $44 an hour $34 - $44 34 44 29
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 35 30.09524 36.09091 25 44
## 3 35 30.09524 36.09091 25 44
## 7 35 30.09524 36.09091 25 44
## 9 35 30.09524 36.09091 25 44
## 10 35 30.09524 36.09091 25 44
## 15 35 30.09524 36.09091 25 44
## 17 35 30.09524 36.09091 25 44
## 18 35 30.09524 36.09091 25 44
## 25 35 30.09524 36.09091 25 44
## 26 35 30.09524 36.09091 25 44
## 28 35 30.09524 36.09091 25 44
## 33 35 30.09524 36.09091 25 44
## 34 35 30.09524 36.09091 25 44
## 39 35 30.09524 36.09091 25 44
## 41 35 30.09524 36.09091 25 44
## 43 35 30.09524 36.09091 25 44
## 44 35 30.09524 36.09091 25 44
## 45 35 30.09524 36.09091 25 44
## 50 35 30.09524 36.09091 25 44
## 52 35 30.09524 36.09091 25 44
## 53 35 30.09524 36.09091 25 44
##
## [[7]]
## city state
## 1 Louisville KY
## 2 Louisville KY
## 3 Louisville KY
## 4 Louisville KY
## 5 Louisville KY
## 6 Louisville KY
## 7 Louisville KY
## 8 Louisville KY
## 9 Louisville KY
## 10 Louisville KY
## 11 Louisville KY
## 12 Louisville KY
## 13 Louisville KY
## 14 Louisville KY
## 15 Louisville KY
## 16 Louisville KY
## 17 Louisville KY
## 18 Louisville KY
## 19 Louisville KY
## 20 Louisville KY
## 21 Louisville KY
## 22 Louisville KY
## 23 Louisville KY
## 24 Louisville KY
## 25 Louisville KY
## 26 Louisville KY
## 27 Louisville KY
## 28 Louisville KY
## 29 Louisville KY
## 30 Louisville KY
## 31 Louisville KY
## 32 Louisville KY
## 33 Louisville KY
## 34 Louisville KY
## 35 Louisville KY
## 36 Louisville KY
## 37 Louisville KY
## 38 Louisville KY
## 39 Louisville KY
## 40 Louisville KY
## 41 Louisville KY
## 42 Louisville KY
## 43 Louisville KY
## 44 Louisville KY
## 45 Louisville KY
## 46 Louisville KY
## 47 Louisville KY
## 48 Louisville KY
## 49 Louisville KY
## 50 Louisville KY
## 51 Louisville KY
## 52 Louisville KY
## 53 Louisville KY
## 54 Louisville KY
## 55 Louisville KY
## 56 Louisville KY
## 57 Louisville KY
## 58 Louisville KY
## 59 Louisville KY
## 60 Louisville KY
## 61 Louisville KY
## 62 Louisville KY
## 63 Louisville KY
## 64 Louisville KY
## 65 Louisville KY
## 66 Louisville KY
## 67 Louisville KY
## 68 Louisville KY
## 69 Louisville KY
## 70 Louisville KY
## 71 Louisville KY
## 72 Louisville KY
## 73 Louisville KY
## 74 Louisville KY
## 75 Louisville KY
## 76 Louisville KY
## 77 Louisville KY
## 78 Louisville KY
## 79 Louisville KY
## jobTitle
## 1 Goal Oriented Licensed Massage Therapist
## 2 Massage Therapist - Rental Space
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 7 Massage Therapist
## 8 Licensed Massage Therapist (LMT) -1 position left - LUCRATIV...
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT) -1 position left - LUCRATIV...
## 19 Licensed Massage Therapist (LMT)
## 20 Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist - Independent Contractor
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 25 Licensed Massage Therapist
## 26 Deep Tissue Massage Therapist
## 27 Licensed Massage Therapist- LUCRATIVE POSITION
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist - Weekends Only
## 31 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 32 Massage Therapist
## 33 Licensed Massage Therapist (LMT) -1 position left - LUCRATIV...
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Massage Therapist - Independent Contractor
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 40 Licensed Massage Therapist
## 41 Deep Tissue Massage Therapist
## 42 Licensed Massage Therapist- LUCRATIVE POSITION
## 43 Licensed Massage Therapist
## 44 Massage Therapist
## 45 Licensed Massage Therapist - Weekends Only
## 46 Licensed Massage Therapist (LMT)
## 47 Massage Therapist
## 48 Massage Therapist - Independent Contractor
## 49 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 50 Licensed Massage Therapist
## 51 Deep Tissue Massage Therapist
## 52 Licensed Massage Therapist- LUCRATIVE POSITION
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Licensed Massage Therapist - Weekends Only
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Massage Therapist - Rental Space
## 59 Goal Oriented Licensed Massage Therapist
## 60 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist
## 65 Massage Therapist - Independent Contractor
## 66 Licensed Massage Therapist- 1 spot left! Lucrative Opportuni...
## 67 Licensed Massage Therapist
## 68 Deep Tissue Massage Therapist
## 69 Licensed Massage Therapist- LUCRATIVE POSITION
## 70 Licensed Massage Therapist
## 71 Massage Therapist
## 72 Licensed Massage Therapist - Weekends Only
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist
## 76 Goal Oriented Licensed Massage Therapist
## 77 Licensed Massage Therapist - Weekends Only, Great Opportunit...
## 78 Licensed Massage Therapist
## 79 Massage Therapist - Rental Space
## HiringAgency
## 1 The Spa at Norton CommonsProspect, KY 40059
## 2 Eagle Freight SolutionsLouisville, KY 40223
## 3 Spa Natur LLCJeffersonville, IN 47130
## 4 Plus Care Chiropractic & Wellness CenterJeffersonville, IN 47130
## 5 Indo-Pak Massage TherapyLouisville, KY•Remote work available
## 6 Elements Massage - Middletown3.6Louisville, KY 40223
## 7 Elements3.6Louisville, KY 40222
## 8 Wellness Clinic4.0Hurstbourne Acres, KY 40220 (Hikes Point area)
## 9 Louisville Family ChiropracticLouisville, KY 40222
## 10 Z Salon & Spa3.6Louisville, KY 40222
## 11 Elements Massage - Middletown3.6Louisville, KY 40223
## 12 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 13 The Radiant TouchShepherdsville, KY 40165
## 14 Wellness Clinic4.0Louisville, KY 40222
## 15 Elements3.6Louisville, KY 40223
## 16 Elements Massage - Middletown3.6Louisville, KY 40223
## 17 Elements3.6Louisville, KY 40222
## 18 Wellness Clinic4.0Hurstbourne Acres, KY 40220 (Hikes Point area)
## 19 Louisville Family ChiropracticLouisville, KY 40222
## 20 Z Salon & Spa3.6Louisville, KY 40222
## 21 Elements Massage - Middletown3.6Louisville, KY 40223
## 22 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 23 The Radiant TouchShepherdsville, KY 40165
## 24 Wellness Clinic4.0Louisville, KY 40222
## 25 Elements3.6Louisville, KY 40223
## 26 Elements3.6Louisville, KY 40222
## 27 Wellness Clinic4.0Louisville, KY 40241
## 28 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 29 Massage Envy3.2Louisville, KY 40207
## 30 Elements3.6Louisville, KY 40223
## 31 Elements Massage - Middletown3.6Louisville, KY 40223
## 32 Elements3.6Louisville, KY 40222
## 33 Wellness Clinic4.0Hurstbourne Acres, KY 40220 (Hikes Point area)
## 34 Louisville Family ChiropracticLouisville, KY 40222
## 35 Z Salon & Spa3.6Louisville, KY 40222
## 36 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 37 Elements Massage - Middletown3.6Louisville, KY 40223
## 38 The Radiant TouchShepherdsville, KY 40165
## 39 Wellness Clinic4.0Louisville, KY 40222
## 40 Elements3.6Louisville, KY 40223
## 41 Elements3.6Louisville, KY 40222
## 42 Wellness Clinic4.0Louisville, KY 40241
## 43 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 44 Massage Envy3.2Louisville, KY 40207
## 45 Elements3.6Louisville, KY 40223
## 46 Louisville Family ChiropracticLouisville, KY 40222
## 47 Z Salon & Spa3.6Louisville, KY 40222
## 48 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 49 Wellness Clinic4.0Louisville, KY 40222
## 50 Elements3.6Louisville, KY 40223
## 51 Elements3.6Louisville, KY 40222
## 52 Wellness Clinic4.0Louisville, KY 40241
## 53 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 54 Massage Envy3.2Louisville, KY 40207
## 55 Elements3.6Louisville, KY 40223
## 56 The Radiant TouchShepherdsville, KY 40165
## 57 Elements Massage - Middletown3.6Louisville, KY 40223
## 58 Eagle Freight SolutionsLouisville, KY 40223
## 59 The Spa at Norton CommonsProspect, KY 40059
## 60 Elements Massage - Middletown3.6Louisville, KY 40223
## 61 Spa Natur LLCJeffersonville, IN 47130
## 62 Plus Care Chiropractic & Wellness CenterJeffersonville, IN 47130
## 63 Louisville Family ChiropracticLouisville, KY 40222
## 64 Z Salon & Spa3.6Louisville, KY 40222
## 65 Flex AppealLouisville, KY 40217 (Schnitzelburg area)
## 66 Wellness Clinic4.0Louisville, KY 40222
## 67 Elements3.6Louisville, KY 40223
## 68 Elements3.6Louisville, KY 40222
## 69 Wellness Clinic4.0Louisville, KY 40241
## 70 Massage Envy3.2Saint Matthews, KY 40207+2 locations
## 71 Massage Envy3.2Louisville, KY 40207
## 72 Elements3.6Louisville, KY 40223
## 73 The Radiant TouchShepherdsville, KY 40165
## 74 Elements Massage - Middletown3.6Louisville, KY 40223
## 75 Plus Care Chiropractic & Wellness CenterJeffersonville, IN 47130
## 76 The Spa at Norton CommonsProspect, KY 40059
## 77 Elements Massage - Middletown3.6Louisville, KY 40223
## 78 Spa Natur LLCJeffersonville, IN 47130
## 79 Eagle Freight SolutionsLouisville, KY 40223
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 25 44 35000 62000
## 2 Just posted 25 44 35000 62000
## 3 26 25 44 35000 62000
## 4 30 25 44 35000 62000
## 5 5 25 44 35000 62000
## 6 30 25 44 35000 62000
## 7 20 25 44 35000 62000
## 8 12 25 44 35000 62000
## 9 30 25 44 35000 62000
## 10 3 25 44 35000 62000
## 11 30 25 44 35000 62000
## 12 30 25 44 35000 62000
## 13 30 25 44 35000 62000
## 14 12 25 44 35000 62000
## 15 30 25 44 35000 62000
## 16 30 25 44 35000 62000
## 17 20 25 44 35000 62000
## 18 12 25 44 35000 62000
## 19 30 25 44 35000 62000
## 20 3 25 44 35000 62000
## 21 30 25 44 35000 62000
## 22 30 25 44 35000 62000
## 23 30 25 44 35000 62000
## 24 12 25 44 35000 62000
## 25 30 25 44 35000 62000
## 26 30 25 44 35000 62000
## 27 12 25 44 35000 62000
## 28 6 25 44 35000 62000
## 29 30 25 44 35000 62000
## 30 30 25 44 35000 62000
## 31 30 25 44 35000 62000
## 32 20 25 44 35000 62000
## 33 12 25 44 35000 62000
## 34 30 25 44 35000 62000
## 35 3 25 44 35000 62000
## 36 30 25 44 35000 62000
## 37 30 25 44 35000 62000
## 38 30 25 44 35000 62000
## 39 12 25 44 35000 62000
## 40 30 25 44 35000 62000
## 41 30 25 44 35000 62000
## 42 12 25 44 35000 62000
## 43 6 25 44 35000 62000
## 44 30 25 44 35000 62000
## 45 30 25 44 35000 62000
## 46 30 25 44 35000 62000
## 47 3 25 44 35000 62000
## 48 30 25 44 35000 62000
## 49 12 25 44 35000 62000
## 50 30 25 44 35000 62000
## 51 30 25 44 35000 62000
## 52 12 25 44 35000 62000
## 53 6 25 44 35000 62000
## 54 30 25 44 35000 62000
## 55 30 25 44 35000 62000
## 56 30 25 44 35000 62000
## 57 30 25 44 35000 62000
## 58 Just posted 25 44 35000 62000
## 59 30 25 44 35000 62000
## 60 30 25 44 35000 62000
## 61 26 25 44 35000 62000
## 62 30 25 44 35000 62000
## 63 30 25 44 35000 62000
## 64 3 25 44 35000 62000
## 65 30 25 44 35000 62000
## 66 12 25 44 35000 62000
## 67 30 25 44 35000 62000
## 68 30 25 44 35000 62000
## 69 12 25 44 35000 62000
## 70 6 25 44 35000 62000
## 71 30 25 44 35000 62000
## 72 30 25 44 35000 62000
## 73 30 25 44 35000 62000
## 74 30 25 44 35000 62000
## 75 30 25 44 35000 62000
## 76 30 25 44 35000 62000
## 77 30 25 44 35000 62000
## 78 26 25 44 35000 62000
## 79 Just posted 25 44 35000 62000
getIndeedJobData5pages("massage therapist","Lexington","KY")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 License Massage Therapist
## 3 Licensed Massage Therapist with SIGNING BONUS
## 4 Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist limited time SIGNING BONUS
## 7 Massage Therapist - Private Listing
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist - FULL TIME
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist
## 13 License Massage Therapist
## 14 Licensed Massage Therapist with SIGNING BONUS
## 15 Massage Therapist
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist limited time SIGNING BONUS
## 18 Massage Therapist - Private Listing
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Massage Therapist - FULL TIME
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist with SIGNING BONUS
## 24 Massage Therapist limited time SIGNING BONUS
## 25 Massage Therapist - Private Listing
## 26 Licensed Massage Therapist
## 27 License Massage Therapist
## 28 Massage Therapist
## 29 Massage Therapist - Independent Contractor
## 30 Licensed Massage Therapist
## 31 Massage Therapist
## 32 Massage Therapist - FULL TIME
## 33 Massage Therapist - Private Listing
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist with SIGNING BONUS
## 36 Massage Therapist limited time SIGNING BONUS
## 37 Massage Therapist - Private Listing
## 38 Licensed Massage Therapist
## 39 License Massage Therapist
## 40 Massage Therapist
## 41 Massage Therapist - Independent Contractor
## 42 Licensed Massage Therapist
## 43 Massage Therapist
## 44 Massage Therapist - FULL TIME
## 45 Massage Therapist - Private Listing
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist
## 48 License Massage Therapist
## 49 Licensed Massage Therapist with SIGNING BONUS
## 50 Massage Therapist
## 51 Massage Therapist - Independent Contractor
## 52 Massage Therapist limited time SIGNING BONUS
## 53 Massage Therapist - Private Listing
## 54 Licensed Massage Therapist
## 55 Massage Therapist
## 56 Massage Therapist - FULL TIME
## 57 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 2 \n$30 - $45 an hour $30 - $45 30.0 45
## 3 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000.0 75000
## 4 \n$30 - $35 an hour $30 - $35 30.0 35
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 6 \n$23 - $40 an hour $23 - $40 23.0 40
## 7 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 8 \n$30 - $45 an hour $30 - $45 30.0 45
## 9 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000.0 75000
## 10 \n$30 - $35 an hour $30 - $35 30.0 35
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 12 \n$23 - $40 an hour $23 - $40 23.0 40
## 13 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000.0 75000
## 14 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 15 \n$30 - $45 an hour $30 - $45 30.0 45
## 16 \n$30 - $35 an hour $30 - $35 30.0 35
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 18 \n$23 - $40 an hour $23 - $40 23.0 40
## 19 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000.0 75000
## 20 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 21 \n$30 - $45 an hour $30 - $45 30.0 45
## 22 \n$30 - $35 an hour $30 - $35 30.0 35
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 24 \n$23 - $40 an hour $23 - $40 23.0 40
## 25 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 26 \n$30 - $45 an hour $30 - $45 30.0 45
## 27 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000.0 75000
## 28 \n$30 - $35 an hour $30 - $35 30.0 35
## 29 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 30 \n$23 - $40 an hour $23 - $40 23.0 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 42.5 7518.417 11025.04 23
## 2 30 42.5 7518.417 11025.04 23
## 3 30 42.5 7518.417 11025.04 23
## 4 30 42.5 7518.417 11025.04 23
## 5 30 42.5 7518.417 11025.04 23
## 6 30 42.5 7518.417 11025.04 23
## 7 30 42.5 7518.417 11025.04 23
## 8 30 42.5 7518.417 11025.04 23
## 9 30 42.5 7518.417 11025.04 23
## 10 30 42.5 7518.417 11025.04 23
## 11 30 42.5 7518.417 11025.04 23
## 12 30 42.5 7518.417 11025.04 23
## 13 30 42.5 7518.417 11025.04 23
## 14 30 42.5 7518.417 11025.04 23
## 15 30 42.5 7518.417 11025.04 23
## 16 30 42.5 7518.417 11025.04 23
## 17 30 42.5 7518.417 11025.04 23
## 18 30 42.5 7518.417 11025.04 23
## 19 30 42.5 7518.417 11025.04 23
## 20 30 42.5 7518.417 11025.04 23
## 21 30 42.5 7518.417 11025.04 23
## 22 30 42.5 7518.417 11025.04 23
## 23 30 42.5 7518.417 11025.04 23
## 24 30 42.5 7518.417 11025.04 23
## 25 30 42.5 7518.417 11025.04 23
## 26 30 42.5 7518.417 11025.04 23
## 27 30 42.5 7518.417 11025.04 23
## 28 30 42.5 7518.417 11025.04 23
## 29 30 42.5 7518.417 11025.04 23
## 30 30 42.5 7518.417 11025.04 23
## maximumMaxSalary
## 1 75000
## 2 75000
## 3 75000
## 4 75000
## 5 75000
## 6 75000
## 7 75000
## 8 75000
## 9 75000
## 10 75000
## 11 75000
## 12 75000
## 13 75000
## 14 75000
## 15 75000
## 16 75000
## 17 75000
## 18 75000
## 19 75000
## 20 75000
## 21 75000
## 22 75000
## 23 75000
## 24 75000
## 25 75000
## 26 75000
## 27 75000
## 28 75000
## 29 75000
## 30 75000
##
## [[3]]
## date_daysAgo
## 1 5
## 2 30
## 3 21
## 4 6
## 5 5
## 6 7
## 7 7
## 8 8
## 9 30
## 10 30
## 11 21
## 12 5
## 13 30
## 14 21
## 15 6
## 16 5
## 17 7
## 18 7
## 19 8
## 20 30
## 21 30
## 22 21
## 23 21
## 24 7
## 25 7
## 26 5
## 27 30
## 28 6
## 29 5
## 30 8
## 31 30
## 32 30
## 33 14
## 34 21
## 35 21
## 36 7
## 37 7
## 38 5
## 39 30
## 40 6
## 41 5
## 42 8
## 43 30
## 44 30
## 45 14
## 46 21
## 47 5
## 48 30
## 49 21
## 50 6
## 51 5
## 52 7
## 53 7
## 54 8
## 55 30
## 56 30
## 57 21
##
## [[4]]
## HiringAgency
## 1 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 2 Massage StrongLexington, KY 40508 (Central Downtown area)
## 3 Hand & Stone - Lexington3.0Lexington, KY 40517
## 4 Sullivan Chiropractic and WellnessLexington, KY 40509
## 5 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 6 Hand and Stone Spa3.0Lexington-Fayette, KY
## 7 Hand and Stone Spa3.0Lexington-Fayette, KY
## 8 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 9 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 10 The Kentucky Castle3.2Versailles, KY 40383
## 11 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 12 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 13 Massage StrongLexington, KY 40508 (Central Downtown area)
## 14 Hand & Stone - Lexington3.0Lexington, KY 40517
## 15 Sullivan Chiropractic and WellnessLexington, KY 40509
## 16 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 17 Hand and Stone Spa3.0Lexington-Fayette, KY
## 18 Hand and Stone Spa3.0Lexington-Fayette, KY
## 19 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 20 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 21 The Kentucky Castle3.2Versailles, KY 40383
## 22 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 23 Hand & Stone - Lexington3.0Lexington, KY 40517
## 24 Hand and Stone Spa3.0Lexington-Fayette, KY
## 25 Hand and Stone Spa3.0Lexington-Fayette, KY
## 26 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 27 Massage StrongLexington, KY 40508 (Central Downtown area)
## 28 Sullivan Chiropractic and WellnessLexington, KY 40509
## 29 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 30 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 31 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 32 The Kentucky Castle3.2Versailles, KY 40383
## 33 Hand & Stone - Lexington3.0Lexington, KY 40517
## 34 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 35 Hand & Stone - Lexington3.0Lexington, KY 40517
## 36 Hand and Stone Spa3.0Lexington-Fayette, KY
## 37 Hand and Stone Spa3.0Lexington-Fayette, KY
## 38 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 39 Massage StrongLexington, KY 40508 (Central Downtown area)
## 40 Sullivan Chiropractic and WellnessLexington, KY 40509
## 41 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 42 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 43 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 44 The Kentucky Castle3.2Versailles, KY 40383
## 45 Hand & Stone - Lexington3.0Lexington, KY 40517
## 46 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 47 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 48 Massage StrongLexington, KY 40508 (Central Downtown area)
## 49 Hand & Stone - Lexington3.0Lexington, KY 40517
## 50 Sullivan Chiropractic and WellnessLexington, KY 40509
## 51 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 52 Hand and Stone Spa3.0Lexington-Fayette, KY
## 53 Hand and Stone Spa3.0Lexington-Fayette, KY
## 54 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 55 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 56 The Kentucky Castle3.2Versailles, KY 40383
## 57 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000 75000
## 9 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000 75000
## 13 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000 75000
## 19 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000 75000
## 27 \n$40,000 - $75,000 a year ++ $40000 - $75000 40000 75000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 40000 75000 40000 75000 40000
## 9 40000 75000 40000 75000 40000
## 13 40000 75000 40000 75000 40000
## 19 40000 75000 40000 75000 40000
## 27 40000 75000 40000 75000 40000
## maximumMaxSalary
## 3 75000
## 9 75000
## 13 75000
## 19 75000
## 27 75000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 2 \n$30 - $45 an hour $30 - $45 30.0 45
## 4 \n$30 - $35 an hour $30 - $35 30.0 35
## 6 \n$23 - $40 an hour $23 - $40 23.0 40
## 7 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 8 \n$30 - $45 an hour $30 - $45 30.0 45
## 10 \n$30 - $35 an hour $30 - $35 30.0 35
## 12 \n$23 - $40 an hour $23 - $40 23.0 40
## 14 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 15 \n$30 - $45 an hour $30 - $45 30.0 45
## 16 \n$30 - $35 an hour $30 - $35 30.0 35
## 18 \n$23 - $40 an hour $23 - $40 23.0 40
## 20 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 21 \n$30 - $45 an hour $30 - $45 30.0 45
## 22 \n$30 - $35 an hour $30 - $35 30.0 35
## 24 \n$23 - $40 an hour $23 - $40 23.0 40
## 25 \n$27.50 - $70.00 an hour $27.50 - $70.00 27.5 70
## 26 \n$30 - $45 an hour $30 - $45 30.0 45
## 28 \n$30 - $35 an hour $30 - $35 30.0 35
## 30 \n$23 - $40 an hour $23 - $40 23.0 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 28.75 42.5 27.625 47.5 23
## 2 28.75 42.5 27.625 47.5 23
## 4 28.75 42.5 27.625 47.5 23
## 6 28.75 42.5 27.625 47.5 23
## 7 28.75 42.5 27.625 47.5 23
## 8 28.75 42.5 27.625 47.5 23
## 10 28.75 42.5 27.625 47.5 23
## 12 28.75 42.5 27.625 47.5 23
## 14 28.75 42.5 27.625 47.5 23
## 15 28.75 42.5 27.625 47.5 23
## 16 28.75 42.5 27.625 47.5 23
## 18 28.75 42.5 27.625 47.5 23
## 20 28.75 42.5 27.625 47.5 23
## 21 28.75 42.5 27.625 47.5 23
## 22 28.75 42.5 27.625 47.5 23
## 24 28.75 42.5 27.625 47.5 23
## 25 28.75 42.5 27.625 47.5 23
## 26 28.75 42.5 27.625 47.5 23
## 28 28.75 42.5 27.625 47.5 23
## 30 28.75 42.5 27.625 47.5 23
## maximumMaxSalary
## 1 70
## 2 70
## 4 70
## 6 70
## 7 70
## 8 70
## 10 70
## 12 70
## 14 70
## 15 70
## 16 70
## 18 70
## 20 70
## 21 70
## 22 70
## 24 70
## 25 70
## 26 70
## 28 70
## 30 70
##
## [[7]]
## city state jobTitle
## 1 Lexington KY Licensed Massage Therapist
## 2 Lexington KY License Massage Therapist
## 3 Lexington KY Licensed Massage Therapist with SIGNING BONUS
## 4 Lexington KY Massage Therapist
## 5 Lexington KY Massage Therapist - Independent Contractor
## 6 Lexington KY Massage Therapist limited time SIGNING BONUS
## 7 Lexington KY Massage Therapist - Private Listing
## 8 Lexington KY Licensed Massage Therapist
## 9 Lexington KY Massage Therapist
## 10 Lexington KY Massage Therapist - FULL TIME
## 11 Lexington KY Licensed Massage Therapist
## 12 Lexington KY Licensed Massage Therapist
## 13 Lexington KY License Massage Therapist
## 14 Lexington KY Licensed Massage Therapist with SIGNING BONUS
## 15 Lexington KY Massage Therapist
## 16 Lexington KY Massage Therapist - Independent Contractor
## 17 Lexington KY Massage Therapist limited time SIGNING BONUS
## 18 Lexington KY Massage Therapist - Private Listing
## 19 Lexington KY Licensed Massage Therapist
## 20 Lexington KY Massage Therapist
## 21 Lexington KY Massage Therapist - FULL TIME
## 22 Lexington KY Licensed Massage Therapist
## 23 Lexington KY Licensed Massage Therapist with SIGNING BONUS
## 24 Lexington KY Massage Therapist limited time SIGNING BONUS
## 25 Lexington KY Massage Therapist - Private Listing
## 26 Lexington KY Licensed Massage Therapist
## 27 Lexington KY License Massage Therapist
## 28 Lexington KY Massage Therapist
## 29 Lexington KY Massage Therapist - Independent Contractor
## 30 Lexington KY Licensed Massage Therapist
## 31 Lexington KY Massage Therapist
## 32 Lexington KY Massage Therapist - FULL TIME
## 33 Lexington KY Massage Therapist - Private Listing
## 34 Lexington KY Licensed Massage Therapist
## 35 Lexington KY Licensed Massage Therapist with SIGNING BONUS
## 36 Lexington KY Massage Therapist limited time SIGNING BONUS
## 37 Lexington KY Massage Therapist - Private Listing
## 38 Lexington KY Licensed Massage Therapist
## 39 Lexington KY License Massage Therapist
## 40 Lexington KY Massage Therapist
## 41 Lexington KY Massage Therapist - Independent Contractor
## 42 Lexington KY Licensed Massage Therapist
## 43 Lexington KY Massage Therapist
## 44 Lexington KY Massage Therapist - FULL TIME
## 45 Lexington KY Massage Therapist - Private Listing
## 46 Lexington KY Licensed Massage Therapist
## 47 Lexington KY Licensed Massage Therapist
## 48 Lexington KY License Massage Therapist
## 49 Lexington KY Licensed Massage Therapist with SIGNING BONUS
## 50 Lexington KY Massage Therapist
## 51 Lexington KY Massage Therapist - Independent Contractor
## 52 Lexington KY Massage Therapist limited time SIGNING BONUS
## 53 Lexington KY Massage Therapist - Private Listing
## 54 Lexington KY Licensed Massage Therapist
## 55 Lexington KY Massage Therapist
## 56 Lexington KY Massage Therapist - FULL TIME
## 57 Lexington KY Licensed Massage Therapist
## HiringAgency
## 1 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 2 Massage StrongLexington, KY 40508 (Central Downtown area)
## 3 Hand & Stone - Lexington3.0Lexington, KY 40517
## 4 Sullivan Chiropractic and WellnessLexington, KY 40509
## 5 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 6 Hand and Stone Spa3.0Lexington-Fayette, KY
## 7 Hand and Stone Spa3.0Lexington-Fayette, KY
## 8 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 9 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 10 The Kentucky Castle3.2Versailles, KY 40383
## 11 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 12 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 13 Massage StrongLexington, KY 40508 (Central Downtown area)
## 14 Hand & Stone - Lexington3.0Lexington, KY 40517
## 15 Sullivan Chiropractic and WellnessLexington, KY 40509
## 16 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 17 Hand and Stone Spa3.0Lexington-Fayette, KY
## 18 Hand and Stone Spa3.0Lexington-Fayette, KY
## 19 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 20 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 21 The Kentucky Castle3.2Versailles, KY 40383
## 22 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 23 Hand & Stone - Lexington3.0Lexington, KY 40517
## 24 Hand and Stone Spa3.0Lexington-Fayette, KY
## 25 Hand and Stone Spa3.0Lexington-Fayette, KY
## 26 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 27 Massage StrongLexington, KY 40508 (Central Downtown area)
## 28 Sullivan Chiropractic and WellnessLexington, KY 40509
## 29 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 30 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 31 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 32 The Kentucky Castle3.2Versailles, KY 40383
## 33 Hand & Stone - Lexington3.0Lexington, KY 40517
## 34 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 35 Hand & Stone - Lexington3.0Lexington, KY 40517
## 36 Hand and Stone Spa3.0Lexington-Fayette, KY
## 37 Hand and Stone Spa3.0Lexington-Fayette, KY
## 38 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 39 Massage StrongLexington, KY 40508 (Central Downtown area)
## 40 Sullivan Chiropractic and WellnessLexington, KY 40509
## 41 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 42 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 43 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 44 The Kentucky Castle3.2Versailles, KY 40383
## 45 Hand & Stone - Lexington3.0Lexington, KY 40517
## 46 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## 47 Elswick Chiropractic & Associates PSCLexington, KY 40517
## 48 Massage StrongLexington, KY 40508 (Central Downtown area)
## 49 Hand & Stone - Lexington3.0Lexington, KY 40517
## 50 Sullivan Chiropractic and WellnessLexington, KY 40509
## 51 Indo-Pak Massage TherapyLexington, KY•Remote work available
## 52 Hand and Stone Spa3.0Lexington-Fayette, KY
## 53 Hand and Stone Spa3.0Lexington-Fayette, KY
## 54 The Massage CenterLexington, KY 40508 (Central Downtown area)
## 55 Massage Envy3.2Lexington, KY 40503 (Indian Hills-Stonewall Estates-Monticello area)
## 56 The Kentucky Castle3.2Versailles, KY 40383
## 57 The Woodhouse Day Spa - NKYLexington, KY 40503 (Southland-Deerfield-Open Gates area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 5 23 70 40000 75000
## 2 30 23 70 40000 75000
## 3 21 23 70 40000 75000
## 4 6 23 70 40000 75000
## 5 5 23 70 40000 75000
## 6 7 23 70 40000 75000
## 7 7 23 70 40000 75000
## 8 8 23 70 40000 75000
## 9 30 23 70 40000 75000
## 10 30 23 70 40000 75000
## 11 21 23 70 40000 75000
## 12 5 23 70 40000 75000
## 13 30 23 70 40000 75000
## 14 21 23 70 40000 75000
## 15 6 23 70 40000 75000
## 16 5 23 70 40000 75000
## 17 7 23 70 40000 75000
## 18 7 23 70 40000 75000
## 19 8 23 70 40000 75000
## 20 30 23 70 40000 75000
## 21 30 23 70 40000 75000
## 22 21 23 70 40000 75000
## 23 21 23 70 40000 75000
## 24 7 23 70 40000 75000
## 25 7 23 70 40000 75000
## 26 5 23 70 40000 75000
## 27 30 23 70 40000 75000
## 28 6 23 70 40000 75000
## 29 5 23 70 40000 75000
## 30 8 23 70 40000 75000
## 31 30 23 70 40000 75000
## 32 30 23 70 40000 75000
## 33 14 23 70 40000 75000
## 34 21 23 70 40000 75000
## 35 21 23 70 40000 75000
## 36 7 23 70 40000 75000
## 37 7 23 70 40000 75000
## 38 5 23 70 40000 75000
## 39 30 23 70 40000 75000
## 40 6 23 70 40000 75000
## 41 5 23 70 40000 75000
## 42 8 23 70 40000 75000
## 43 30 23 70 40000 75000
## 44 30 23 70 40000 75000
## 45 14 23 70 40000 75000
## 46 21 23 70 40000 75000
## 47 5 23 70 40000 75000
## 48 30 23 70 40000 75000
## 49 21 23 70 40000 75000
## 50 6 23 70 40000 75000
## 51 5 23 70 40000 75000
## 52 7 23 70 40000 75000
## 53 7 23 70 40000 75000
## 54 8 23 70 40000 75000
## 55 30 23 70 40000 75000
## 56 30 23 70 40000 75000
## 57 21 23 70 40000 75000
getIndeedJobData5pages("massage therapist","Bowling Green","KY")
## Warning in getIndeedJobData5pages("massage therapist", "Bowling Green", : NAs
## introduced by coercion
## Warning in max(annual$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Bowling Green", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist - Sign On Bonus Available
## 2 Licensed Massage Therapist - Sign On Bonus Available
## 3 Licensed Massage Therapist - Sign On Bonus Available
## 4 Licensed Massage Therapist - Sign On Bonus Available
## 5 Licensed Massage Therapist - Sign On Bonus Available
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \nUp to $45,000 a year $45000 45000 NA 45000
## 2 \nUp to $45,000 a year $45000 45000 NA 45000
## 3 \nUp to $45,000 a year $45000 45000 NA 45000
## 4 \nUp to $45,000 a year $45000 45000 NA 45000
## 5 \nUp to $45,000 a year $45000 45000 NA 45000
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45000 45000 45000 45000 45000
## 2 45000 45000 45000 45000 45000
## 3 45000 45000 45000 45000 45000
## 4 45000 45000 45000 45000 45000
## 5 45000 45000 45000 45000 45000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 30
## 4 30
## 5 30
##
## [[4]]
## HiringAgency
## 1 Massage Envy HendersonvilleHendersonville, TN 37075
## 2 Massage Envy HendersonvilleHendersonville, TN 37075
## 3 Massage Envy HendersonvilleHendersonville, TN 37075
## 4 Massage Envy HendersonvilleHendersonville, TN 37075
## 5 Massage Envy HendersonvilleHendersonville, TN 37075
##
## [[5]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \nUp to $45,000 a year $45000 45000 NA 45000
## 2 \nUp to $45,000 a year $45000 45000 NA 45000
## 3 \nUp to $45,000 a year $45000 45000 NA 45000
## 4 \nUp to $45,000 a year $45000 45000 NA 45000
## 5 \nUp to $45,000 a year $45000 45000 NA 45000
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 NA 45000 NaN 45000 -Inf
## 2 NA 45000 NaN 45000 -Inf
## 3 NA 45000 NaN 45000 -Inf
## 4 NA 45000 NaN 45000 -Inf
## 5 NA 45000 NaN 45000 -Inf
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Bowling Green KY Licensed Massage Therapist - Sign On Bonus Available
## 2 Bowling Green KY Licensed Massage Therapist - Sign On Bonus Available
## 3 Bowling Green KY Licensed Massage Therapist - Sign On Bonus Available
## 4 Bowling Green KY Licensed Massage Therapist - Sign On Bonus Available
## 5 Bowling Green KY Licensed Massage Therapist - Sign On Bonus Available
## HiringAgency date_daysAgo
## 1 Massage Envy HendersonvilleHendersonville, TN 37075 30
## 2 Massage Envy HendersonvilleHendersonville, TN 37075 30
## 3 Massage Envy HendersonvilleHendersonville, TN 37075 30
## 4 Massage Envy HendersonvilleHendersonville, TN 37075 30
## 5 Massage Envy HendersonvilleHendersonville, TN 37075 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA 45000 45000
## 2 NA NA 45000 45000
## 3 NA NA 45000 45000
## 4 NA NA 45000 45000
## 5 NA NA 45000 45000
Louisiana New Orleans, Baton Rouge, Shreveport
getIndeedJobData5pages("massage therapist","New Orleans","LA")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Dedicated Massage Therapist
## 3 Massage Therapist - Independent Contractor
## 4 Licensed Massage Therapist
## 5 Spa Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 Massage Therapist Full Time
## 8 Massage Therapist Full-Time
## 9 Licensed Massage Therapist
## 10 Massage Therapist Part-Time
## 11 Licensed Massage Therapist
## 12 Dedicated Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Licensed Massage Therapist
## 15 Spa Massage Therapist
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist Full Time
## 18 Massage Therapist Full-Time
## 19 Licensed Massage Therapist
## 20 Massage Therapist Part-Time
## 21 Licensed Massage Therapist
## 22 Dedicated Massage Therapist
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist
## 25 Spa Massage Therapist
## 26 Massage Therapist - Independent Contractor
## 27 Massage Therapist Full Time
## 28 Massage Therapist Full-Time
## 29 Licensed Massage Therapist
## 30 Massage Therapist Part-Time
## 31 Licensed Massage Therapist
## 32 Dedicated Massage Therapist
## 33 Massage Therapist - Independent Contractor
## 34 Licensed Massage Therapist
## 35 Spa Massage Therapist
## 36 Massage Therapist - Independent Contractor
## 37 Massage Therapist Full Time
## 38 Massage Therapist Full-Time
## 39 Licensed Massage Therapist
## 40 Massage Therapist Part-Time
## 41 Licensed Massage Therapist
## 42 Dedicated Massage Therapist
## 43 Massage Therapist - Independent Contractor
## 44 Licensed Massage Therapist
## 45 Spa Massage Therapist
## 46 Massage Therapist - Independent Contractor
## 47 Massage Therapist Full Time
## 48 Massage Therapist Full-Time
## 49 Licensed Massage Therapist
## 50 Massage Therapist Part-Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25 - $30 an hour $25 - $30 25 30
## 2 \n$40 - $60 an hour $40 - $60 40 60
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$25 - $30 an hour $25 - $30 25 30
## 5 \n$25 - $30 an hour $25 - $30 25 30
## 6 \n$40 - $60 an hour $40 - $60 40 60
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$25 - $30 an hour $25 - $30 25 30
## 9 \n$25 - $30 an hour $25 - $30 25 30
## 10 \n$40 - $60 an hour $40 - $60 40 60
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$25 - $30 an hour $25 - $30 25 30
## 13 \n$25 - $30 an hour $25 - $30 25 30
## 14 \n$40 - $60 an hour $40 - $60 40 60
## 15 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 16 \n$25 - $30 an hour $25 - $30 25 30
## 17 \n$25 - $30 an hour $25 - $30 25 30
## 18 \n$40 - $60 an hour $40 - $60 40 60
## 19 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 20 \n$25 - $30 an hour $25 - $30 25 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 32.5 35 1272.5 2151.25 25
## 2 32.5 35 1272.5 2151.25 25
## 3 32.5 35 1272.5 2151.25 25
## 4 32.5 35 1272.5 2151.25 25
## 5 32.5 35 1272.5 2151.25 25
## 6 32.5 35 1272.5 2151.25 25
## 7 32.5 35 1272.5 2151.25 25
## 8 32.5 35 1272.5 2151.25 25
## 9 32.5 35 1272.5 2151.25 25
## 10 32.5 35 1272.5 2151.25 25
## 11 32.5 35 1272.5 2151.25 25
## 12 32.5 35 1272.5 2151.25 25
## 13 32.5 35 1272.5 2151.25 25
## 14 32.5 35 1272.5 2151.25 25
## 15 32.5 35 1272.5 2151.25 25
## 16 32.5 35 1272.5 2151.25 25
## 17 32.5 35 1272.5 2151.25 25
## 18 32.5 35 1272.5 2151.25 25
## 19 32.5 35 1272.5 2151.25 25
## 20 32.5 35 1272.5 2151.25 25
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
##
## [[3]]
## date_daysAgo
## 1 27
## 2 10
## 3 17
## 4 11
## 5 3
## 6 30
## 7 4
## 8 4
## 9 30
## 10 4
## 11 27
## 12 10
## 13 17
## 14 11
## 15 3
## 16 30
## 17 4
## 18 4
## 19 30
## 20 4
## 21 27
## 22 10
## 23 17
## 24 11
## 25 3
## 26 30
## 27 4
## 28 4
## 29 30
## 30 4
## 31 27
## 32 10
## 33 17
## 34 11
## 35 3
## 36 30
## 37 4
## 38 4
## 39 30
## 40 4
## 41 27
## 42 10
## 43 17
## 44 11
## 45 3
## 46 30
## 47 4
## 48 4
## 49 30
## 50 4
##
## [[4]]
## HiringAgency
## 1 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 2 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 3 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 4 Louisiana Chiropractic CenterMetairie, LA 70001
## 5 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 6 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 7 Massage Envy3.2Metairie, LA 70002+1 location
## 8 Massage Envy3.2Harahan, LA 70123+1 location
## 9 Woodhouse Day SpaMetairie, LA 70006
## 10 Massage Envy3.2Metairie, LA 70002+1 location
## 11 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 12 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 13 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 14 Louisiana Chiropractic CenterMetairie, LA 70001
## 15 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 16 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 17 Massage Envy3.2Metairie, LA 70002+1 location
## 18 Massage Envy3.2Harahan, LA 70123+1 location
## 19 Woodhouse Day SpaMetairie, LA 70006
## 20 Massage Envy3.2Metairie, LA 70002+1 location
## 21 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 22 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 23 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 24 Louisiana Chiropractic CenterMetairie, LA 70001
## 25 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 26 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 27 Massage Envy3.2Metairie, LA 70002+1 location
## 28 Massage Envy3.2Harahan, LA 70123+1 location
## 29 Woodhouse Day SpaMetairie, LA 70006
## 30 Massage Envy3.2Metairie, LA 70002+1 location
## 31 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 32 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 33 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 34 Louisiana Chiropractic CenterMetairie, LA 70001
## 35 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 36 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 37 Massage Envy3.2Metairie, LA 70002+1 location
## 38 Massage Envy3.2Harahan, LA 70123+1 location
## 39 Woodhouse Day SpaMetairie, LA 70006
## 40 Massage Envy3.2Metairie, LA 70002+1 location
## 41 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 42 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 43 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 44 Louisiana Chiropractic CenterMetairie, LA 70001
## 45 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 46 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 47 Massage Envy3.2Metairie, LA 70002+1 location
## 48 Massage Envy3.2Harahan, LA 70123+1 location
## 49 Woodhouse Day SpaMetairie, LA 70006
## 50 Massage Envy3.2Metairie, LA 70002+1 location
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$25 - $30 an hour $25 - $30 25 30 25
## 2 \n$40 - $60 an hour $40 - $60 40 60 25
## 4 \n$25 - $30 an hour $25 - $30 25 30 25
## 5 \n$25 - $30 an hour $25 - $30 25 30 25
## 6 \n$40 - $60 an hour $40 - $60 40 60 25
## 8 \n$25 - $30 an hour $25 - $30 25 30 25
## 9 \n$25 - $30 an hour $25 - $30 25 30 25
## 10 \n$40 - $60 an hour $40 - $60 40 60 25
## 12 \n$25 - $30 an hour $25 - $30 25 30 25
## 13 \n$25 - $30 an hour $25 - $30 25 30 25
## 14 \n$40 - $60 an hour $40 - $60 40 60 25
## 16 \n$25 - $30 an hour $25 - $30 25 30 25
## 17 \n$25 - $30 an hour $25 - $30 25 30 25
## 18 \n$40 - $60 an hour $40 - $60 40 60 25
## 20 \n$25 - $30 an hour $25 - $30 25 30 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 30 40 25 60
## 2 30 30 40 25 60
## 4 30 30 40 25 60
## 5 30 30 40 25 60
## 6 30 30 40 25 60
## 8 30 30 40 25 60
## 9 30 30 40 25 60
## 10 30 30 40 25 60
## 12 30 30 40 25 60
## 13 30 30 40 25 60
## 14 30 30 40 25 60
## 16 30 30 40 25 60
## 17 30 30 40 25 60
## 18 30 30 40 25 60
## 20 30 30 40 25 60
##
## [[7]]
## city state jobTitle
## 1 New Orleans LA Licensed Massage Therapist
## 2 New Orleans LA Dedicated Massage Therapist
## 3 New Orleans LA Massage Therapist - Independent Contractor
## 4 New Orleans LA Licensed Massage Therapist
## 5 New Orleans LA Spa Massage Therapist
## 6 New Orleans LA Massage Therapist - Independent Contractor
## 7 New Orleans LA Massage Therapist Full Time
## 8 New Orleans LA Massage Therapist Full-Time
## 9 New Orleans LA Licensed Massage Therapist
## 10 New Orleans LA Massage Therapist Part-Time
## 11 New Orleans LA Licensed Massage Therapist
## 12 New Orleans LA Dedicated Massage Therapist
## 13 New Orleans LA Massage Therapist - Independent Contractor
## 14 New Orleans LA Licensed Massage Therapist
## 15 New Orleans LA Spa Massage Therapist
## 16 New Orleans LA Massage Therapist - Independent Contractor
## 17 New Orleans LA Massage Therapist Full Time
## 18 New Orleans LA Massage Therapist Full-Time
## 19 New Orleans LA Licensed Massage Therapist
## 20 New Orleans LA Massage Therapist Part-Time
## 21 New Orleans LA Licensed Massage Therapist
## 22 New Orleans LA Dedicated Massage Therapist
## 23 New Orleans LA Massage Therapist - Independent Contractor
## 24 New Orleans LA Licensed Massage Therapist
## 25 New Orleans LA Spa Massage Therapist
## 26 New Orleans LA Massage Therapist - Independent Contractor
## 27 New Orleans LA Massage Therapist Full Time
## 28 New Orleans LA Massage Therapist Full-Time
## 29 New Orleans LA Licensed Massage Therapist
## 30 New Orleans LA Massage Therapist Part-Time
## 31 New Orleans LA Licensed Massage Therapist
## 32 New Orleans LA Dedicated Massage Therapist
## 33 New Orleans LA Massage Therapist - Independent Contractor
## 34 New Orleans LA Licensed Massage Therapist
## 35 New Orleans LA Spa Massage Therapist
## 36 New Orleans LA Massage Therapist - Independent Contractor
## 37 New Orleans LA Massage Therapist Full Time
## 38 New Orleans LA Massage Therapist Full-Time
## 39 New Orleans LA Licensed Massage Therapist
## 40 New Orleans LA Massage Therapist Part-Time
## 41 New Orleans LA Licensed Massage Therapist
## 42 New Orleans LA Dedicated Massage Therapist
## 43 New Orleans LA Massage Therapist - Independent Contractor
## 44 New Orleans LA Licensed Massage Therapist
## 45 New Orleans LA Spa Massage Therapist
## 46 New Orleans LA Massage Therapist - Independent Contractor
## 47 New Orleans LA Massage Therapist Full Time
## 48 New Orleans LA Massage Therapist Full-Time
## 49 New Orleans LA Licensed Massage Therapist
## 50 New Orleans LA Massage Therapist Part-Time
## HiringAgency
## 1 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 2 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 3 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 4 Louisiana Chiropractic CenterMetairie, LA 70001
## 5 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 6 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 7 Massage Envy3.2Metairie, LA 70002+1 location
## 8 Massage Envy3.2Harahan, LA 70123+1 location
## 9 Woodhouse Day SpaMetairie, LA 70006
## 10 Massage Envy3.2Metairie, LA 70002+1 location
## 11 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 12 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 13 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 14 Louisiana Chiropractic CenterMetairie, LA 70001
## 15 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 16 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 17 Massage Envy3.2Metairie, LA 70002+1 location
## 18 Massage Envy3.2Harahan, LA 70123+1 location
## 19 Woodhouse Day SpaMetairie, LA 70006
## 20 Massage Envy3.2Metairie, LA 70002+1 location
## 21 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 22 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 23 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 24 Louisiana Chiropractic CenterMetairie, LA 70001
## 25 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 26 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 27 Massage Envy3.2Metairie, LA 70002+1 location
## 28 Massage Envy3.2Harahan, LA 70123+1 location
## 29 Woodhouse Day SpaMetairie, LA 70006
## 30 Massage Envy3.2Metairie, LA 70002+1 location
## 31 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 32 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 33 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 34 Louisiana Chiropractic CenterMetairie, LA 70001
## 35 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 36 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 37 Massage Envy3.2Metairie, LA 70002+1 location
## 38 Massage Envy3.2Harahan, LA 70123+1 location
## 39 Woodhouse Day SpaMetairie, LA 70006
## 40 Massage Envy3.2Metairie, LA 70002+1 location
## 41 Uptown PMRNew Orleans, LA 70118 (Leonidas area)
## 42 Nola Bliss MassageNew Orleans, LA (Central Business District area)
## 43 Indo-Pak Massage TherapyNew Orleans, LA•Remote work available
## 44 Louisiana Chiropractic CenterMetairie, LA 70001
## 45 Windsor Court2.9New Orleans, LA 70130 (Central Business District area)
## 46 Spa Savoir FaireNew Orleans, LA 70115 (Freret area)
## 47 Massage Envy3.2Metairie, LA 70002+1 location
## 48 Massage Envy3.2Harahan, LA 70123+1 location
## 49 Woodhouse Day SpaMetairie, LA 70006
## 50 Massage Envy3.2Metairie, LA 70002+1 location
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 27 25 60 NA NA
## 2 10 25 60 NA NA
## 3 17 25 60 NA NA
## 4 11 25 60 NA NA
## 5 3 25 60 NA NA
## 6 30 25 60 NA NA
## 7 4 25 60 NA NA
## 8 4 25 60 NA NA
## 9 30 25 60 NA NA
## 10 4 25 60 NA NA
## 11 27 25 60 NA NA
## 12 10 25 60 NA NA
## 13 17 25 60 NA NA
## 14 11 25 60 NA NA
## 15 3 25 60 NA NA
## 16 30 25 60 NA NA
## 17 4 25 60 NA NA
## 18 4 25 60 NA NA
## 19 30 25 60 NA NA
## 20 4 25 60 NA NA
## 21 27 25 60 NA NA
## 22 10 25 60 NA NA
## 23 17 25 60 NA NA
## 24 11 25 60 NA NA
## 25 3 25 60 NA NA
## 26 30 25 60 NA NA
## 27 4 25 60 NA NA
## 28 4 25 60 NA NA
## 29 30 25 60 NA NA
## 30 4 25 60 NA NA
## 31 27 25 60 NA NA
## 32 10 25 60 NA NA
## 33 17 25 60 NA NA
## 34 11 25 60 NA NA
## 35 3 25 60 NA NA
## 36 30 25 60 NA NA
## 37 4 25 60 NA NA
## 38 4 25 60 NA NA
## 39 30 25 60 NA NA
## 40 4 25 60 NA NA
## 41 27 25 60 NA NA
## 42 10 25 60 NA NA
## 43 17 25 60 NA NA
## 44 11 25 60 NA NA
## 45 3 25 60 NA NA
## 46 30 25 60 NA NA
## 47 4 25 60 NA NA
## 48 4 25 60 NA NA
## 49 30 25 60 NA NA
## 50 4 25 60 NA NA
getIndeedJobData5pages("massage therapist","Baton Rouge","LA")
## Warning in getIndeedJobData5pages("massage therapist", "Baton Rouge", "LA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Baton Rouge", "LA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist- Baton Rouge
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist (LMT)
## 6 Massage Therapist- Baton Rouge
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist- Baton Rouge
## 16 Massage Therapist- Baton Rouge
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist- Baton Rouge
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist
## 25 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$18 - $20 an hour $18 - $20 18 20 17
## 2 \n$15 an hour $15 15 NA 17
## 3 \n$16 - $20 an hour $16 - $20 16 20 17
## 4 \n$17 an hour $17 17 NA 17
## 5 \n$20 - $35 an hour $20 - $35 20 35 17
## 6 \n$18 - $20 an hour $18 - $20 18 20 17
## 7 \n$15 an hour $15 15 NA 17
## 8 \n$16 - $20 an hour $16 - $20 16 20 17
## 9 \n$17 an hour $17 17 NA 17
## 10 \n$20 - $35 an hour $20 - $35 20 35 17
## 11 \n$15 an hour $15 15 NA 17
## 12 \n$16 - $20 an hour $16 - $20 16 20 17
## 13 \n$17 an hour $17 17 NA 17
## 14 \n$20 - $35 an hour $20 - $35 20 35 17
## 15 \n$18 - $20 an hour $18 - $20 18 20 17
## 16 \n$18 - $20 an hour $18 - $20 18 20 17
## 17 \n$15 an hour $15 15 NA 17
## 18 \n$16 - $20 an hour $16 - $20 16 20 17
## 19 \n$17 an hour $17 17 NA 17
## 20 \n$20 - $35 an hour $20 - $35 20 35 17
## 21 \n$18 - $20 an hour $18 - $20 18 20 17
## 22 \n$15 an hour $15 15 NA 17
## 23 \n$16 - $20 an hour $16 - $20 16 20 17
## 24 \n$17 an hour $17 17 NA 17
## 25 \n$20 - $35 an hour $20 - $35 20 35 17
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 19 17.2 20.125 15 35
## 2 19 17.2 20.125 15 35
## 3 19 17.2 20.125 15 35
## 4 19 17.2 20.125 15 35
## 5 19 17.2 20.125 15 35
## 6 19 17.2 20.125 15 35
## 7 19 17.2 20.125 15 35
## 8 19 17.2 20.125 15 35
## 9 19 17.2 20.125 15 35
## 10 19 17.2 20.125 15 35
## 11 19 17.2 20.125 15 35
## 12 19 17.2 20.125 15 35
## 13 19 17.2 20.125 15 35
## 14 19 17.2 20.125 15 35
## 15 19 17.2 20.125 15 35
## 16 19 17.2 20.125 15 35
## 17 19 17.2 20.125 15 35
## 18 19 17.2 20.125 15 35
## 19 19 17.2 20.125 15 35
## 20 19 17.2 20.125 15 35
## 21 19 17.2 20.125 15 35
## 22 19 17.2 20.125 15 35
## 23 19 17.2 20.125 15 35
## 24 19 17.2 20.125 15 35
## 25 19 17.2 20.125 15 35
##
## [[3]]
## date_daysAgo
## 1 6
## 2 6
## 3 11
## 4 30
## 5 29
## 6 6
## 7 6
## 8 11
## 9 30
## 10 29
## 11 6
## 12 11
## 13 30
## 14 29
## 15 6
## 16 6
## 17 6
## 18 11
## 19 30
## 20 29
## 21 6
## 22 6
## 23 11
## 24 30
## 25 29
##
## [[4]]
## HiringAgency
## 1 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 2 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 3 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 4 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 5 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 6 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 7 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 8 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 9 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 10 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 11 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 12 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 13 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 14 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 15 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 16 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 17 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 18 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 19 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 20 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 21 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 22 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 23 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 24 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 25 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$18 - $20 an hour $18 - $20 18 20 17
## 2 \n$15 an hour $15 15 NA 17
## 3 \n$16 - $20 an hour $16 - $20 16 20 17
## 4 \n$17 an hour $17 17 NA 17
## 5 \n$20 - $35 an hour $20 - $35 20 35 17
## 6 \n$18 - $20 an hour $18 - $20 18 20 17
## 7 \n$15 an hour $15 15 NA 17
## 8 \n$16 - $20 an hour $16 - $20 16 20 17
## 9 \n$17 an hour $17 17 NA 17
## 10 \n$20 - $35 an hour $20 - $35 20 35 17
## 11 \n$15 an hour $15 15 NA 17
## 12 \n$16 - $20 an hour $16 - $20 16 20 17
## 13 \n$17 an hour $17 17 NA 17
## 14 \n$20 - $35 an hour $20 - $35 20 35 17
## 15 \n$18 - $20 an hour $18 - $20 18 20 17
## 16 \n$18 - $20 an hour $18 - $20 18 20 17
## 17 \n$15 an hour $15 15 NA 17
## 18 \n$16 - $20 an hour $16 - $20 16 20 17
## 19 \n$17 an hour $17 17 NA 17
## 20 \n$20 - $35 an hour $20 - $35 20 35 17
## 21 \n$18 - $20 an hour $18 - $20 18 20 17
## 22 \n$15 an hour $15 15 NA 17
## 23 \n$16 - $20 an hour $16 - $20 16 20 17
## 24 \n$17 an hour $17 17 NA 17
## 25 \n$20 - $35 an hour $20 - $35 20 35 17
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 20 17.2 25 15 35
## 2 20 17.2 25 15 35
## 3 20 17.2 25 15 35
## 4 20 17.2 25 15 35
## 5 20 17.2 25 15 35
## 6 20 17.2 25 15 35
## 7 20 17.2 25 15 35
## 8 20 17.2 25 15 35
## 9 20 17.2 25 15 35
## 10 20 17.2 25 15 35
## 11 20 17.2 25 15 35
## 12 20 17.2 25 15 35
## 13 20 17.2 25 15 35
## 14 20 17.2 25 15 35
## 15 20 17.2 25 15 35
## 16 20 17.2 25 15 35
## 17 20 17.2 25 15 35
## 18 20 17.2 25 15 35
## 19 20 17.2 25 15 35
## 20 20 17.2 25 15 35
## 21 20 17.2 25 15 35
## 22 20 17.2 25 15 35
## 23 20 17.2 25 15 35
## 24 20 17.2 25 15 35
## 25 20 17.2 25 15 35
##
## [[7]]
## city state jobTitle
## 1 Baton Rouge LA Massage Therapist- Baton Rouge
## 2 Baton Rouge LA Licensed Massage Therapist
## 3 Baton Rouge LA Licensed Massage Therapist
## 4 Baton Rouge LA Massage Therapist
## 5 Baton Rouge LA Licensed Massage Therapist (LMT)
## 6 Baton Rouge LA Massage Therapist- Baton Rouge
## 7 Baton Rouge LA Licensed Massage Therapist
## 8 Baton Rouge LA Licensed Massage Therapist
## 9 Baton Rouge LA Massage Therapist
## 10 Baton Rouge LA Licensed Massage Therapist (LMT)
## 11 Baton Rouge LA Licensed Massage Therapist
## 12 Baton Rouge LA Licensed Massage Therapist
## 13 Baton Rouge LA Massage Therapist
## 14 Baton Rouge LA Licensed Massage Therapist (LMT)
## 15 Baton Rouge LA Massage Therapist- Baton Rouge
## 16 Baton Rouge LA Massage Therapist- Baton Rouge
## 17 Baton Rouge LA Licensed Massage Therapist
## 18 Baton Rouge LA Licensed Massage Therapist
## 19 Baton Rouge LA Massage Therapist
## 20 Baton Rouge LA Licensed Massage Therapist (LMT)
## 21 Baton Rouge LA Massage Therapist- Baton Rouge
## 22 Baton Rouge LA Licensed Massage Therapist
## 23 Baton Rouge LA Licensed Massage Therapist
## 24 Baton Rouge LA Massage Therapist
## 25 Baton Rouge LA Licensed Massage Therapist (LMT)
## HiringAgency
## 1 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 2 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 3 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 4 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 5 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 6 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 7 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 8 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 9 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 10 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 11 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 12 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 13 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 14 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 15 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 16 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 17 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 18 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 19 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 20 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## 21 The Woodhouse Day Spa3.3Baton Rouge, LA 70836 (Inniswold area)
## 22 Ozark Chiropractic Clinic4.5Baton Rouge, LA 70806 (Goodwood Homesites area)
## 23 Massage Envy Bluebonnet3.2Baton Rouge, LA 70810 (Mayfair area)
## 24 Massage Envy3.2Baton Rouge, LA 70808 (Bocage area)
## 25 The Retreat SpaBaton Rouge, LA 70810 (Highland-Perkins area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 15 35 NA NA
## 2 6 15 35 NA NA
## 3 11 15 35 NA NA
## 4 30 15 35 NA NA
## 5 29 15 35 NA NA
## 6 6 15 35 NA NA
## 7 6 15 35 NA NA
## 8 11 15 35 NA NA
## 9 30 15 35 NA NA
## 10 29 15 35 NA NA
## 11 6 15 35 NA NA
## 12 11 15 35 NA NA
## 13 30 15 35 NA NA
## 14 29 15 35 NA NA
## 15 6 15 35 NA NA
## 16 6 15 35 NA NA
## 17 6 15 35 NA NA
## 18 11 15 35 NA NA
## 19 30 15 35 NA NA
## 20 29 15 35 NA NA
## 21 6 15 35 NA NA
## 22 6 15 35 NA NA
## 23 11 15 35 NA NA
## 24 30 15 35 NA NA
## 25 29 15 35 NA NA
getIndeedJobData5pages("massage therapist","Shreveport","LA")
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Spa Massage Therapist
## 3 Massage Therapist Full-Time
## 4 Licensed Massage Therapist
## 5 Massage Therapist Part-Time
## 6 Massage Therapist - Independent Contractor
## 7 Spa Massage Therapist
## 8 Massage Therapist Full-Time
## 9 Licensed Massage Therapist
## 10 Massage Therapist Part-Time
## 11 Massage Therapist - Independent Contractor
## 12 Spa Massage Therapist
## 13 Massage Therapist Full-Time
## 14 Licensed Massage Therapist
## 15 Massage Therapist Part-Time
## 16 Massage Therapist - Independent Contractor
## 17 Spa Massage Therapist
## 18 Massage Therapist Full-Time
## 19 Licensed Massage Therapist
## 20 Massage Therapist Part-Time
## 21 Massage Therapist - Independent Contractor
## 22 Spa Massage Therapist
## 23 Massage Therapist Full-Time
## 24 Licensed Massage Therapist
## 25 Massage Therapist Part-Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$40 - $45 an hour $40 - $45 40 45
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$40 - $45 an hour $40 - $45 40 45
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$40 - $45 an hour $40 - $45 40 45
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$40 - $45 an hour $40 - $45 40 45
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$40 - $45 an hour $40 - $45 40 45
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 2520 2522.5 2520 4271.25 40
## 2 2520 2522.5 2520 4271.25 40
## 3 2520 2522.5 2520 4271.25 40
## 4 2520 2522.5 2520 4271.25 40
## 5 2520 2522.5 2520 4271.25 40
## 6 2520 2522.5 2520 4271.25 40
## 7 2520 2522.5 2520 4271.25 40
## 8 2520 2522.5 2520 4271.25 40
## 9 2520 2522.5 2520 4271.25 40
## 10 2520 2522.5 2520 4271.25 40
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
##
## [[3]]
## date_daysAgo
## 1 10
## 2 30
## 3 4
## 4 21
## 5 4
## 6 10
## 7 30
## 8 4
## 9 21
## 10 4
## 11 10
## 12 30
## 13 4
## 14 21
## 15 4
## 16 10
## 17 30
## 18 4
## 19 21
## 20 4
## 21 10
## 22 30
## 23 4
## 24 21
## 25 4
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 2 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 3 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 4 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 5 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 6 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 7 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 8 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 9 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 10 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 11 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 12 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 13 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 14 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 15 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 16 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 17 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 18 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 19 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 20 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 21 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 22 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 23 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 24 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 25 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$40 - $45 an hour $40 - $45 40 45 40
## 4 \n$40 - $45 an hour $40 - $45 40 45 40
## 6 \n$40 - $45 an hour $40 - $45 40 45 40
## 8 \n$40 - $45 an hour $40 - $45 40 45 40
## 10 \n$40 - $45 an hour $40 - $45 40 45 40
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 45 40 45 40 45
## 4 45 40 45 40 45
## 6 45 40 45 40 45
## 8 45 40 45 40 45
## 10 45 40 45 40 45
##
## [[7]]
## city state jobTitle
## 1 Shreveport LA Massage Therapist - Independent Contractor
## 2 Shreveport LA Spa Massage Therapist
## 3 Shreveport LA Massage Therapist Full-Time
## 4 Shreveport LA Licensed Massage Therapist
## 5 Shreveport LA Massage Therapist Part-Time
## 6 Shreveport LA Massage Therapist - Independent Contractor
## 7 Shreveport LA Spa Massage Therapist
## 8 Shreveport LA Massage Therapist Full-Time
## 9 Shreveport LA Licensed Massage Therapist
## 10 Shreveport LA Massage Therapist Part-Time
## 11 Shreveport LA Massage Therapist - Independent Contractor
## 12 Shreveport LA Spa Massage Therapist
## 13 Shreveport LA Massage Therapist Full-Time
## 14 Shreveport LA Licensed Massage Therapist
## 15 Shreveport LA Massage Therapist Part-Time
## 16 Shreveport LA Massage Therapist - Independent Contractor
## 17 Shreveport LA Spa Massage Therapist
## 18 Shreveport LA Massage Therapist Full-Time
## 19 Shreveport LA Licensed Massage Therapist
## 20 Shreveport LA Massage Therapist Part-Time
## 21 Shreveport LA Massage Therapist - Independent Contractor
## 22 Shreveport LA Spa Massage Therapist
## 23 Shreveport LA Massage Therapist Full-Time
## 24 Shreveport LA Licensed Massage Therapist
## 25 Shreveport LA Massage Therapist Part-Time
## HiringAgency
## 1 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 2 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 3 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 4 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 5 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 6 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 7 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 8 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 9 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 10 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 11 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 12 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 13 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 14 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 15 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 16 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 17 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 18 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 19 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 20 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 21 Indo-Pak Massage TherapyBossier City, LA•Remote work available
## 22 Eldorado Resorts, Inc.3.4Shreveport, LA 71107
## 23 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## 24 Peace of Mind CenterShreveport, LA 71105 (Broadmoor, Anderson Island, Shreve Isle. area)
## 25 Massage Envy3.2Shreveport, LA 71105 (Springlake, University Terrace area)+1 location
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 10 40 45 NA NA
## 2 30 40 45 NA NA
## 3 4 40 45 NA NA
## 4 21 40 45 NA NA
## 5 4 40 45 NA NA
## 6 10 40 45 NA NA
## 7 30 40 45 NA NA
## 8 4 40 45 NA NA
## 9 21 40 45 NA NA
## 10 4 40 45 NA NA
## 11 10 40 45 NA NA
## 12 30 40 45 NA NA
## 13 4 40 45 NA NA
## 14 21 40 45 NA NA
## 15 4 40 45 NA NA
## 16 10 40 45 NA NA
## 17 30 40 45 NA NA
## 18 4 40 45 NA NA
## 19 21 40 45 NA NA
## 20 4 40 45 NA NA
## 21 10 40 45 NA NA
## 22 30 40 45 NA NA
## 23 4 40 45 NA NA
## 24 21 40 45 NA NA
## 25 4 40 45 NA NA
Main Portland, Lewiston, Bangor
getIndeedJobData5pages("massage therapist","Portland","ME")
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapists
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist - Independent Contractor
## 7 Salon Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist - Full Time
## 11 Massage Therapist
## 12 Licensed Massage Therapist (LMT)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapists
## 15 Massage Therapist - Independent Contractor
## 16 Massage Therapist - Independent Contractor
## 17 Salon Massage Therapist
## 18 Massage Therapist
## 19 Massage Therapist - Independent Contractor
## 20 Massage Therapist - Full Time
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapists
## 23 Massage Therapist - Independent Contractor
## 24 Massage Therapist - Independent Contractor
## 25 Salon Massage Therapist
## 26 Massage Therapist
## 27 Massage Therapist - Independent Contractor
## 28 Massage Therapist - Full Time
## 29 Licensed Massage Therapist (LMT)
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapists
## 33 Massage Therapist - Independent Contractor
## 34 Massage Therapist - Independent Contractor
## 35 Salon Massage Therapist
## 36 Massage Therapist
## 37 Massage Therapist - Independent Contractor
## 38 Massage Therapist - Full Time
## 39 Licensed Massage Therapist (LMT)
## 40 Massage Therapist
## 41 Massage Therapist
## 42 Licensed Massage Therapist (LMT)
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapists
## 45 Massage Therapist - Independent Contractor
## 46 Massage Therapist - Independent Contractor
## 47 Salon Massage Therapist
## 48 Massage Therapist
## 49 Massage Therapist - Independent Contractor
## 50 Massage Therapist - Full Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$29 - $43 an hour $29 - $43 29 43
## 2 \n$35 - $55 an hour $35 - $55 35 55
## 3 \n$35 - $45 an hour $35 - $45 35 45
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$29 - $43 an hour $29 - $43 29 43
## 6 \n$35 - $55 an hour $35 - $55 35 55
## 7 \n$35 - $45 an hour $35 - $45 35 45
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$35 - $45 an hour $35 - $45 35 45
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 11 \n$35 - $55 an hour $35 - $55 35 55
## 12 \n$29 - $43 an hour $29 - $43 29 43
## 13 \n$35 - $45 an hour $35 - $45 35 45
## 14 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 15 \n$35 - $55 an hour $35 - $55 35 55
## 16 \n$29 - $43 an hour $29 - $43 29 43
## 17 \n$29 - $43 an hour $29 - $43 29 43
## 18 \n$35 - $55 an hour $35 - $55 35 55
## 19 \n$35 - $45 an hour $35 - $45 35 45
## 20 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 44 1274.75 2155.25 29
## 2 35 44 1274.75 2155.25 29
## 3 35 44 1274.75 2155.25 29
## 4 35 44 1274.75 2155.25 29
## 5 35 44 1274.75 2155.25 29
## 6 35 44 1274.75 2155.25 29
## 7 35 44 1274.75 2155.25 29
## 8 35 44 1274.75 2155.25 29
## 9 35 44 1274.75 2155.25 29
## 10 35 44 1274.75 2155.25 29
## 11 35 44 1274.75 2155.25 29
## 12 35 44 1274.75 2155.25 29
## 13 35 44 1274.75 2155.25 29
## 14 35 44 1274.75 2155.25 29
## 15 35 44 1274.75 2155.25 29
## 16 35 44 1274.75 2155.25 29
## 17 35 44 1274.75 2155.25 29
## 18 35 44 1274.75 2155.25 29
## 19 35 44 1274.75 2155.25 29
## 20 35 44 1274.75 2155.25 29
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 1
## 4 4
## 5 12
## 6 5
## 7 30
## 8 30
## 9 26
## 10 30
## 11 30
## 12 30
## 13 1
## 14 4
## 15 12
## 16 5
## 17 30
## 18 30
## 19 26
## 20 30
## 21 1
## 22 4
## 23 12
## 24 5
## 25 30
## 26 30
## 27 26
## 28 30
## 29 30
## 30 30
## 31 1
## 32 4
## 33 12
## 34 5
## 35 30
## 36 30
## 37 26
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 1
## 44 4
## 45 12
## 46 5
## 47 30
## 48 30
## 49 26
## 50 30
##
## [[4]]
## HiringAgency
## 1 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area)
## 2 Theriault Chiropractic & Massage of GorhamGorham, ME 04038
## 3 Skin Deep Day SpaCumberland, ME 04021
## 4 soakologyPortland, ME 04101 (Downtown area)
## 5 Washington BathsPortland, ME 04101 (East End area)
## 6 Indo-Pak Massage TherapyPortland, ME•Remote work available
## 7 JCPenney3.7South Portland, ME 04106
## 8 Sebasco Harbor Resort3.4Phippsburg, ME 04562
## 9 Beach House Nail Bar & SpaScarborough, ME 04074
## 10 Massage Envy3.2South Portland, ME 04106
## 11 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area)
## 12 Theriault Chiropractic & Massage of GorhamGorham, ME 04038
## 13 Skin Deep Day SpaCumberland, ME 04021
## 14 soakologyPortland, ME 04101 (Downtown area)
## 15 Washington BathsPortland, ME 04101 (East End area)
## 16 Indo-Pak Massage TherapyPortland, ME•Remote work available
## 17 JCPenney3.7South Portland, ME 04106
## 18 Sebasco Harbor Resort3.4Phippsburg, ME 04562
## 19 Beach House Nail Bar & SpaScarborough, ME 04074
## 20 Massage Envy3.2South Portland, ME 04106
## 21 Skin Deep Day SpaCumberland, ME 04021
## 22 soakologyPortland, ME 04101 (Downtown area)
## 23 Washington BathsPortland, ME 04101 (East End area)
## 24 Indo-Pak Massage TherapyPortland, ME•Remote work available
## 25 JCPenney3.7South Portland, ME 04106
## 26 Sebasco Harbor Resort3.4Phippsburg, ME 04562
## 27 Beach House Nail Bar & SpaScarborough, ME 04074
## 28 Massage Envy3.2South Portland, ME 04106
## 29 Theriault Chiropractic & Massage of GorhamGorham, ME 04038
## 30 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area)
## 31 Skin Deep Day SpaCumberland, ME 04021
## 32 soakologyPortland, ME 04101 (Downtown area)
## 33 Washington BathsPortland, ME 04101 (East End area)
## 34 Indo-Pak Massage TherapyPortland, ME•Remote work available
## 35 JCPenney3.7South Portland, ME 04106
## 36 Sebasco Harbor Resort3.4Phippsburg, ME 04562
## 37 Beach House Nail Bar & SpaScarborough, ME 04074
## 38 Massage Envy3.2South Portland, ME 04106
## 39 Theriault Chiropractic & Massage of GorhamGorham, ME 04038
## 40 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area)
## 41 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area)
## 42 Theriault Chiropractic & Massage of GorhamGorham, ME 04038
## 43 Skin Deep Day SpaCumberland, ME 04021
## 44 soakologyPortland, ME 04101 (Downtown area)
## 45 Washington BathsPortland, ME 04101 (East End area)
## 46 Indo-Pak Massage TherapyPortland, ME•Remote work available
## 47 JCPenney3.7South Portland, ME 04106
## 48 Sebasco Harbor Resort3.4Phippsburg, ME 04562
## 49 Beach House Nail Bar & SpaScarborough, ME 04074
## 50 Massage Envy3.2South Portland, ME 04106
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$29 - $43 an hour $29 - $43 29 43 35
## 2 \n$35 - $55 an hour $35 - $55 35 55 35
## 3 \n$35 - $45 an hour $35 - $45 35 45 35
## 5 \n$29 - $43 an hour $29 - $43 29 43 35
## 6 \n$35 - $55 an hour $35 - $55 35 55 35
## 7 \n$35 - $45 an hour $35 - $45 35 45 35
## 9 \n$35 - $45 an hour $35 - $45 35 45 35
## 11 \n$35 - $55 an hour $35 - $55 35 55 35
## 12 \n$29 - $43 an hour $29 - $43 29 43 35
## 13 \n$35 - $45 an hour $35 - $45 35 45 35
## 15 \n$35 - $55 an hour $35 - $55 35 55 35
## 16 \n$29 - $43 an hour $29 - $43 29 43 35
## 17 \n$29 - $43 an hour $29 - $43 29 43 35
## 18 \n$35 - $55 an hour $35 - $55 35 55 35
## 19 \n$35 - $45 an hour $35 - $45 35 45 35
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 33 47.66667 29 55
## 2 45 33 47.66667 29 55
## 3 45 33 47.66667 29 55
## 5 45 33 47.66667 29 55
## 6 45 33 47.66667 29 55
## 7 45 33 47.66667 29 55
## 9 45 33 47.66667 29 55
## 11 45 33 47.66667 29 55
## 12 45 33 47.66667 29 55
## 13 45 33 47.66667 29 55
## 15 45 33 47.66667 29 55
## 16 45 33 47.66667 29 55
## 17 45 33 47.66667 29 55
## 18 45 33 47.66667 29 55
## 19 45 33 47.66667 29 55
##
## [[7]]
## city state jobTitle
## 1 Portland ME Massage Therapist
## 2 Portland ME Licensed Massage Therapist (LMT)
## 3 Portland ME Licensed Massage Therapist
## 4 Portland ME Licensed Massage Therapists
## 5 Portland ME Massage Therapist - Independent Contractor
## 6 Portland ME Massage Therapist - Independent Contractor
## 7 Portland ME Salon Massage Therapist
## 8 Portland ME Massage Therapist
## 9 Portland ME Massage Therapist - Independent Contractor
## 10 Portland ME Massage Therapist - Full Time
## 11 Portland ME Massage Therapist
## 12 Portland ME Licensed Massage Therapist (LMT)
## 13 Portland ME Licensed Massage Therapist
## 14 Portland ME Licensed Massage Therapists
## 15 Portland ME Massage Therapist - Independent Contractor
## 16 Portland ME Massage Therapist - Independent Contractor
## 17 Portland ME Salon Massage Therapist
## 18 Portland ME Massage Therapist
## 19 Portland ME Massage Therapist - Independent Contractor
## 20 Portland ME Massage Therapist - Full Time
## 21 Portland ME Licensed Massage Therapist
## 22 Portland ME Licensed Massage Therapists
## 23 Portland ME Massage Therapist - Independent Contractor
## 24 Portland ME Massage Therapist - Independent Contractor
## 25 Portland ME Salon Massage Therapist
## 26 Portland ME Massage Therapist
## 27 Portland ME Massage Therapist - Independent Contractor
## 28 Portland ME Massage Therapist - Full Time
## 29 Portland ME Licensed Massage Therapist (LMT)
## 30 Portland ME Massage Therapist
## 31 Portland ME Licensed Massage Therapist
## 32 Portland ME Licensed Massage Therapists
## 33 Portland ME Massage Therapist - Independent Contractor
## 34 Portland ME Massage Therapist - Independent Contractor
## 35 Portland ME Salon Massage Therapist
## 36 Portland ME Massage Therapist
## 37 Portland ME Massage Therapist - Independent Contractor
## 38 Portland ME Massage Therapist - Full Time
## 39 Portland ME Licensed Massage Therapist (LMT)
## 40 Portland ME Massage Therapist
## 41 Portland ME Massage Therapist
## 42 Portland ME Licensed Massage Therapist (LMT)
## 43 Portland ME Licensed Massage Therapist
## 44 Portland ME Licensed Massage Therapists
## 45 Portland ME Massage Therapist - Independent Contractor
## 46 Portland ME Massage Therapist - Independent Contractor
## 47 Portland ME Salon Massage Therapist
## 48 Portland ME Massage Therapist
## 49 Portland ME Massage Therapist - Independent Contractor
## 50 Portland ME Massage Therapist - Full Time
## HiringAgency date_daysAgo
## 1 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area) 30
## 2 Theriault Chiropractic & Massage of GorhamGorham, ME 04038 30
## 3 Skin Deep Day SpaCumberland, ME 04021 1
## 4 soakologyPortland, ME 04101 (Downtown area) 4
## 5 Washington BathsPortland, ME 04101 (East End area) 12
## 6 Indo-Pak Massage TherapyPortland, ME•Remote work available 5
## 7 JCPenney3.7South Portland, ME 04106 30
## 8 Sebasco Harbor Resort3.4Phippsburg, ME 04562 30
## 9 Beach House Nail Bar & SpaScarborough, ME 04074 26
## 10 Massage Envy3.2South Portland, ME 04106 30
## 11 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area) 30
## 12 Theriault Chiropractic & Massage of GorhamGorham, ME 04038 30
## 13 Skin Deep Day SpaCumberland, ME 04021 1
## 14 soakologyPortland, ME 04101 (Downtown area) 4
## 15 Washington BathsPortland, ME 04101 (East End area) 12
## 16 Indo-Pak Massage TherapyPortland, ME•Remote work available 5
## 17 JCPenney3.7South Portland, ME 04106 30
## 18 Sebasco Harbor Resort3.4Phippsburg, ME 04562 30
## 19 Beach House Nail Bar & SpaScarborough, ME 04074 26
## 20 Massage Envy3.2South Portland, ME 04106 30
## 21 Skin Deep Day SpaCumberland, ME 04021 1
## 22 soakologyPortland, ME 04101 (Downtown area) 4
## 23 Washington BathsPortland, ME 04101 (East End area) 12
## 24 Indo-Pak Massage TherapyPortland, ME•Remote work available 5
## 25 JCPenney3.7South Portland, ME 04106 30
## 26 Sebasco Harbor Resort3.4Phippsburg, ME 04562 30
## 27 Beach House Nail Bar & SpaScarborough, ME 04074 26
## 28 Massage Envy3.2South Portland, ME 04106 30
## 29 Theriault Chiropractic & Massage of GorhamGorham, ME 04038 30
## 30 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area) 30
## 31 Skin Deep Day SpaCumberland, ME 04021 1
## 32 soakologyPortland, ME 04101 (Downtown area) 4
## 33 Washington BathsPortland, ME 04101 (East End area) 12
## 34 Indo-Pak Massage TherapyPortland, ME•Remote work available 5
## 35 JCPenney3.7South Portland, ME 04106 30
## 36 Sebasco Harbor Resort3.4Phippsburg, ME 04562 30
## 37 Beach House Nail Bar & SpaScarborough, ME 04074 26
## 38 Massage Envy3.2South Portland, ME 04106 30
## 39 Theriault Chiropractic & Massage of GorhamGorham, ME 04038 30
## 40 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area) 30
## 41 Portland Regency Hotel & SpaPortland, ME 04101 (Downtown area) 30
## 42 Theriault Chiropractic & Massage of GorhamGorham, ME 04038 30
## 43 Skin Deep Day SpaCumberland, ME 04021 1
## 44 soakologyPortland, ME 04101 (Downtown area) 4
## 45 Washington BathsPortland, ME 04101 (East End area) 12
## 46 Indo-Pak Massage TherapyPortland, ME•Remote work available 5
## 47 JCPenney3.7South Portland, ME 04106 30
## 48 Sebasco Harbor Resort3.4Phippsburg, ME 04562 30
## 49 Beach House Nail Bar & SpaScarborough, ME 04074 26
## 50 Massage Envy3.2South Portland, ME 04106 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 29 55 NA NA
## 2 29 55 NA NA
## 3 29 55 NA NA
## 4 29 55 NA NA
## 5 29 55 NA NA
## 6 29 55 NA NA
## 7 29 55 NA NA
## 8 29 55 NA NA
## 9 29 55 NA NA
## 10 29 55 NA NA
## 11 29 55 NA NA
## 12 29 55 NA NA
## 13 29 55 NA NA
## 14 29 55 NA NA
## 15 29 55 NA NA
## 16 29 55 NA NA
## 17 29 55 NA NA
## 18 29 55 NA NA
## 19 29 55 NA NA
## 20 29 55 NA NA
## 21 29 55 NA NA
## 22 29 55 NA NA
## 23 29 55 NA NA
## 24 29 55 NA NA
## 25 29 55 NA NA
## 26 29 55 NA NA
## 27 29 55 NA NA
## 28 29 55 NA NA
## 29 29 55 NA NA
## 30 29 55 NA NA
## 31 29 55 NA NA
## 32 29 55 NA NA
## 33 29 55 NA NA
## 34 29 55 NA NA
## 35 29 55 NA NA
## 36 29 55 NA NA
## 37 29 55 NA NA
## 38 29 55 NA NA
## 39 29 55 NA NA
## 40 29 55 NA NA
## 41 29 55 NA NA
## 42 29 55 NA NA
## 43 29 55 NA NA
## 44 29 55 NA NA
## 45 29 55 NA NA
## 46 29 55 NA NA
## 47 29 55 NA NA
## 48 29 55 NA NA
## 49 29 55 NA NA
## 50 29 55 NA NA
getIndeedJobData5pages("massage therapist","Lewiston","ME")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist (LMT)
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$23 - $29 an hour $23 - $29 23 29 23
## 2 \n$23 - $29 an hour $23 - $29 23 29 23
## 3 \n$23 - $29 an hour $23 - $29 23 29 23
## 4 \n$23 - $29 an hour $23 - $29 23 29 23
## 5 \n$23 - $29 an hour $23 - $29 23 29 23
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 26 23 26 23 29
## 2 26 23 26 23 29
## 3 26 23 26 23 29
## 4 26 23 26 23 29
## 5 26 23 26 23 29
##
## [[3]]
## date_daysAgo
## 1 1
## 2 8
## 3 8
## 4 1
## 5 8
## 6 1
## 7 1
## 8 8
## 9 1
## 10 8
##
## [[4]]
## HiringAgency
## 1 Skin Deep Day SpaCumberland, ME 04021
## 2 ME Massage TherapyLewiston, ME 04240
## 3 ME Massage TherapyLewiston, ME 04240
## 4 Skin Deep Day SpaCumberland, ME 04021
## 5 ME Massage TherapyLewiston, ME 04240
## 6 Skin Deep Day SpaCumberland, ME 04021
## 7 Skin Deep Day SpaCumberland, ME 04021
## 8 ME Massage TherapyLewiston, ME 04240
## 9 Skin Deep Day SpaCumberland, ME 04021
## 10 ME Massage TherapyLewiston, ME 04240
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$23 - $29 an hour $23 - $29 23 29 23
## 2 \n$23 - $29 an hour $23 - $29 23 29 23
## 3 \n$23 - $29 an hour $23 - $29 23 29 23
## 4 \n$23 - $29 an hour $23 - $29 23 29 23
## 5 \n$23 - $29 an hour $23 - $29 23 29 23
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 29 23 29 23 29
## 2 29 23 29 23 29
## 3 29 23 29 23 29
## 4 29 23 29 23 29
## 5 29 23 29 23 29
##
## [[7]]
## city state jobTitle
## 1 Lewiston ME Licensed Massage Therapist
## 2 Lewiston ME Licensed Massage Therapist (LMT)
## 3 Lewiston ME Licensed Massage Therapist (LMT)
## 4 Lewiston ME Licensed Massage Therapist
## 5 Lewiston ME Licensed Massage Therapist (LMT)
## 6 Lewiston ME Licensed Massage Therapist
## 7 Lewiston ME Licensed Massage Therapist
## 8 Lewiston ME Licensed Massage Therapist (LMT)
## 9 Lewiston ME Licensed Massage Therapist
## 10 Lewiston ME Licensed Massage Therapist (LMT)
## HiringAgency date_daysAgo MinHourlySalary
## 1 Skin Deep Day SpaCumberland, ME 04021 1 23
## 2 ME Massage TherapyLewiston, ME 04240 8 23
## 3 ME Massage TherapyLewiston, ME 04240 8 23
## 4 Skin Deep Day SpaCumberland, ME 04021 1 23
## 5 ME Massage TherapyLewiston, ME 04240 8 23
## 6 Skin Deep Day SpaCumberland, ME 04021 1 23
## 7 Skin Deep Day SpaCumberland, ME 04021 1 23
## 8 ME Massage TherapyLewiston, ME 04240 8 23
## 9 Skin Deep Day SpaCumberland, ME 04021 1 23
## 10 ME Massage TherapyLewiston, ME 04240 8 23
## MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 29 NA NA
## 2 29 NA NA
## 3 29 NA NA
## 4 29 NA NA
## 5 29 NA NA
## 6 29 NA NA
## 7 29 NA NA
## 8 29 NA NA
## 9 29 NA NA
## 10 29 NA NA
getIndeedJobData5pages("massage therapist","Bangor","ME")
## [[1]]
## [1] jobTitle
## <0 rows> (or 0-length row.names)
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## [1] date_daysAgo
## <0 rows> (or 0-length row.names)
##
## [[4]]
## [1] HiringAgency
## <0 rows> (or 0-length row.names)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## [1] city state jobTitle HiringAgency
## [5] date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary
## [9] MaxAnnualSalary
## <0 rows> (or 0-length row.names)
Maryland Baltimore, Columbia, Germantown
getIndeedJobData5pages("massage therapist","Baltimore","MD")
## Warning in getIndeedJobData5pages("massage therapist", "Baltimore", "MD"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Baltimore", "MD"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Baltimore", "MD"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (Licensed Required)
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapy Educator
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Lisenced Massage Therapist (LMT) (RMT)
## 11 Massage Therapist - Independent Contractor
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist- $1000 Hiring Bonus
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist - Full-Time
## 17 Licensed Massage Therapist - Crofton
## 18 MASSSAGE THERAPIST
## 19 Massage Therapist - Part-Time
## 20 Total Body Stretch Service Provider
## 21 Full-Time Massage Therapist
## 22 Massage Therapist
## 23 Massage Therapist - Independent Contractor
## 24 Massage Therapist
## 25 Stretch Practitioner- (Personal trainers or yoga instructors...
## 26 Licensed Massage Therapist
## 27 Registered Massage Practitioner
## 28 Registered Massage Practitioner
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Massage Therapist - Full-Time
## 32 Licensed Massage Therapist - Crofton
## 33 MASSSAGE THERAPIST
## 34 Massage Therapist - Part-Time
## 35 Total Body Stretch Service Provider
## 36 Full-Time Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 Stretch Practitioner- (Personal trainers or yoga instructors...
## 41 Licensed Massage Therapist
## 42 Registered Massage Practitioner
## 43 Registered Massage Practitioner
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist - Full-Time
## 47 Licensed Massage Therapist - Crofton
## 48 MASSSAGE THERAPIST
## 49 Massage Therapist - Part-Time
## 50 Total Body Stretch Service Provider
## 51 Full-Time Massage Therapist
## 52 Massage Therapist
## 53 Massage Therapist - Independent Contractor
## 54 Massage Therapist
## 55 Stretch Practitioner- (Personal trainers or yoga instructors...
## 56 Licensed Massage Therapist
## 57 Registered Massage Practitioner
## 58 Registered Massage Practitioner
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist - Full-Time
## 62 Licensed Massage Therapist - Crofton
## 63 MASSSAGE THERAPIST
## 64 Massage Therapist - Part-Time
## 65 Total Body Stretch Service Provider
## 66 Full-Time Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$14 - $18 an hour $14 - $18 14 18
## 2 \n$28 - $50 an hour $28 - $50 28 50
## 3 \n$40 an hour $40 40 NA
## 4 \n$30,000 - $43,000 a year $30000 - $43000 30000 43000
## 5 \n$26 - $36 an hour $26 - $36 26 36
## 6 \n$70 - $90 an hour $70 - $90 70 90
## 7 \n$45 - $75 an hour $45 - $75 45 75
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$23 - $40 an hour $23 - $40 23 40
## 10 \n$35,000 a year $35000 35000 NA
## 11 \n$26 - $32 an hour $26 - $32 26 32
## 12 \n$26 - $32 an hour $26 - $32 26 32
## 13 \n$26 - $32 an hour $26 - $32 26 32
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 28 38 5409.538 5238.708 14
## 2 28 38 5409.538 5238.708 14
## 3 28 38 5409.538 5238.708 14
## 4 28 38 5409.538 5238.708 14
## 5 28 38 5409.538 5238.708 14
## 6 28 38 5409.538 5238.708 14
## 7 28 38 5409.538 5238.708 14
## 8 28 38 5409.538 5238.708 14
## 9 28 38 5409.538 5238.708 14
## 10 28 38 5409.538 5238.708 14
## 11 28 38 5409.538 5238.708 14
## 12 28 38 5409.538 5238.708 14
## 13 28 38 5409.538 5238.708 14
## maximumMaxSalary
## 1 43000
## 2 43000
## 3 43000
## 4 43000
## 5 43000
## 6 43000
## 7 43000
## 8 43000
## 9 43000
## 10 43000
## 11 43000
## 12 43000
## 13 43000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 6
## 3 7
## 4 8
## 5 30
## 6 24
## 7 30
## 8 30
## 9 Just posted
## 10 5
## 11 5
## 12 13
## 13 30
## 14 30
## 15 30
## 16 30
## 17 30
## 18 30
## 19 30
## 20 30
## 21 30
## 22 25
## 23 17
## 24 30
## 25 18
## 26 7
## 27 15
## 28 30
## 29 14
## 30 30
## 31 30
## 32 30
## 33 30
## 34 30
## 35 30
## 36 30
## 37 30
## 38 30
## 39 17
## 40 18
## 41 7
## 42 15
## 43 30
## 44 14
## 45 30
## 46 30
## 47 30
## 48 30
## 49 30
## 50 30
## 51 30
## 52 25
## 53 17
## 54 30
## 55 18
## 56 7
## 57 15
## 58 30
## 59 14
## 60 30
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
## 66 30
##
## [[4]]
## HiringAgency
## 1 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
## 2 Effective Integrative HealthcareMillersville, MD 21108
## 3 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 4 Hand and Stone Massage & Facial SpaBaltimore, MD
## 5 Aveda Institute Maryland3.0Bel Air, MD 21014
## 6 Soothe3.7Baltimore, MD
## 7 Nava Health and Vitality CenterColumbia, MD 21045
## 8 Bodyworx Spa and MassageSeverna Park, MD 21146
## 9 InTouch Mobile SpaMaryland
## 10 Camille Intutive WellnessBaltimore, MD 21210 (Wyndhurst area)
## 11 Indo-Pak Massage TherapyBaltimore, MD•Remote work available
## 12 Studio 7 The Salon and SpaBaltimore, MD 21230 (Riverside area)
## 13 Massage Envy3.2Laurel, MD 20707
## 14 Mend AcupunctureBaltimore, MD 21211 (Remington area)
## 15 Elements3.6Timonium, MD 21093+2 locations
## 16 Massage Envy3.2Nottingham, MD 21236
## 17 Massage Envy3.2Gambrills, MD 21054
## 18 Massage Envy3.2Elkridge, MD 21075
## 19 Massage Envy3.2Nottingham, MD 21236
## 20 Massage Envy3.2Severna Park, MD 21146+1 location
## 21 Massage Envy3.2Gambrills, MD 21054
## 22 Phenix Salon Suites3.9Laurel, MD 20707
## 23 Chiseled LifeColumbia, MD 21046
## 24 Massage Envy3.2Baltimore, MD 21230 (Locust Point Industrial Area area)+10 locations
## 25 ME Spa3.8Ellicott City, MD
## 26 FGG Spa, LLCColumbia, MD 21046
## 27 FGG Spa, LLCColumbia, MD 21045+2 locations
## 28 Hand and Stone3.0Columbia, MD 21045+2 locations
## 29 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 30 Massage Envy Ellicott CityEllicott City, MD 21042
## 31 Massage Envy3.2Nottingham, MD 21236
## 32 Massage Envy3.2Gambrills, MD 21054
## 33 Massage Envy3.2Elkridge, MD 21075
## 34 Massage Envy3.2Nottingham, MD 21236
## 35 Massage Envy3.2Severna Park, MD 21146+1 location
## 36 Massage Envy3.2Gambrills, MD 21054
## 37 Life Time3.6Columbia, MD 21046
## 38 Massage Envy3.2Baltimore, MD 21230 (Locust Point Industrial Area area)+10 locations
## 39 Chiseled LifeColumbia, MD 21046
## 40 ME Spa3.8Ellicott City, MD
## 41 FGG Spa, LLCColumbia, MD 21046
## 42 FGG Spa, LLCColumbia, MD 21045+2 locations
## 43 Hand and Stone3.0Columbia, MD 21045+2 locations
## 44 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 45 Massage Envy Ellicott CityEllicott City, MD 21042
## 46 Massage Envy3.2Nottingham, MD 21236
## 47 Massage Envy3.2Gambrills, MD 21054
## 48 Massage Envy3.2Elkridge, MD 21075
## 49 Massage Envy3.2Nottingham, MD 21236
## 50 Massage Envy3.2Severna Park, MD 21146+1 location
## 51 Massage Envy3.2Gambrills, MD 21054
## 52 Phenix Salon Suites3.9Laurel, MD 20707
## 53 Chiseled LifeColumbia, MD 21046
## 54 Massage Envy3.2Baltimore, MD 21230 (Locust Point Industrial Area area)+10 locations
## 55 ME Spa3.8Ellicott City, MD
## 56 FGG Spa, LLCColumbia, MD 21046
## 57 FGG Spa, LLCColumbia, MD 21045+2 locations
## 58 Hand and Stone3.0Columbia, MD 21045+2 locations
## 59 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 60 Massage Envy Ellicott CityEllicott City, MD 21042
## 61 Massage Envy3.2Nottingham, MD 21236
## 62 Massage Envy3.2Gambrills, MD 21054
## 63 Massage Envy3.2Elkridge, MD 21075
## 64 Massage Envy3.2Nottingham, MD 21236
## 65 Massage Envy3.2Severna Park, MD 21146+1 location
## 66 Massage Envy3.2Gambrills, MD 21054
##
## [[5]]
## Salary salary minSalary maxSalary
## 4 \n$30,000 - $43,000 a year $30000 - $43000 30000 43000
## 10 \n$35,000 a year $35000 35000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 4 32500 43000 32500 43000 30000
## 10 32500 43000 32500 43000 30000
## maximumMaxSalary
## 4 43000
## 10 43000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$14 - $18 an hour $14 - $18 14 18 26
## 2 \n$28 - $50 an hour $28 - $50 28 50 26
## 3 \n$40 an hour $40 40 NA 26
## 5 \n$26 - $36 an hour $26 - $36 26 36 26
## 6 \n$70 - $90 an hour $70 - $90 70 90 26
## 7 \n$45 - $75 an hour $45 - $75 45 75 26
## 9 \n$23 - $40 an hour $23 - $40 23 40 26
## 11 \n$26 - $32 an hour $26 - $32 26 32 26
## 12 \n$26 - $32 an hour $26 - $32 26 32 26
## 13 \n$26 - $32 an hour $26 - $32 26 32 26
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 36 32.4 45 14 90
## 2 36 32.4 45 14 90
## 3 36 32.4 45 14 90
## 5 36 32.4 45 14 90
## 6 36 32.4 45 14 90
## 7 36 32.4 45 14 90
## 9 36 32.4 45 14 90
## 11 36 32.4 45 14 90
## 12 36 32.4 45 14 90
## 13 36 32.4 45 14 90
##
## [[7]]
## city state
## 1 Baltimore MD
## 2 Baltimore MD
## 3 Baltimore MD
## 4 Baltimore MD
## 5 Baltimore MD
## 6 Baltimore MD
## 7 Baltimore MD
## 8 Baltimore MD
## 9 Baltimore MD
## 10 Baltimore MD
## 11 Baltimore MD
## 12 Baltimore MD
## 13 Baltimore MD
## 14 Baltimore MD
## 15 Baltimore MD
## 16 Baltimore MD
## 17 Baltimore MD
## 18 Baltimore MD
## 19 Baltimore MD
## 20 Baltimore MD
## 21 Baltimore MD
## 22 Baltimore MD
## 23 Baltimore MD
## 24 Baltimore MD
## 25 Baltimore MD
## 26 Baltimore MD
## 27 Baltimore MD
## 28 Baltimore MD
## 29 Baltimore MD
## 30 Baltimore MD
## 31 Baltimore MD
## 32 Baltimore MD
## 33 Baltimore MD
## 34 Baltimore MD
## 35 Baltimore MD
## 36 Baltimore MD
## 37 Baltimore MD
## 38 Baltimore MD
## 39 Baltimore MD
## 40 Baltimore MD
## 41 Baltimore MD
## 42 Baltimore MD
## 43 Baltimore MD
## 44 Baltimore MD
## 45 Baltimore MD
## 46 Baltimore MD
## 47 Baltimore MD
## 48 Baltimore MD
## 49 Baltimore MD
## 50 Baltimore MD
## 51 Baltimore MD
## 52 Baltimore MD
## 53 Baltimore MD
## 54 Baltimore MD
## 55 Baltimore MD
## 56 Baltimore MD
## 57 Baltimore MD
## 58 Baltimore MD
## 59 Baltimore MD
## 60 Baltimore MD
## 61 Baltimore MD
## 62 Baltimore MD
## 63 Baltimore MD
## 64 Baltimore MD
## 65 Baltimore MD
## 66 Baltimore MD
## jobTitle
## 1 Licensed Massage Therapist (Licensed Required)
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapy Educator
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Lisenced Massage Therapist (LMT) (RMT)
## 11 Massage Therapist - Independent Contractor
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist- $1000 Hiring Bonus
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist - Full-Time
## 17 Licensed Massage Therapist - Crofton
## 18 MASSSAGE THERAPIST
## 19 Massage Therapist - Part-Time
## 20 Total Body Stretch Service Provider
## 21 Full-Time Massage Therapist
## 22 Massage Therapist
## 23 Massage Therapist - Independent Contractor
## 24 Massage Therapist
## 25 Stretch Practitioner- (Personal trainers or yoga instructors...
## 26 Licensed Massage Therapist
## 27 Registered Massage Practitioner
## 28 Registered Massage Practitioner
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Massage Therapist - Full-Time
## 32 Licensed Massage Therapist - Crofton
## 33 MASSSAGE THERAPIST
## 34 Massage Therapist - Part-Time
## 35 Total Body Stretch Service Provider
## 36 Full-Time Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 Stretch Practitioner- (Personal trainers or yoga instructors...
## 41 Licensed Massage Therapist
## 42 Registered Massage Practitioner
## 43 Registered Massage Practitioner
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist - Full-Time
## 47 Licensed Massage Therapist - Crofton
## 48 MASSSAGE THERAPIST
## 49 Massage Therapist - Part-Time
## 50 Total Body Stretch Service Provider
## 51 Full-Time Massage Therapist
## 52 Massage Therapist
## 53 Massage Therapist - Independent Contractor
## 54 Massage Therapist
## 55 Stretch Practitioner- (Personal trainers or yoga instructors...
## 56 Licensed Massage Therapist
## 57 Registered Massage Practitioner
## 58 Registered Massage Practitioner
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist - Full-Time
## 62 Licensed Massage Therapist - Crofton
## 63 MASSSAGE THERAPIST
## 64 Massage Therapist - Part-Time
## 65 Total Body Stretch Service Provider
## 66 Full-Time Massage Therapist
## HiringAgency
## 1 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
## 2 Effective Integrative HealthcareMillersville, MD 21108
## 3 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 4 Hand and Stone Massage & Facial SpaBaltimore, MD
## 5 Aveda Institute Maryland3.0Bel Air, MD 21014
## 6 Soothe3.7Baltimore, MD
## 7 Nava Health and Vitality CenterColumbia, MD 21045
## 8 Bodyworx Spa and MassageSeverna Park, MD 21146
## 9 InTouch Mobile SpaMaryland
## 10 Camille Intutive WellnessBaltimore, MD 21210 (Wyndhurst area)
## 11 Indo-Pak Massage TherapyBaltimore, MD•Remote work available
## 12 Studio 7 The Salon and SpaBaltimore, MD 21230 (Riverside area)
## 13 Massage Envy3.2Laurel, MD 20707
## 14 Mend AcupunctureBaltimore, MD 21211 (Remington area)
## 15 Elements3.6Timonium, MD 21093+2 locations
## 16 Massage Envy3.2Nottingham, MD 21236
## 17 Massage Envy3.2Gambrills, MD 21054
## 18 Massage Envy3.2Elkridge, MD 21075
## 19 Massage Envy3.2Nottingham, MD 21236
## 20 Massage Envy3.2Severna Park, MD 21146+1 location
## 21 Massage Envy3.2Gambrills, MD 21054
## 22 Phenix Salon Suites3.9Laurel, MD 20707
## 23 Chiseled LifeColumbia, MD 21046
## 24 Massage Envy3.2Baltimore, MD 21230 (Locust Point Industrial Area area)+10 locations
## 25 ME Spa3.8Ellicott City, MD
## 26 FGG Spa, LLCColumbia, MD 21046
## 27 FGG Spa, LLCColumbia, MD 21045+2 locations
## 28 Hand and Stone3.0Columbia, MD 21045+2 locations
## 29 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 30 Massage Envy Ellicott CityEllicott City, MD 21042
## 31 Massage Envy3.2Nottingham, MD 21236
## 32 Massage Envy3.2Gambrills, MD 21054
## 33 Massage Envy3.2Elkridge, MD 21075
## 34 Massage Envy3.2Nottingham, MD 21236
## 35 Massage Envy3.2Severna Park, MD 21146+1 location
## 36 Massage Envy3.2Gambrills, MD 21054
## 37 Life Time3.6Columbia, MD 21046
## 38 Massage Envy3.2Baltimore, MD 21230 (Locust Point Industrial Area area)+10 locations
## 39 Chiseled LifeColumbia, MD 21046
## 40 ME Spa3.8Ellicott City, MD
## 41 FGG Spa, LLCColumbia, MD 21046
## 42 FGG Spa, LLCColumbia, MD 21045+2 locations
## 43 Hand and Stone3.0Columbia, MD 21045+2 locations
## 44 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 45 Massage Envy Ellicott CityEllicott City, MD 21042
## 46 Massage Envy3.2Nottingham, MD 21236
## 47 Massage Envy3.2Gambrills, MD 21054
## 48 Massage Envy3.2Elkridge, MD 21075
## 49 Massage Envy3.2Nottingham, MD 21236
## 50 Massage Envy3.2Severna Park, MD 21146+1 location
## 51 Massage Envy3.2Gambrills, MD 21054
## 52 Phenix Salon Suites3.9Laurel, MD 20707
## 53 Chiseled LifeColumbia, MD 21046
## 54 Massage Envy3.2Baltimore, MD 21230 (Locust Point Industrial Area area)+10 locations
## 55 ME Spa3.8Ellicott City, MD
## 56 FGG Spa, LLCColumbia, MD 21046
## 57 FGG Spa, LLCColumbia, MD 21045+2 locations
## 58 Hand and Stone3.0Columbia, MD 21045+2 locations
## 59 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 60 Massage Envy Ellicott CityEllicott City, MD 21042
## 61 Massage Envy3.2Nottingham, MD 21236
## 62 Massage Envy3.2Gambrills, MD 21054
## 63 Massage Envy3.2Elkridge, MD 21075
## 64 Massage Envy3.2Nottingham, MD 21236
## 65 Massage Envy3.2Severna Park, MD 21146+1 location
## 66 Massage Envy3.2Gambrills, MD 21054
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 14 90 30000 43000
## 2 6 14 90 30000 43000
## 3 7 14 90 30000 43000
## 4 8 14 90 30000 43000
## 5 30 14 90 30000 43000
## 6 24 14 90 30000 43000
## 7 30 14 90 30000 43000
## 8 30 14 90 30000 43000
## 9 Just posted 14 90 30000 43000
## 10 5 14 90 30000 43000
## 11 5 14 90 30000 43000
## 12 13 14 90 30000 43000
## 13 30 14 90 30000 43000
## 14 30 14 90 30000 43000
## 15 30 14 90 30000 43000
## 16 30 14 90 30000 43000
## 17 30 14 90 30000 43000
## 18 30 14 90 30000 43000
## 19 30 14 90 30000 43000
## 20 30 14 90 30000 43000
## 21 30 14 90 30000 43000
## 22 25 14 90 30000 43000
## 23 17 14 90 30000 43000
## 24 30 14 90 30000 43000
## 25 18 14 90 30000 43000
## 26 7 14 90 30000 43000
## 27 15 14 90 30000 43000
## 28 30 14 90 30000 43000
## 29 14 14 90 30000 43000
## 30 30 14 90 30000 43000
## 31 30 14 90 30000 43000
## 32 30 14 90 30000 43000
## 33 30 14 90 30000 43000
## 34 30 14 90 30000 43000
## 35 30 14 90 30000 43000
## 36 30 14 90 30000 43000
## 37 30 14 90 30000 43000
## 38 30 14 90 30000 43000
## 39 17 14 90 30000 43000
## 40 18 14 90 30000 43000
## 41 7 14 90 30000 43000
## 42 15 14 90 30000 43000
## 43 30 14 90 30000 43000
## 44 14 14 90 30000 43000
## 45 30 14 90 30000 43000
## 46 30 14 90 30000 43000
## 47 30 14 90 30000 43000
## 48 30 14 90 30000 43000
## 49 30 14 90 30000 43000
## 50 30 14 90 30000 43000
## 51 30 14 90 30000 43000
## 52 25 14 90 30000 43000
## 53 17 14 90 30000 43000
## 54 30 14 90 30000 43000
## 55 18 14 90 30000 43000
## 56 7 14 90 30000 43000
## 57 15 14 90 30000 43000
## 58 30 14 90 30000 43000
## 59 14 14 90 30000 43000
## 60 30 14 90 30000 43000
## 61 30 14 90 30000 43000
## 62 30 14 90 30000 43000
## 63 30 14 90 30000 43000
## 64 30 14 90 30000 43000
## 65 30 14 90 30000 43000
## 66 30 14 90 30000 43000
getIndeedJobData5pages("massage therapist","Columbia","MD")
## Warning in getIndeedJobData5pages("massage therapist", "Columbia", "MD"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Columbia", "MD"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Columbia", "MD"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (Licensed Required)
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Licensed Massage Therapists wanted! $35-45/hour
## 7 Lisenced Massage Therapist (LMT) (RMT)
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist - Independent Contractor
## 11 Lead Massage Therapist
## 12 Stretch Practitioner- (Personal trainers or yoga instructors...
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Registered Massage Practitioner
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Licensed Massage Therapist - $1000 Hiring Bonus
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist at a Luxury Day Spa - (Gaithersburg, MD)
## 29 Massage Therapist (Weekends) at a Luxury Day Spa - (Leesburg...
## 30 Licensed Massage Therapists wanted! $35-45/hour
## 31 Licensed Massage Therapist- $1500 Hiring Bonus
## 32 Licensed Massage Therapist (Licensed Required)
## 33 Salon Massage Therapist
## 34 Senior Part Time Massage Therapist
## 35 Licensed Massage Therapist - Crofton
## 36 Maryland Licensed Massage Therapist Full-time
## 37 Licensed Massage Therapist - Washington, DC
## 38 Full-Time Massage Therapist
## 39 Massage Therapist Full-Time Rockville MD
## 40 Maryland Licensed Massage Therapist Part-time
## 41 Stretch Service Provider (Great Opportunity for Personal Tra...
## 42 Downtown Silver Spring - Massage Therapist - Full Time
## 43 Total Body Stretch Service Provider
## 44 Massage Therapist - Part-Time
## 45 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
## 46 MASSSAGE THERAPIST
## 47 Senior Licensed Massage Therapist
## 48 Salon Massage Therapist
## 49 Senior Part Time Massage Therapist
## 50 Licensed Massage Therapist - Crofton
## 51 Maryland Licensed Massage Therapist Full-time
## 52 Licensed Massage Therapist - Washington, DC
## 53 Full-Time Massage Therapist
## 54 Massage Therapist Full-Time Rockville MD
## 55 Maryland Licensed Massage Therapist Part-time
## 56 Stretch Service Provider (Great Opportunity for Personal Tra...
## 57 Downtown Silver Spring - Massage Therapist - Full Time
## 58 Total Body Stretch Service Provider
## 59 Massage Therapist - Part-Time
## 60 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
## 61 Licensed Massage Therapist - Washington, DC
## 62 Full-Time Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist Full-Time Rockville MD
## 65 Maryland Licensed Massage Therapist Part-time
## 66 Stretch Service Provider (Great Opportunity for Personal Tra...
## 67 Downtown Silver Spring - Massage Therapist - Full Time
## 68 Total Body Stretch Service Provider
## 69 Massage Therapist - Part-Time
## 70 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
## 71 Licensed Massage Therapists wanted! $35-45/hour
## 72 Licensed Massage Therapist- $1500 Hiring Bonus
## 73 Massage Therapist
## 74 Licensed Massage Therapist - $1000 Hiring Bonus
## 75 Licensed Massage Therapist
## 76 Massage Therapist
## 77 Licensed Massage Therapist (LMT)
## 78 Massage Therapist
## 79 Licensed Massage Therapist (Licensed Required)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$14 - $18 an hour $14 - $18 14 18
## 2 \n$28 - $50 an hour $28 - $50 28 50
## 3 \n$40 an hour $40 40 NA
## 4 \n$26 - $36 an hour $26 - $36 26 36
## 5 \n$19 - $28 an hour $19 - $28 19 28
## 6 \n$35 - $45 an hour $35 - $45 35 45
## 7 \n$45 - $75 an hour $45 - $75 45 75
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$40 - $50 an hour $40 - $50 40 50
## 10 \n$26 - $32 an hour $26 - $32 26 32
## 11 \n$65,000 a year $65000 65000 NA
## 12 \n$26 - $36 an hour $26 - $36 26 36
## 13 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 14 \n$28 - $50 an hour $28 - $50 28 50
## 15 \n$40 an hour $40 40 NA
## 16 \n$19 - $28 an hour $19 - $28 19 28
## 17 \n$23 - $40 an hour $23 - $40 23 40
## 18 \n$30 - $50 an hour $30 - $50 30 50
## 19 \n$35 - $53 an hour $35 - $53 35 53
## 20 \n$43 - $55 an hour $43 - $55 43 55
## 21 \n$35 - $45 an hour $35 - $45 35 45
## 22 \n$14 - $18 an hour $14 - $18 14 18
## 23 \n$60 - $65 an hour $60 - $65 60 65
## 24 \n$60 - $65 an hour $60 - $65 60 65
## 25 \n$60 - $65 an hour $60 - $65 60 65
## 26 \n$35 - $45 an hour $35 - $45 35 45
## 27 \n$19 - $28 an hour $19 - $28 19 28
## 28 \n$26 - $36 an hour $26 - $36 26 36
## 29 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 30 \n$28 - $50 an hour $28 - $50 28 50
## 31 \n$40 an hour $40 40 NA
## 32 \n$14 - $18 an hour $14 - $18 14 18
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 40 3778.375 3399.817 14
## 2 35 40 3778.375 3399.817 14
## 3 35 40 3778.375 3399.817 14
## 4 35 40 3778.375 3399.817 14
## 5 35 40 3778.375 3399.817 14
## 6 35 40 3778.375 3399.817 14
## 7 35 40 3778.375 3399.817 14
## 8 35 40 3778.375 3399.817 14
## 9 35 40 3778.375 3399.817 14
## 10 35 40 3778.375 3399.817 14
## 11 35 40 3778.375 3399.817 14
## 12 35 40 3778.375 3399.817 14
## 13 35 40 3778.375 3399.817 14
## 14 35 40 3778.375 3399.817 14
## 15 35 40 3778.375 3399.817 14
## 16 35 40 3778.375 3399.817 14
## 17 35 40 3778.375 3399.817 14
## 18 35 40 3778.375 3399.817 14
## 19 35 40 3778.375 3399.817 14
## 20 35 40 3778.375 3399.817 14
## 21 35 40 3778.375 3399.817 14
## 22 35 40 3778.375 3399.817 14
## 23 35 40 3778.375 3399.817 14
## 24 35 40 3778.375 3399.817 14
## 25 35 40 3778.375 3399.817 14
## 26 35 40 3778.375 3399.817 14
## 27 35 40 3778.375 3399.817 14
## 28 35 40 3778.375 3399.817 14
## 29 35 40 3778.375 3399.817 14
## 30 35 40 3778.375 3399.817 14
## 31 35 40 3778.375 3399.817 14
## 32 35 40 3778.375 3399.817 14
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 28 65000
## 29 65000
## 30 65000
## 31 65000
## 32 65000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 6
## 3 7
## 4 30
## 5 30
## 6 30
## 7 5
## 8 30
## 9 5
## 10 17
## 11 6
## 12 18
## 13 30
## 14 15
## 15 15
## 16 30
## 17 13
## 18 6
## 19 7
## 20 30
## 21 30
## 22 30
## 23 13
## 24 30
## 25 30
## 26 30
## 27 18
## 28 18
## 29 18
## 30 30
## 31 30
## 32 30
## 33 30
## 34 30
## 35 30
## 36 12
## 37 30
## 38 30
## 39 30
## 40 12
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 30
## 49 30
## 50 30
## 51 12
## 52 30
## 53 30
## 54 30
## 55 12
## 56 30
## 57 30
## 58 30
## 59 30
## 60 30
## 61 30
## 62 30
## 63 30
## 64 30
## 65 12
## 66 30
## 67 30
## 68 30
## 69 30
## 70 30
## 71 30
## 72 30
## 73 30
## 74 30
## 75 30
## 76 13
## 77 6
## 78 7
## 79 30
##
## [[4]]
## HiringAgency
## 1 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
## 2 Effective Integrative HealthcareMillersville, MD 21108
## 3 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 4 Nava Health and Vitality CenterColumbia, MD 21045
## 5 MIVC Spa, LLCSilver Spring, MD 20910
## 6 Acupbilling LLCGaithersburg, MD 20877
## 7 Camille Intutive WellnessBaltimore, MD 21210 (Wyndhurst area)
## 8 Life Time3.6Columbia, MD 21046+1 location
## 9 Indo-Pak Massage TherapySilver Spring, MD+1 location•Remote work available
## 10 Chiseled LifeColumbia, MD 21046
## 11 Hand & Stone Virginia and Maryland3.0Olney, MD 20832
## 12 ME Spa3.8Ellicott City, MD
## 13 Elements3.6Crofton, MD 21114+2 locations
## 14 FGG Spa, LLCColumbia, MD 21045+3 locations
## 15 FGG Spa, LLCColumbia, MD 21045+3 locations
## 16 Nava Health and Vitality CenterColumbia, MD 21045
## 17 Janna's Salon and SpaOwings Mills, MD 21117
## 18 Effective Integrative HealthcareMillersville, MD 21108
## 19 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 20 MIVC Spa, LLCSilver Spring, MD 20910
## 21 Massage Envy3.2College Park, MD 20740
## 22 SILVER SPRING HAIR SCALP & BODY MEDICAL SPALON & A...Silver Spring, MD 20910
## 23 Studio 7 The Salon and SpaBaltimore, MD 21230 (Riverside area)
## 24 Massage Envy Ellicott CityEllicott City, MD 21042
## 25 Mend AcupunctureBaltimore, MD 21211 (Remington area)
## 26 About Faces TimoniumLutherville-Timonium, MD 21093
## 27 Blue Heron Wellness4.2Silver Spring, MD 20901
## 28 The Woodhouse Day Spa - Gaithersburg & LeesburgGaithersburg, MD 20878
## 29 The Woodhouse Day Spa - Gaithersburg & LeesburgGaithersburg, MD 20878
## 30 Acupbilling LLCGaithersburg, MD 20877
## 31 Massage Envy3.2Woodmore, MD
## 32 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
## 33 JCPenney3.7Wheaton, MD 20902
## 34 Hand and Stone3.0Olney, MD 20832
## 35 Massage Envy3.2Gambrills, MD 21054
## 36 Massage Envy3.2Westminster, MD 21157
## 37 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 38 Massage Envy3.2Gambrills, MD 21054
## 39 Massage Envy3.2Rockville, MD 20852+1 location
## 40 Massage Envy3.2Westminster, MD 21157
## 41 Massage Envy3.2Lanham, MD 20706
## 42 Massage Envy3.2Silver Spring, MD 20910
## 43 Massage Envy3.2Severna Park, MD 21146+1 location
## 44 Massage Envy3.2Nottingham, MD 21236+1 location
## 45 Jamie L. JonesWashington, DC 20022
## 46 Massage Envy3.2Elkridge, MD 21075
## 47 Hand and Stone3.0Olney, MD 20832
## 48 JCPenney3.7Wheaton, MD 20902
## 49 Hand and Stone3.0Olney, MD 20832
## 50 Massage Envy3.2Gambrills, MD 21054
## 51 Massage Envy3.2Westminster, MD 21157
## 52 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 53 Massage Envy3.2Gambrills, MD 21054
## 54 Massage Envy3.2Rockville, MD 20852+1 location
## 55 Massage Envy3.2Westminster, MD 21157
## 56 Massage Envy3.2Lanham, MD 20706
## 57 Massage Envy3.2Silver Spring, MD 20910
## 58 Massage Envy3.2Severna Park, MD 21146+1 location
## 59 Massage Envy3.2Nottingham, MD 21236+1 location
## 60 Jamie L. JonesWashington, DC 20022
## 61 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 62 Massage Envy3.2Gambrills, MD 21054
## 63 Massage Envy3.2Annapolis, MD 21401+1 location
## 64 Massage Envy3.2Rockville, MD 20852+1 location
## 65 Massage Envy3.2Westminster, MD 21157
## 66 Massage Envy3.2Lanham, MD 20706
## 67 Massage Envy3.2Silver Spring, MD 20910
## 68 Massage Envy3.2Severna Park, MD 21146+1 location
## 69 Massage Envy3.2Nottingham, MD 21236+1 location
## 70 Jamie L. JonesWashington, DC 20022
## 71 Acupbilling LLCGaithersburg, MD 20877
## 72 Massage Envy3.2Woodmore, MD
## 73 MIVC Spa, LLCSilver Spring, MD 20910
## 74 Massage Envy3.2College Park, MD 20740
## 75 Nava Health and Vitality CenterColumbia, MD 21045
## 76 Janna's Salon and SpaOwings Mills, MD 21117
## 77 Effective Integrative HealthcareMillersville, MD 21108
## 78 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 79 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 11 \n$65,000 a year $65000 65000 NA
## 13 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 29 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 11 25000 35000 38333.33 35000 25000
## 13 25000 35000 38333.33 35000 25000
## 29 25000 35000 38333.33 35000 25000
## maximumMaxSalary
## 11 35000
## 13 35000
## 29 35000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$14 - $18 an hour $14 - $18 14 18 29
## 2 \n$28 - $50 an hour $28 - $50 28 50 29
## 3 \n$40 an hour $40 40 NA 29
## 4 \n$26 - $36 an hour $26 - $36 26 36 29
## 5 \n$19 - $28 an hour $19 - $28 19 28 29
## 6 \n$35 - $45 an hour $35 - $45 35 45 29
## 7 \n$45 - $75 an hour $45 - $75 45 75 29
## 9 \n$40 - $50 an hour $40 - $50 40 50 29
## 10 \n$26 - $32 an hour $26 - $32 26 32 29
## 12 \n$26 - $36 an hour $26 - $36 26 36 29
## 14 \n$28 - $50 an hour $28 - $50 28 50 29
## 15 \n$40 an hour $40 40 NA 29
## 16 \n$19 - $28 an hour $19 - $28 19 28 29
## 17 \n$23 - $40 an hour $23 - $40 23 40 29
## 18 \n$30 - $50 an hour $30 - $50 30 50 29
## 19 \n$35 - $53 an hour $35 - $53 35 53 29
## 20 \n$43 - $55 an hour $43 - $55 43 55 29
## 21 \n$35 - $45 an hour $35 - $45 35 45 29
## 22 \n$14 - $18 an hour $14 - $18 14 18 29
## 23 \n$60 - $65 an hour $60 - $65 60 65 29
## 24 \n$60 - $65 an hour $60 - $65 60 65 29
## 25 \n$60 - $65 an hour $60 - $65 60 65 29
## 26 \n$35 - $45 an hour $35 - $45 35 45 29
## 27 \n$19 - $28 an hour $19 - $28 19 28 29
## 28 \n$26 - $36 an hour $26 - $36 26 36 29
## 30 \n$28 - $50 an hour $28 - $50 28 50 29
## 31 \n$40 an hour $40 40 NA 29
## 32 \n$14 - $18 an hour $14 - $18 14 18 29
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 32.42857 43.24 14 75
## 2 45 32.42857 43.24 14 75
## 3 45 32.42857 43.24 14 75
## 4 45 32.42857 43.24 14 75
## 5 45 32.42857 43.24 14 75
## 6 45 32.42857 43.24 14 75
## 7 45 32.42857 43.24 14 75
## 9 45 32.42857 43.24 14 75
## 10 45 32.42857 43.24 14 75
## 12 45 32.42857 43.24 14 75
## 14 45 32.42857 43.24 14 75
## 15 45 32.42857 43.24 14 75
## 16 45 32.42857 43.24 14 75
## 17 45 32.42857 43.24 14 75
## 18 45 32.42857 43.24 14 75
## 19 45 32.42857 43.24 14 75
## 20 45 32.42857 43.24 14 75
## 21 45 32.42857 43.24 14 75
## 22 45 32.42857 43.24 14 75
## 23 45 32.42857 43.24 14 75
## 24 45 32.42857 43.24 14 75
## 25 45 32.42857 43.24 14 75
## 26 45 32.42857 43.24 14 75
## 27 45 32.42857 43.24 14 75
## 28 45 32.42857 43.24 14 75
## 30 45 32.42857 43.24 14 75
## 31 45 32.42857 43.24 14 75
## 32 45 32.42857 43.24 14 75
##
## [[7]]
## city state
## 1 Columbia MD
## 2 Columbia MD
## 3 Columbia MD
## 4 Columbia MD
## 5 Columbia MD
## 6 Columbia MD
## 7 Columbia MD
## 8 Columbia MD
## 9 Columbia MD
## 10 Columbia MD
## 11 Columbia MD
## 12 Columbia MD
## 13 Columbia MD
## 14 Columbia MD
## 15 Columbia MD
## 16 Columbia MD
## 17 Columbia MD
## 18 Columbia MD
## 19 Columbia MD
## 20 Columbia MD
## 21 Columbia MD
## 22 Columbia MD
## 23 Columbia MD
## 24 Columbia MD
## 25 Columbia MD
## 26 Columbia MD
## 27 Columbia MD
## 28 Columbia MD
## 29 Columbia MD
## 30 Columbia MD
## 31 Columbia MD
## 32 Columbia MD
## 33 Columbia MD
## 34 Columbia MD
## 35 Columbia MD
## 36 Columbia MD
## 37 Columbia MD
## 38 Columbia MD
## 39 Columbia MD
## 40 Columbia MD
## 41 Columbia MD
## 42 Columbia MD
## 43 Columbia MD
## 44 Columbia MD
## 45 Columbia MD
## 46 Columbia MD
## 47 Columbia MD
## 48 Columbia MD
## 49 Columbia MD
## 50 Columbia MD
## 51 Columbia MD
## 52 Columbia MD
## 53 Columbia MD
## 54 Columbia MD
## 55 Columbia MD
## 56 Columbia MD
## 57 Columbia MD
## 58 Columbia MD
## 59 Columbia MD
## 60 Columbia MD
## 61 Columbia MD
## 62 Columbia MD
## 63 Columbia MD
## 64 Columbia MD
## 65 Columbia MD
## 66 Columbia MD
## 67 Columbia MD
## 68 Columbia MD
## 69 Columbia MD
## 70 Columbia MD
## 71 Columbia MD
## 72 Columbia MD
## 73 Columbia MD
## 74 Columbia MD
## 75 Columbia MD
## 76 Columbia MD
## 77 Columbia MD
## 78 Columbia MD
## 79 Columbia MD
## jobTitle
## 1 Licensed Massage Therapist (Licensed Required)
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Licensed Massage Therapists wanted! $35-45/hour
## 7 Lisenced Massage Therapist (LMT) (RMT)
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist - Independent Contractor
## 11 Lead Massage Therapist
## 12 Stretch Practitioner- (Personal trainers or yoga instructors...
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Registered Massage Practitioner
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Licensed Massage Therapist - $1000 Hiring Bonus
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist at a Luxury Day Spa - (Gaithersburg, MD)
## 29 Massage Therapist (Weekends) at a Luxury Day Spa - (Leesburg...
## 30 Licensed Massage Therapists wanted! $35-45/hour
## 31 Licensed Massage Therapist- $1500 Hiring Bonus
## 32 Licensed Massage Therapist (Licensed Required)
## 33 Salon Massage Therapist
## 34 Senior Part Time Massage Therapist
## 35 Licensed Massage Therapist - Crofton
## 36 Maryland Licensed Massage Therapist Full-time
## 37 Licensed Massage Therapist - Washington, DC
## 38 Full-Time Massage Therapist
## 39 Massage Therapist Full-Time Rockville MD
## 40 Maryland Licensed Massage Therapist Part-time
## 41 Stretch Service Provider (Great Opportunity for Personal Tra...
## 42 Downtown Silver Spring - Massage Therapist - Full Time
## 43 Total Body Stretch Service Provider
## 44 Massage Therapist - Part-Time
## 45 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
## 46 MASSSAGE THERAPIST
## 47 Senior Licensed Massage Therapist
## 48 Salon Massage Therapist
## 49 Senior Part Time Massage Therapist
## 50 Licensed Massage Therapist - Crofton
## 51 Maryland Licensed Massage Therapist Full-time
## 52 Licensed Massage Therapist - Washington, DC
## 53 Full-Time Massage Therapist
## 54 Massage Therapist Full-Time Rockville MD
## 55 Maryland Licensed Massage Therapist Part-time
## 56 Stretch Service Provider (Great Opportunity for Personal Tra...
## 57 Downtown Silver Spring - Massage Therapist - Full Time
## 58 Total Body Stretch Service Provider
## 59 Massage Therapist - Part-Time
## 60 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
## 61 Licensed Massage Therapist - Washington, DC
## 62 Full-Time Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist Full-Time Rockville MD
## 65 Maryland Licensed Massage Therapist Part-time
## 66 Stretch Service Provider (Great Opportunity for Personal Tra...
## 67 Downtown Silver Spring - Massage Therapist - Full Time
## 68 Total Body Stretch Service Provider
## 69 Massage Therapist - Part-Time
## 70 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
## 71 Licensed Massage Therapists wanted! $35-45/hour
## 72 Licensed Massage Therapist- $1500 Hiring Bonus
## 73 Massage Therapist
## 74 Licensed Massage Therapist - $1000 Hiring Bonus
## 75 Licensed Massage Therapist
## 76 Massage Therapist
## 77 Licensed Massage Therapist (LMT)
## 78 Massage Therapist
## 79 Licensed Massage Therapist (Licensed Required)
## HiringAgency
## 1 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
## 2 Effective Integrative HealthcareMillersville, MD 21108
## 3 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 4 Nava Health and Vitality CenterColumbia, MD 21045
## 5 MIVC Spa, LLCSilver Spring, MD 20910
## 6 Acupbilling LLCGaithersburg, MD 20877
## 7 Camille Intutive WellnessBaltimore, MD 21210 (Wyndhurst area)
## 8 Life Time3.6Columbia, MD 21046+1 location
## 9 Indo-Pak Massage TherapySilver Spring, MD+1 location•Remote work available
## 10 Chiseled LifeColumbia, MD 21046
## 11 Hand & Stone Virginia and Maryland3.0Olney, MD 20832
## 12 ME Spa3.8Ellicott City, MD
## 13 Elements3.6Crofton, MD 21114+2 locations
## 14 FGG Spa, LLCColumbia, MD 21045+3 locations
## 15 FGG Spa, LLCColumbia, MD 21045+3 locations
## 16 Nava Health and Vitality CenterColumbia, MD 21045
## 17 Janna's Salon and SpaOwings Mills, MD 21117
## 18 Effective Integrative HealthcareMillersville, MD 21108
## 19 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 20 MIVC Spa, LLCSilver Spring, MD 20910
## 21 Massage Envy3.2College Park, MD 20740
## 22 SILVER SPRING HAIR SCALP & BODY MEDICAL SPALON & A...Silver Spring, MD 20910
## 23 Studio 7 The Salon and SpaBaltimore, MD 21230 (Riverside area)
## 24 Massage Envy Ellicott CityEllicott City, MD 21042
## 25 Mend AcupunctureBaltimore, MD 21211 (Remington area)
## 26 About Faces TimoniumLutherville-Timonium, MD 21093
## 27 Blue Heron Wellness4.2Silver Spring, MD 20901
## 28 The Woodhouse Day Spa - Gaithersburg & LeesburgGaithersburg, MD 20878
## 29 The Woodhouse Day Spa - Gaithersburg & LeesburgGaithersburg, MD 20878
## 30 Acupbilling LLCGaithersburg, MD 20877
## 31 Massage Envy3.2Woodmore, MD
## 32 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
## 33 JCPenney3.7Wheaton, MD 20902
## 34 Hand and Stone3.0Olney, MD 20832
## 35 Massage Envy3.2Gambrills, MD 21054
## 36 Massage Envy3.2Westminster, MD 21157
## 37 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 38 Massage Envy3.2Gambrills, MD 21054
## 39 Massage Envy3.2Rockville, MD 20852+1 location
## 40 Massage Envy3.2Westminster, MD 21157
## 41 Massage Envy3.2Lanham, MD 20706
## 42 Massage Envy3.2Silver Spring, MD 20910
## 43 Massage Envy3.2Severna Park, MD 21146+1 location
## 44 Massage Envy3.2Nottingham, MD 21236+1 location
## 45 Jamie L. JonesWashington, DC 20022
## 46 Massage Envy3.2Elkridge, MD 21075
## 47 Hand and Stone3.0Olney, MD 20832
## 48 JCPenney3.7Wheaton, MD 20902
## 49 Hand and Stone3.0Olney, MD 20832
## 50 Massage Envy3.2Gambrills, MD 21054
## 51 Massage Envy3.2Westminster, MD 21157
## 52 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 53 Massage Envy3.2Gambrills, MD 21054
## 54 Massage Envy3.2Rockville, MD 20852+1 location
## 55 Massage Envy3.2Westminster, MD 21157
## 56 Massage Envy3.2Lanham, MD 20706
## 57 Massage Envy3.2Silver Spring, MD 20910
## 58 Massage Envy3.2Severna Park, MD 21146+1 location
## 59 Massage Envy3.2Nottingham, MD 21236+1 location
## 60 Jamie L. JonesWashington, DC 20022
## 61 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 62 Massage Envy3.2Gambrills, MD 21054
## 63 Massage Envy3.2Annapolis, MD 21401+1 location
## 64 Massage Envy3.2Rockville, MD 20852+1 location
## 65 Massage Envy3.2Westminster, MD 21157
## 66 Massage Envy3.2Lanham, MD 20706
## 67 Massage Envy3.2Silver Spring, MD 20910
## 68 Massage Envy3.2Severna Park, MD 21146+1 location
## 69 Massage Envy3.2Nottingham, MD 21236+1 location
## 70 Jamie L. JonesWashington, DC 20022
## 71 Acupbilling LLCGaithersburg, MD 20877
## 72 Massage Envy3.2Woodmore, MD
## 73 MIVC Spa, LLCSilver Spring, MD 20910
## 74 Massage Envy3.2College Park, MD 20740
## 75 Nava Health and Vitality CenterColumbia, MD 21045
## 76 Janna's Salon and SpaOwings Mills, MD 21117
## 77 Effective Integrative HealthcareMillersville, MD 21108
## 78 Your Body Needs...Massage and AromatherapyAnnapolis, MD 21401
## 79 Total Women's Health of BaltimoreBaltimore, MD 21209 (Cheswolde area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 14 75 25000 35000
## 2 6 14 75 25000 35000
## 3 7 14 75 25000 35000
## 4 30 14 75 25000 35000
## 5 30 14 75 25000 35000
## 6 30 14 75 25000 35000
## 7 5 14 75 25000 35000
## 8 30 14 75 25000 35000
## 9 5 14 75 25000 35000
## 10 17 14 75 25000 35000
## 11 6 14 75 25000 35000
## 12 18 14 75 25000 35000
## 13 30 14 75 25000 35000
## 14 15 14 75 25000 35000
## 15 15 14 75 25000 35000
## 16 30 14 75 25000 35000
## 17 13 14 75 25000 35000
## 18 6 14 75 25000 35000
## 19 7 14 75 25000 35000
## 20 30 14 75 25000 35000
## 21 30 14 75 25000 35000
## 22 30 14 75 25000 35000
## 23 13 14 75 25000 35000
## 24 30 14 75 25000 35000
## 25 30 14 75 25000 35000
## 26 30 14 75 25000 35000
## 27 18 14 75 25000 35000
## 28 18 14 75 25000 35000
## 29 18 14 75 25000 35000
## 30 30 14 75 25000 35000
## 31 30 14 75 25000 35000
## 32 30 14 75 25000 35000
## 33 30 14 75 25000 35000
## 34 30 14 75 25000 35000
## 35 30 14 75 25000 35000
## 36 12 14 75 25000 35000
## 37 30 14 75 25000 35000
## 38 30 14 75 25000 35000
## 39 30 14 75 25000 35000
## 40 12 14 75 25000 35000
## 41 30 14 75 25000 35000
## 42 30 14 75 25000 35000
## 43 30 14 75 25000 35000
## 44 30 14 75 25000 35000
## 45 30 14 75 25000 35000
## 46 30 14 75 25000 35000
## 47 30 14 75 25000 35000
## 48 30 14 75 25000 35000
## 49 30 14 75 25000 35000
## 50 30 14 75 25000 35000
## 51 12 14 75 25000 35000
## 52 30 14 75 25000 35000
## 53 30 14 75 25000 35000
## 54 30 14 75 25000 35000
## 55 12 14 75 25000 35000
## 56 30 14 75 25000 35000
## 57 30 14 75 25000 35000
## 58 30 14 75 25000 35000
## 59 30 14 75 25000 35000
## 60 30 14 75 25000 35000
## 61 30 14 75 25000 35000
## 62 30 14 75 25000 35000
## 63 30 14 75 25000 35000
## 64 30 14 75 25000 35000
## 65 12 14 75 25000 35000
## 66 30 14 75 25000 35000
## 67 30 14 75 25000 35000
## 68 30 14 75 25000 35000
## 69 30 14 75 25000 35000
## 70 30 14 75 25000 35000
## 71 30 14 75 25000 35000
## 72 30 14 75 25000 35000
## 73 30 14 75 25000 35000
## 74 30 14 75 25000 35000
## 75 30 14 75 25000 35000
## 76 13 14 75 25000 35000
## 77 6 14 75 25000 35000
## 78 7 14 75 25000 35000
## 79 30 14 75 25000 35000
getIndeedJobData5pages("massage therapist","Germantown","MD")
## Warning in getIndeedJobData5pages("massage therapist", "Germantown", "MD"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Germantown", "MD"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Germantown", "MD"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapists wanted! $35-45/hour
## 3 Stretch Therapist-Stretchologist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Massage Therapist
## 8 Lead Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Massage Therapist at Luxury Day Spa
## 12 Massage Therapist at a Luxury Day Spa - (Gaithersburg, MD)
## 13 Part Time Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Salon Managers, Stylists, Nail Techs, Estheticians & Massage...
## 18 Salon Massage Therapist
## 19 Registered Massage Practitioner
## 20 Senior Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Senior Licensed Massage Therapist
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist (LMT)
## 25 Senior Part Time Massage Therapist
## 26 Licensed Massage Therapist- $1000 Hiring Bonus
## 27 Registered Massage Practitioner
## 28 Massage Therapist
## 29 Virginia Licensed Massage Therapists Needed - Work Here, Sta...
## 30 Licensed Massage Therapist -Ballston, VA
## 31 Certified Massage Therapist
## 32 Licensed Massage Therapist
## 33 Virginia Licensed Massage Therapists Needed - Work Here, Sta...
## 34 Licensed Massage Therapist
## 35 Certified Massage Therapist
## 36 Massage Therapist- Full or Part Time (Ashburn, VA)
## 37 Licensed Massage Therapist
## 38 Stretch Practitioner
## 39 Massage Therapist Full-Time Rockville MD
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist, Independent Contractor
## 42 Licensed Massage Therapist- $1000 Hiring Bonus
## 43 Licensed Massage Therapist
## 44 Part-Time Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist - Washington, DC
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist- $1000 Hiring Bonus
## 49 Massage Therapist
## 50 Massage Therapist
## 51 Healthy Licensed Massage Therapist- $55,000 plus annually
## 52 Massage Therapist Part-Time Rockville, MD
## 53 Licensed Massage Therapist- 2 spots open- LUCRATIVE OPPORTUN...
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Downtown Silver Spring - Massage Therapist - Full Time
## 58 Licensed Massage Therapist (LMT)
## 59 Stretch Service Provider
## 60 Licensed Massage Therapist
## 61 Massage Therapist - Full or Part Time
## 62 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$19 - $28 an hour $19 - $28 19.0 28.0
## 2 \n$35 - $45 an hour $35 - $45 35.0 45.0
## 3 \n$15 - $40 an hour $15 - $40 15.0 40.0
## 4 \n$70 - $90 an hour $70 - $90 70.0 90.0
## 5 \n$26 - $36 an hour $26 - $36 26.0 36.0
## 6 \n$40 - $50 an hour $40 - $50 40.0 50.0
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000.0
## 8 \n$60,000 a year $60000 60000.0 NA
## 9 \n$40 - $55 an hour $40 - $55 40.0 55.0
## 10 \n$35 - $53 an hour $35 - $53 35.0 53.0
## 11 \n$40 - $50 an hour $40 - $50 40.0 50.0
## 12 \n$30 - $40 an hour $30 - $40 30.0 40.0
## 13 \n$30 - $60 an hour $30 - $60 30.0 60.0
## 14 \n$50,000 - $150,000 a year $50000 - $150000 50000.0 150000.0
## 15 \n$40 - $60 an hour $40 - $60 40.0 60.0
## 16 \n$65 - $85 an hour $65 - $85 65.0 85.0
## 17 \n$40 an hour $40 40.0 NA
## 18 \n$20 - $22 an hour $20 - $22 20.0 22.0
## 19 \n$43,602 - $55,151 a year $43602 - $55151 43602.0 55151.0
## 20 \n$45 - $70 an hour $45 - $70 45.0 70.0
## 21 \n$60 - $65 an hour $60 - $65 60.0 65.0
## 22 \n$25 - $65 an hour $25 - $65 25.0 65.0
## 23 \n$35 - $50 an hour $35 - $50 35.0 50.0
## 24 \n$45,000 - $55,000 a year $45000 - $55000 45000.0 55000.0
## 25 \n$45,000 - $65,000 a year $45000 - $65000 45000.0 65000.0
## 26 \n$47.50 - $66.50 an hour $47.50 - $66.50 47.5 66.5
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 40 50 9590.75 11750.82 15
## 2 40 50 9590.75 11750.82 15
## 3 40 50 9590.75 11750.82 15
## 4 40 50 9590.75 11750.82 15
## 5 40 50 9590.75 11750.82 15
## 6 40 50 9590.75 11750.82 15
## 7 40 50 9590.75 11750.82 15
## 8 40 50 9590.75 11750.82 15
## 9 40 50 9590.75 11750.82 15
## 10 40 50 9590.75 11750.82 15
## 11 40 50 9590.75 11750.82 15
## 12 40 50 9590.75 11750.82 15
## 13 40 50 9590.75 11750.82 15
## 14 40 50 9590.75 11750.82 15
## 15 40 50 9590.75 11750.82 15
## 16 40 50 9590.75 11750.82 15
## 17 40 50 9590.75 11750.82 15
## 18 40 50 9590.75 11750.82 15
## 19 40 50 9590.75 11750.82 15
## 20 40 50 9590.75 11750.82 15
## 21 40 50 9590.75 11750.82 15
## 22 40 50 9590.75 11750.82 15
## 23 40 50 9590.75 11750.82 15
## 24 40 50 9590.75 11750.82 15
## 25 40 50 9590.75 11750.82 15
## 26 40 50 9590.75 11750.82 15
## maximumMaxSalary
## 1 150000
## 2 150000
## 3 150000
## 4 150000
## 5 150000
## 6 150000
## 7 150000
## 8 150000
## 9 150000
## 10 150000
## 11 150000
## 12 150000
## 13 150000
## 14 150000
## 15 150000
## 16 150000
## 17 150000
## 18 150000
## 19 150000
## 20 150000
## 21 150000
## 22 150000
## 23 150000
## 24 150000
## 25 150000
## 26 150000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 12
## 4 Just posted
## 5 8
## 6 30
## 7 30
## 8 6
## 9 5
## 10 6
## 11 21
## 12 18
## 13 6
## 14 21
## 15 9
## 16 25
## 17 30
## 18 30
## 19 15
## 20 6
## 21 24
## 22 30
## 23 17
## 24 10
## 25 30
## 26 30
## 27 30
## 28 19
## 29 12
## 30 30
## 31 29
## 32 24
## 33 12
## 34 30
## 35 6
## 36 30
## 37 30
## 38 21
## 39 30
## 40 28
## 41 5
## 42 30
## 43 13
## 44 30
## 45 30
## 46 30
## 47 6
## 48 30
## 49 30
## 50 30
## 51 21
## 52 30
## 53 12
## 54 14
## 55 30
## 56 30
## 57 30
## 58 5
## 59 30
## 60 30
## 61 30
## 62 30
##
## [[4]]
## HiringAgency
## 1 MIVC Spa, LLCSilver Spring, MD 20910
## 2 Acupbilling LLCGaithersburg, MD 20877
## 3 Stretch Smart Infrared TherapyArlington, VA 22201 (Clarendon-Courthouse area)
## 4 InTouch Mobile SpaMaryland
## 5 Hand and Stone Massage & Facial SpaWashington, DC
## 6 Nava Health and Vitality CenterBethesda, MD 20817
## 7 Life Time3.6Gaithersburg, MD 20878+2 locations
## 8 Hand & Stone Virginia and Maryland3.0Olney, MD 20832
## 9 Indo-Pak Massage TherapySilver Spring, MD+2 locations•Remote work available
## 10 Hand & Stone OlneyOlney, MD 20832
## 11 The Woodhouse Day Spa - North BethesdaNorth Bethesda, MD 20852
## 12 The Woodhouse Day Spa - Gaithersburg & LeesburgGaithersburg, MD 20878+1 location
## 13 Hand & Stone OlneyOlney, MD 20832
## 14 Hand & Stone Virginia and Maryland3.0Olney, MD 20832+4 locations
## 15 SkintelligenceVienna, VA 22180
## 16 Phenix Salon Suites3.9Laurel, MD 20707
## 17 Dante Salon & Wellness Spa5.0Fairfax, VA 22030
## 18 JCPenney3.7Wheaton, MD 20902
## 19 FGG Spa, LLCGaithersburg, MD 20878+1 location
## 20 Hand & Stone OlneyOlney, MD 20832
## 21 Soothe3.7Washington, DC 20036 (Downtown area)
## 22 Hand and Stone3.0Olney, MD 20832
## 23 Chiseled LifeColumbia, MD 21046
## 24 MassageArts@Rapha ClinicArlington, VA 22209 (North Rosslyn area)
## 25 Hand and Stone3.0Olney, MD 20832
## 26 Massage Envy3.2Laurel, MD 20707
## 27 Hand and Stone3.0Gaithersburg, MD 20878+1 location
## 28 Lansdowne Resort & Spa3.9Leesburg, VA 20176
## 29 Great Eastern Resort ManagementWashington, DC
## 30 Aura spaArlington, VA 22203 (Ashton Heights area)
## 31 Leesburg Chiropractic & Massage, PLLCLeesburg, VA
## 32 Soothe3.7Washington, DC 20036 (Downtown area)
## 33 Great Eastern Resort ManagementWashington, DC
## 34 PS Lifestyle3.0Ashburn, VA+1 location
## 35 FAR Government, Inc.Langley, VA
## 36 The NOW, LLCAshburn, VA 20147
## 37 Elements3.6Ashburn, VA 20147+1 location
## 38 Stretch Zone2.7Ashburn, VA 20147
## 39 Massage Envy3.2Rockville, MD 20852
## 40 Spa NoaReston, VA 20190 (Sunset Hills area)
## 41 Pinecrest Wellness CenterAnnandale, VA 22003
## 42 Massage Envy3.2Laurel, MD 20707
## 43 Georgetown Massage and BodyworkWashington, DC 20007 (Georgetown area)
## 44 Country Club of Fairfax3.6Fairfax, VA 22030
## 45 Alexandre de ParisFairfax, VA 22033
## 46 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 47 The Women's Club Fitness Center & Day SpaHerndon, VA+3 locations
## 48 Massage Envy3.2Laurel, MD 20707
## 49 WTS International3.3Washington, DC 20001 (Chinatown area)
## 50 Massage ForeverArlington, VA 22206 (Fairlington-Shirlington area)
## 51 Wellness Clinic4.0Leesburg, VA 20175
## 52 Massage Envy3.2Rockville, MD 20852
## 53 Wellness Clinic4.0Herndon, VA 20171
## 54 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 55 Life Time3.6Sterling, VA 20166+2 locations
## 56 Massage Envy Ellicott CityEllicott City, MD 21042
## 57 Massage Envy3.2Silver Spring, MD 20910
## 58 West Trail Wellness and MassagePurcellville, VA 20132
## 59 Massage Envy3.2Ashburn, VA 20147
## 60 Massage Heights3.1Falls Church, VA 22043
## 61 Massage Envy3.2Reston, VA 20194+2 locations
## 62 Jamie L. JonesWashington, DC 20022
##
## [[5]]
## Salary salary minSalary maxSalary
## 8 \n$60,000 a year $60000 60000 NA
## 14 \n$50,000 - $150,000 a year $50000 - $150000 50000 150000
## 19 \n$43,602 - $55,151 a year $43602 - $55151 43602 55151
## 24 \n$45,000 - $55,000 a year $45000 - $55000 45000 55000
## 25 \n$45,000 - $65,000 a year $45000 - $65000 45000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 8 45000 60075.5 48720.4 81287.75 43602
## 14 45000 60075.5 48720.4 81287.75 43602
## 19 45000 60075.5 48720.4 81287.75 43602
## 24 45000 60075.5 48720.4 81287.75 43602
## 25 45000 60075.5 48720.4 81287.75 43602
## maximumMaxSalary
## 8 150000
## 14 150000
## 19 150000
## 24 150000
## 25 150000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$19 - $28 an hour $19 - $28 19.0 28.0
## 2 \n$35 - $45 an hour $35 - $45 35.0 45.0
## 3 \n$15 - $40 an hour $15 - $40 15.0 40.0
## 4 \n$70 - $90 an hour $70 - $90 70.0 90.0
## 5 \n$26 - $36 an hour $26 - $36 26.0 36.0
## 6 \n$40 - $50 an hour $40 - $50 40.0 50.0
## 9 \n$40 - $55 an hour $40 - $55 40.0 55.0
## 10 \n$35 - $53 an hour $35 - $53 35.0 53.0
## 11 \n$40 - $50 an hour $40 - $50 40.0 50.0
## 12 \n$30 - $40 an hour $30 - $40 30.0 40.0
## 13 \n$30 - $60 an hour $30 - $60 30.0 60.0
## 15 \n$40 - $60 an hour $40 - $60 40.0 60.0
## 16 \n$65 - $85 an hour $65 - $85 65.0 85.0
## 17 \n$40 an hour $40 40.0 NA
## 18 \n$20 - $22 an hour $20 - $22 20.0 22.0
## 20 \n$45 - $70 an hour $45 - $70 45.0 70.0
## 21 \n$60 - $65 an hour $60 - $65 60.0 65.0
## 22 \n$25 - $65 an hour $25 - $65 25.0 65.0
## 23 \n$35 - $50 an hour $35 - $50 35.0 50.0
## 26 \n$47.50 - $66.50 an hour $47.50 - $66.50 47.5 66.5
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 37.5 53 37.875 54.23684 15
## 2 37.5 53 37.875 54.23684 15
## 3 37.5 53 37.875 54.23684 15
## 4 37.5 53 37.875 54.23684 15
## 5 37.5 53 37.875 54.23684 15
## 6 37.5 53 37.875 54.23684 15
## 9 37.5 53 37.875 54.23684 15
## 10 37.5 53 37.875 54.23684 15
## 11 37.5 53 37.875 54.23684 15
## 12 37.5 53 37.875 54.23684 15
## 13 37.5 53 37.875 54.23684 15
## 15 37.5 53 37.875 54.23684 15
## 16 37.5 53 37.875 54.23684 15
## 17 37.5 53 37.875 54.23684 15
## 18 37.5 53 37.875 54.23684 15
## 20 37.5 53 37.875 54.23684 15
## 21 37.5 53 37.875 54.23684 15
## 22 37.5 53 37.875 54.23684 15
## 23 37.5 53 37.875 54.23684 15
## 26 37.5 53 37.875 54.23684 15
## maximumMaxSalary
## 1 90
## 2 90
## 3 90
## 4 90
## 5 90
## 6 90
## 9 90
## 10 90
## 11 90
## 12 90
## 13 90
## 15 90
## 16 90
## 17 90
## 18 90
## 20 90
## 21 90
## 22 90
## 23 90
## 26 90
##
## [[7]]
## city state
## 1 Germantown MD
## 2 Germantown MD
## 3 Germantown MD
## 4 Germantown MD
## 5 Germantown MD
## 6 Germantown MD
## 7 Germantown MD
## 8 Germantown MD
## 9 Germantown MD
## 10 Germantown MD
## 11 Germantown MD
## 12 Germantown MD
## 13 Germantown MD
## 14 Germantown MD
## 15 Germantown MD
## 16 Germantown MD
## 17 Germantown MD
## 18 Germantown MD
## 19 Germantown MD
## 20 Germantown MD
## 21 Germantown MD
## 22 Germantown MD
## 23 Germantown MD
## 24 Germantown MD
## 25 Germantown MD
## 26 Germantown MD
## 27 Germantown MD
## 28 Germantown MD
## 29 Germantown MD
## 30 Germantown MD
## 31 Germantown MD
## 32 Germantown MD
## 33 Germantown MD
## 34 Germantown MD
## 35 Germantown MD
## 36 Germantown MD
## 37 Germantown MD
## 38 Germantown MD
## 39 Germantown MD
## 40 Germantown MD
## 41 Germantown MD
## 42 Germantown MD
## 43 Germantown MD
## 44 Germantown MD
## 45 Germantown MD
## 46 Germantown MD
## 47 Germantown MD
## 48 Germantown MD
## 49 Germantown MD
## 50 Germantown MD
## 51 Germantown MD
## 52 Germantown MD
## 53 Germantown MD
## 54 Germantown MD
## 55 Germantown MD
## 56 Germantown MD
## 57 Germantown MD
## 58 Germantown MD
## 59 Germantown MD
## 60 Germantown MD
## 61 Germantown MD
## 62 Germantown MD
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapists wanted! $35-45/hour
## 3 Stretch Therapist-Stretchologist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Massage Therapist
## 8 Lead Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Massage Therapist at Luxury Day Spa
## 12 Massage Therapist at a Luxury Day Spa - (Gaithersburg, MD)
## 13 Part Time Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Salon Managers, Stylists, Nail Techs, Estheticians & Massage...
## 18 Salon Massage Therapist
## 19 Registered Massage Practitioner
## 20 Senior Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Senior Licensed Massage Therapist
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist (LMT)
## 25 Senior Part Time Massage Therapist
## 26 Licensed Massage Therapist- $1000 Hiring Bonus
## 27 Registered Massage Practitioner
## 28 Massage Therapist
## 29 Virginia Licensed Massage Therapists Needed - Work Here, Sta...
## 30 Licensed Massage Therapist -Ballston, VA
## 31 Certified Massage Therapist
## 32 Licensed Massage Therapist
## 33 Virginia Licensed Massage Therapists Needed - Work Here, Sta...
## 34 Licensed Massage Therapist
## 35 Certified Massage Therapist
## 36 Massage Therapist- Full or Part Time (Ashburn, VA)
## 37 Licensed Massage Therapist
## 38 Stretch Practitioner
## 39 Massage Therapist Full-Time Rockville MD
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist, Independent Contractor
## 42 Licensed Massage Therapist- $1000 Hiring Bonus
## 43 Licensed Massage Therapist
## 44 Part-Time Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist - Washington, DC
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist- $1000 Hiring Bonus
## 49 Massage Therapist
## 50 Massage Therapist
## 51 Healthy Licensed Massage Therapist- $55,000 plus annually
## 52 Massage Therapist Part-Time Rockville, MD
## 53 Licensed Massage Therapist- 2 spots open- LUCRATIVE OPPORTUN...
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Downtown Silver Spring - Massage Therapist - Full Time
## 58 Licensed Massage Therapist (LMT)
## 59 Stretch Service Provider
## 60 Licensed Massage Therapist
## 61 Massage Therapist - Full or Part Time
## 62 Licensed Psychotherapist (LPC, LISW, LICSW, LMT, LGPC) Distr...
## HiringAgency
## 1 MIVC Spa, LLCSilver Spring, MD 20910
## 2 Acupbilling LLCGaithersburg, MD 20877
## 3 Stretch Smart Infrared TherapyArlington, VA 22201 (Clarendon-Courthouse area)
## 4 InTouch Mobile SpaMaryland
## 5 Hand and Stone Massage & Facial SpaWashington, DC
## 6 Nava Health and Vitality CenterBethesda, MD 20817
## 7 Life Time3.6Gaithersburg, MD 20878+2 locations
## 8 Hand & Stone Virginia and Maryland3.0Olney, MD 20832
## 9 Indo-Pak Massage TherapySilver Spring, MD+2 locations•Remote work available
## 10 Hand & Stone OlneyOlney, MD 20832
## 11 The Woodhouse Day Spa - North BethesdaNorth Bethesda, MD 20852
## 12 The Woodhouse Day Spa - Gaithersburg & LeesburgGaithersburg, MD 20878+1 location
## 13 Hand & Stone OlneyOlney, MD 20832
## 14 Hand & Stone Virginia and Maryland3.0Olney, MD 20832+4 locations
## 15 SkintelligenceVienna, VA 22180
## 16 Phenix Salon Suites3.9Laurel, MD 20707
## 17 Dante Salon & Wellness Spa5.0Fairfax, VA 22030
## 18 JCPenney3.7Wheaton, MD 20902
## 19 FGG Spa, LLCGaithersburg, MD 20878+1 location
## 20 Hand & Stone OlneyOlney, MD 20832
## 21 Soothe3.7Washington, DC 20036 (Downtown area)
## 22 Hand and Stone3.0Olney, MD 20832
## 23 Chiseled LifeColumbia, MD 21046
## 24 MassageArts@Rapha ClinicArlington, VA 22209 (North Rosslyn area)
## 25 Hand and Stone3.0Olney, MD 20832
## 26 Massage Envy3.2Laurel, MD 20707
## 27 Hand and Stone3.0Gaithersburg, MD 20878+1 location
## 28 Lansdowne Resort & Spa3.9Leesburg, VA 20176
## 29 Great Eastern Resort ManagementWashington, DC
## 30 Aura spaArlington, VA 22203 (Ashton Heights area)
## 31 Leesburg Chiropractic & Massage, PLLCLeesburg, VA
## 32 Soothe3.7Washington, DC 20036 (Downtown area)
## 33 Great Eastern Resort ManagementWashington, DC
## 34 PS Lifestyle3.0Ashburn, VA+1 location
## 35 FAR Government, Inc.Langley, VA
## 36 The NOW, LLCAshburn, VA 20147
## 37 Elements3.6Ashburn, VA 20147+1 location
## 38 Stretch Zone2.7Ashburn, VA 20147
## 39 Massage Envy3.2Rockville, MD 20852
## 40 Spa NoaReston, VA 20190 (Sunset Hills area)
## 41 Pinecrest Wellness CenterAnnandale, VA 22003
## 42 Massage Envy3.2Laurel, MD 20707
## 43 Georgetown Massage and BodyworkWashington, DC 20007 (Georgetown area)
## 44 Country Club of Fairfax3.6Fairfax, VA 22030
## 45 Alexandre de ParisFairfax, VA 22033
## 46 Flamingo4.2Washington, DC 20002 (Capitol Hill area)
## 47 The Women's Club Fitness Center & Day SpaHerndon, VA+3 locations
## 48 Massage Envy3.2Laurel, MD 20707
## 49 WTS International3.3Washington, DC 20001 (Chinatown area)
## 50 Massage ForeverArlington, VA 22206 (Fairlington-Shirlington area)
## 51 Wellness Clinic4.0Leesburg, VA 20175
## 52 Massage Envy3.2Rockville, MD 20852
## 53 Wellness Clinic4.0Herndon, VA 20171
## 54 Massage Envy- Ellicott City MDEllicott City, MD 21042
## 55 Life Time3.6Sterling, VA 20166+2 locations
## 56 Massage Envy Ellicott CityEllicott City, MD 21042
## 57 Massage Envy3.2Silver Spring, MD 20910
## 58 West Trail Wellness and MassagePurcellville, VA 20132
## 59 Massage Envy3.2Ashburn, VA 20147
## 60 Massage Heights3.1Falls Church, VA 22043
## 61 Massage Envy3.2Reston, VA 20194+2 locations
## 62 Jamie L. JonesWashington, DC 20022
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 15 90 43602 150000
## 2 30 15 90 43602 150000
## 3 12 15 90 43602 150000
## 4 Just posted 15 90 43602 150000
## 5 8 15 90 43602 150000
## 6 30 15 90 43602 150000
## 7 30 15 90 43602 150000
## 8 6 15 90 43602 150000
## 9 5 15 90 43602 150000
## 10 6 15 90 43602 150000
## 11 21 15 90 43602 150000
## 12 18 15 90 43602 150000
## 13 6 15 90 43602 150000
## 14 21 15 90 43602 150000
## 15 9 15 90 43602 150000
## 16 25 15 90 43602 150000
## 17 30 15 90 43602 150000
## 18 30 15 90 43602 150000
## 19 15 15 90 43602 150000
## 20 6 15 90 43602 150000
## 21 24 15 90 43602 150000
## 22 30 15 90 43602 150000
## 23 17 15 90 43602 150000
## 24 10 15 90 43602 150000
## 25 30 15 90 43602 150000
## 26 30 15 90 43602 150000
## 27 30 15 90 43602 150000
## 28 19 15 90 43602 150000
## 29 12 15 90 43602 150000
## 30 30 15 90 43602 150000
## 31 29 15 90 43602 150000
## 32 24 15 90 43602 150000
## 33 12 15 90 43602 150000
## 34 30 15 90 43602 150000
## 35 6 15 90 43602 150000
## 36 30 15 90 43602 150000
## 37 30 15 90 43602 150000
## 38 21 15 90 43602 150000
## 39 30 15 90 43602 150000
## 40 28 15 90 43602 150000
## 41 5 15 90 43602 150000
## 42 30 15 90 43602 150000
## 43 13 15 90 43602 150000
## 44 30 15 90 43602 150000
## 45 30 15 90 43602 150000
## 46 30 15 90 43602 150000
## 47 6 15 90 43602 150000
## 48 30 15 90 43602 150000
## 49 30 15 90 43602 150000
## 50 30 15 90 43602 150000
## 51 21 15 90 43602 150000
## 52 30 15 90 43602 150000
## 53 12 15 90 43602 150000
## 54 14 15 90 43602 150000
## 55 30 15 90 43602 150000
## 56 30 15 90 43602 150000
## 57 30 15 90 43602 150000
## 58 5 15 90 43602 150000
## 59 30 15 90 43602 150000
## 60 30 15 90 43602 150000
## 61 30 15 90 43602 150000
## 62 30 15 90 43602 150000
Massachusettes Boston, Worcestor, Springfield
getIndeedJobData5pages("massage therapist","Boston","MA")
## Warning in getIndeedJobData5pages("massage therapist", "Boston", "MA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Boston", "MA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Boston", "MA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Boston", "MA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist With $300 Signing Bonus!
## 3 Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 4 Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 5 Licensed Massage Therapist (LMT)
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Licensed Massage Therapist (LMT)
## 12 Massage Therapist
## 13 Massage Therapist
## 14 LICENSED MASSAGE THERAPISTS
## 15 Stretch Therapist
## 16 Licensed Massage Therapist - South End, Boston - Prime Shift...
## 17 Massage Therapist - Full Time
## 18 Licensed Massage Therapist
## 19 Massage Therapist
## 20 Massage Therapist - Skin Spa Back Bay
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Myofascial Release Massage Therapist
## 24 Stretch Therapist / Fitness Professional / Personal Trainer
## 25 Licensed Massage Therapist (LMT)
## 26 Spa Space available to share! ESTHETICIAN,MASSAGE, MAKE-UP,...
## 27 Licensed Massage Therapist
## 28 Massage Therapist Full-Time 60-70K
## 29 Massage Therapist - PartTime
## 30 Licensed Massage Therapist
## 31 Massage Therapist- Part-Time
## 32 Licensed Massage Therapist (LMT)
## 33 Massage Therapist- Full Time *Flexible*
## 34 Licensed Massage Therapist - Immediate Clients Available!
## 35 Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist With $300 Signing Bonus!
## 40 Licensed Massage Therapist (LMT)
## 41 Spa Space available to share! ESTHETICIAN,MASSAGE, MAKE-UP,...
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist (LMT)
## 44 Massage Therapist Full-Time 60-70K
## 45 Massage Therapist - PartTime
## 46 Licensed Massage Therapist - Full Time
## 47 Licensed Massage Therapist
## 48 Massage Therapist- Part-Time
## 49 Licensed Massage Therapist (LMT)
## 50 Licensed Massage Therapist (LMT)
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Massage Therapist
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist With $300 Signing Bonus!
## 61 Massage Therapist- Full Time *Flexible*
## 62 Licensed Massage Therapist
## 63 Massage Therapist-Full Time Nights & Weekends
## 64 Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 65 Licensed Massage Therapist (LMT)
## 66 Massage Therapist
## 67 Licensed Massage Therapist (LMT)
## 68 Licensed Massage Therapist (LMT)
## 69 Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 70 Licensed Massage Therapist (LMT)
## 71 Licensed Massage Therapist/$/NeedASAP
## 72 Licensed Massage Therapist - Immediate Clients Available!
## 73 Massage Therapist Full-Time 60-70K
## 74 Massage Therapist - PartTime
## 75 Licensed Massage Therapist - Full Time
## 76 Licensed Massage Therapist
## 77 Massage Therapist- Part-Time
## 78 Licensed Massage Therapist (LMT)
## 79 Licensed Massage Therapist (LMT)
## 80 Massage Therapist- Full Time *Flexible*
## 81 Licensed Massage Therapist
## 82 Massage Therapist-Full Time Nights & Weekends
## 83 Licensed Massage Therapist
## 84 Licensed Massage Therapist
## 85 Licensed Massage Therapist With $300 Signing Bonus!
## 86 Licensed Massage Therapist (LMT)
## 87 Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 88 Licensed Massage Therapist
## 89 Massage Therapist
## 90 Licensed Massage Therapist
## 91 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25 - $38 an hour $25 - $38 25 38
## 2 \n$48 - $59 an hour $48 - $59 48 59
## 3 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 4 \n$32 - $36 an hour $32 - $36 32 36
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$39 - $55 an hour $39 - $55 39 55
## 7 \n$40 - $52 an hour $40 - $52 40 52
## 8 \n$35 an hour $35 35 NA
## 9 \n$20 - $32 an hour $20 - $32 20 32
## 10 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 11 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 12 \n$20 - $30 an hour $20 - $30 20 30
## 13 \nUp to $1,000 a week $1000 a week NA NA
## 14 \n$35 - $45 an hour $35 - $45 35 45
## 15 \n$25 - $31 an hour $25 - $31 25 31
## 16 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 17 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 18 \n$24 - $38 an hour $24 - $38 24 38
## 19 \n$18 an hour $18 18 NA
## 20 \n$50,000 a year $50000 50000 NA
## 21 \n$48 - $59 an hour $48 - $59 48 59
## 22 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 23 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 24 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 25 \n$25 - $31 an hour $25 - $31 25 31
## 26 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 27 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 28 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 29 \n$24 - $38 an hour $24 - $38 24 38
## 30 \n$45,760 a year $45760 45760 NA
## 31 \n$15 - $20 an hour $15 - $20 15 20
## 32 \n$25 - $38 an hour $25 - $38 25 38
## 33 \n$15 - $20 an hour $15 - $20 15 20
## 34 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 35 \n$25 - $38 an hour $25 - $38 25 38
## 36 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 37 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 38 \n$18 an hour $18 18 NA
## 39 \n$48 - $59 an hour $48 - $59 48 59
## 40 \n$32 - $36 an hour $32 - $36 32 36
## 41 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 42 \n$45,760 a year $45760 45760 NA
## 43 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 44 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 45 \n$30 - $50 an hour $30 - $50 30 50
## 46 \n$50,000 a year $50000 50000 NA
## 47 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 48 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 49 \n$24 - $38 an hour $24 - $38 24 38
## 50 \n$45,760 a year $45760 45760 NA
## 51 \n$18 an hour $18 18 NA
## 52 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 53 \n$48 - $59 an hour $48 - $59 48 59
## 54 \n$15 - $20 an hour $15 - $20 15 20
## 55 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 56 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 57 \n$25 - $38 an hour $25 - $38 25 38
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 2524 59 18266.11 22977.47 15
## 2 2524 59 18266.11 22977.47 15
## 3 2524 59 18266.11 22977.47 15
## 4 2524 59 18266.11 22977.47 15
## 5 2524 59 18266.11 22977.47 15
## 6 2524 59 18266.11 22977.47 15
## 7 2524 59 18266.11 22977.47 15
## 8 2524 59 18266.11 22977.47 15
## 9 2524 59 18266.11 22977.47 15
## 10 2524 59 18266.11 22977.47 15
## 11 2524 59 18266.11 22977.47 15
## 12 2524 59 18266.11 22977.47 15
## 13 2524 59 18266.11 22977.47 15
## 14 2524 59 18266.11 22977.47 15
## 15 2524 59 18266.11 22977.47 15
## 16 2524 59 18266.11 22977.47 15
## 17 2524 59 18266.11 22977.47 15
## 18 2524 59 18266.11 22977.47 15
## 19 2524 59 18266.11 22977.47 15
## 20 2524 59 18266.11 22977.47 15
## 21 2524 59 18266.11 22977.47 15
## 22 2524 59 18266.11 22977.47 15
## 23 2524 59 18266.11 22977.47 15
## 24 2524 59 18266.11 22977.47 15
## 25 2524 59 18266.11 22977.47 15
## 26 2524 59 18266.11 22977.47 15
## 27 2524 59 18266.11 22977.47 15
## 28 2524 59 18266.11 22977.47 15
## 29 2524 59 18266.11 22977.47 15
## 30 2524 59 18266.11 22977.47 15
## 31 2524 59 18266.11 22977.47 15
## 32 2524 59 18266.11 22977.47 15
## 33 2524 59 18266.11 22977.47 15
## 34 2524 59 18266.11 22977.47 15
## 35 2524 59 18266.11 22977.47 15
## 36 2524 59 18266.11 22977.47 15
## 37 2524 59 18266.11 22977.47 15
## 38 2524 59 18266.11 22977.47 15
## 39 2524 59 18266.11 22977.47 15
## 40 2524 59 18266.11 22977.47 15
## 41 2524 59 18266.11 22977.47 15
## 42 2524 59 18266.11 22977.47 15
## 43 2524 59 18266.11 22977.47 15
## 44 2524 59 18266.11 22977.47 15
## 45 2524 59 18266.11 22977.47 15
## 46 2524 59 18266.11 22977.47 15
## 47 2524 59 18266.11 22977.47 15
## 48 2524 59 18266.11 22977.47 15
## 49 2524 59 18266.11 22977.47 15
## 50 2524 59 18266.11 22977.47 15
## 51 2524 59 18266.11 22977.47 15
## 52 2524 59 18266.11 22977.47 15
## 53 2524 59 18266.11 22977.47 15
## 54 2524 59 18266.11 22977.47 15
## 55 2524 59 18266.11 22977.47 15
## 56 2524 59 18266.11 22977.47 15
## 57 2524 59 18266.11 22977.47 15
## maximumMaxSalary
## 1 70000
## 2 70000
## 3 70000
## 4 70000
## 5 70000
## 6 70000
## 7 70000
## 8 70000
## 9 70000
## 10 70000
## 11 70000
## 12 70000
## 13 70000
## 14 70000
## 15 70000
## 16 70000
## 17 70000
## 18 70000
## 19 70000
## 20 70000
## 21 70000
## 22 70000
## 23 70000
## 24 70000
## 25 70000
## 26 70000
## 27 70000
## 28 70000
## 29 70000
## 30 70000
## 31 70000
## 32 70000
## 33 70000
## 34 70000
## 35 70000
## 36 70000
## 37 70000
## 38 70000
## 39 70000
## 40 70000
## 41 70000
## 42 70000
## 43 70000
## 44 70000
## 45 70000
## 46 70000
## 47 70000
## 48 70000
## 49 70000
## 50 70000
## 51 70000
## 52 70000
## 53 70000
## 54 70000
## 55 70000
## 56 70000
## 57 70000
##
## [[3]]
## date_daysAgo
## 1 16
## 2 6
## 3 4
## 4 30
## 5 30
## 6 12
## 7 24
## 8 1
## 9 Today
## 10 5
## 11 3
## 12 30
## 13 30
## 14 30
## 15 17
## 16 10
## 17 6
## 18 7
## 19 6
## 20 30
## 21 30
## 22 30
## 23 14
## 24 30
## 25 19
## 26 30
## 27 8
## 28 13
## 29 30
## 30 5
## 31 30
## 32 14
## 33 30
## 34 30
## 35 4
## 36 13
## 37 6
## 38 7
## 39 6
## 40 30
## 41 30
## 42 8
## 43 10
## 44 13
## 45 30
## 46 6
## 47 5
## 48 30
## 49 14
## 50 30
## 51 24
## 52 27
## 53 16
## 54 27
## 55 13
## 56 24
## 57 16
## 58 6
## 59 7
## 60 6
## 61 30
## 62 16
## 63 30
## 64 4
## 65 30
## 66 12
## 67 10
## 68 30
## 69 30
## 70 1
## 71 13
## 72 30
## 73 13
## 74 30
## 75 6
## 76 5
## 77 30
## 78 14
## 79 30
## 80 30
## 81 16
## 82 30
## 83 24
## 84 13
## 85 6
## 86 30
## 87 4
## 88 27
## 89 6
## 90 7
## 91 16
##
## [[4]]
## HiringAgency
## 1 Skin to Soul NewtonNewtonville, MA 02458
## 2 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 3 Skin To SoulWoburn, MA 01801
## 4 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 5 Elements Massage Belmont3.6Belmont, MA 02478
## 6 Maison Esthetique Christiane Bourque SpaDanvers, MA 01923
## 7 Soothe3.7Boston, MA
## 8 Backworks, IncBoston, MA 02109 (Downtown area)
## 9 WTS International3.3Boston, MA 02210 (South Boston area)
## 10 Indo-Pak Massage TherapyCambridge, MA+1 location•Remote work available
## 11 Water House Wellness LLCArlington, MA 02476
## 12 Elements3.6Needham Heights, MA 02494+17 locations
## 13 Performance and RecoveryBoston, MA 02134 (Allston area)
## 14 VIM Fitness3.2Cambridge, MA
## 15 Stretchlab Corporate3.8Wellesley, MA 02482
## 16 étant - A Spa for Well-beingBoston, MA 02116 (South End area)
## 17 Massage Envy3.2Boston, MA 02116 (Back Bay area)+15 locations
## 18 Hand & Stone - Bedford, MABedford, MA 01730
## 19 Elements Massage3.6Tewksbury, MA 01876
## 20 Skin Spa New YorkBoston, MA 02115 (Back Bay area)
## 21 Level Up Fitness and Wellness CenterWaltham, MA 02453
## 22 Hand and Stone3.0Bedford, MA 01730+2 locations
## 23 Skin To SoulWoburn, MA 01801
## 24 LYMBRNewton, MA 02459 (Newtown Centre area)
## 25 Whole Beauty and HealthLowell, MA
## 26 Robin Erb SkincareBoston, MA 02116 (Back Bay area)
## 27 Stoughton Massage TherapyStoughton, MA 02072
## 28 Massage Envy3.2North Reading, MA 01864+3 locations
## 29 Life Time3.6Framingham, MA 01701
## 30 Spavia Day Spa3.3Natick, MA 01760
## 31 Massage Envy3.2Brookline, MA 02446+3 locations
## 32 Mint Rose Day SpaBillerica, MA 01821
## 33 Massage Envy3.2Brockton, MA 02301
## 34 Invidia Salon and SpaSudbury, MA 01776
## 35 Skin To SoulWoburn, MA 01801
## 36 Massage EnvyBurlington, MA 01803
## 37 Elements Massage3.6Tewksbury, MA 01876
## 38 Hand & Stone - Bedford, MABedford, MA 01730
## 39 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 40 Elements Massage Belmont3.6Belmont, MA 02478
## 41 Robin Erb SkincareBoston, MA 02116 (Back Bay area)
## 42 Stoughton Massage TherapyStoughton, MA 02072
## 43 Massage EnvyBillerica, MA
## 44 Massage Envy3.2North Reading, MA 01864+3 locations
## 45 Life Time3.6Framingham, MA 01701
## 46 Massage Envy3.2Cambridge, MA 02139 (Cambridgeport area)+1 location
## 47 Spavia Day Spa3.3Natick, MA 01760
## 48 Massage Envy3.2Brookline, MA 02446+3 locations
## 49 Mint Rose Day SpaBillerica, MA 01821
## 50 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 51 Soothe3.7Boston, MA
## 52 Escape Day Spa3.7North Reading, MA 01864
## 53 Skin to Soul NewtonNewtonville, MA 02458
## 54 Escape Day Spa3.7North Reading, MA 01864
## 55 Massage EnvyBurlington, MA 01803
## 56 Soothe3.7Boston, MA
## 57 Skin to Soul NewtonNewtonville, MA 02458
## 58 Elements Massage3.6Tewksbury, MA 01876
## 59 Hand & Stone - Bedford, MABedford, MA 01730
## 60 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 61 Massage Envy3.2Brockton, MA 02301
## 62 Moodz Salon and SpaActon, MA 01720
## 63 Massage Envy3.2Arlington, MA 02476
## 64 Skin To SoulWoburn, MA 01801
## 65 Elements Massage Belmont3.6Belmont, MA 02478
## 66 Maison Esthetique Christiane Bourque SpaDanvers, MA 01923
## 67 Massage EnvyBillerica, MA
## 68 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 69 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 70 Hand & Stone - NatickNatick, MA 01760
## 71 Body Blueprint CenterNorwell, MA 02061
## 72 Invidia Salon and SpaSudbury, MA 01776
## 73 Massage Envy3.2North Reading, MA 01864+3 locations
## 74 Life Time3.6Framingham, MA 01701
## 75 Massage Envy3.2Cambridge, MA 02139 (Cambridgeport area)+1 location
## 76 Spavia Day Spa3.3Natick, MA 01760
## 77 Massage Envy3.2Brookline, MA 02446+3 locations
## 78 Mint Rose Day SpaBillerica, MA 01821
## 79 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 80 Massage Envy3.2Brockton, MA 02301
## 81 Moodz Salon and SpaActon, MA 01720
## 82 Massage Envy3.2Arlington, MA 02476
## 83 Soothe3.7Boston, MA
## 84 Massage EnvyBurlington, MA 01803
## 85 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 86 Elements Massage Belmont3.6Belmont, MA 02478
## 87 Skin To SoulWoburn, MA 01801
## 88 Escape Day Spa3.7North Reading, MA 01864
## 89 Elements Massage3.6Tewksbury, MA 01876
## 90 Hand & Stone - Bedford, MABedford, MA 01730
## 91 Skin to Soul NewtonNewtonville, MA 02458
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 10 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 11 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 16 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 17 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 20 \n$50,000 a year $50000 50000 NA
## 22 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 23 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 24 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 26 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 27 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 28 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 30 \n$45,760 a year $45760 45760 NA
## 34 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 36 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 37 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 41 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 42 \n$45,760 a year $45760 45760 NA
## 43 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 44 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 46 \n$50,000 a year $50000 50000 NA
## 47 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 48 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 50 \n$45,760 a year $45760 45760 NA
## 52 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 55 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 56 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 38000 65000 37670.59 60491.68 20000
## 10 38000 65000 37670.59 60491.68 20000
## 11 38000 65000 37670.59 60491.68 20000
## 16 38000 65000 37670.59 60491.68 20000
## 17 38000 65000 37670.59 60491.68 20000
## 20 38000 65000 37670.59 60491.68 20000
## 22 38000 65000 37670.59 60491.68 20000
## 23 38000 65000 37670.59 60491.68 20000
## 24 38000 65000 37670.59 60491.68 20000
## 26 38000 65000 37670.59 60491.68 20000
## 27 38000 65000 37670.59 60491.68 20000
## 28 38000 65000 37670.59 60491.68 20000
## 30 38000 65000 37670.59 60491.68 20000
## 34 38000 65000 37670.59 60491.68 20000
## 36 38000 65000 37670.59 60491.68 20000
## 37 38000 65000 37670.59 60491.68 20000
## 41 38000 65000 37670.59 60491.68 20000
## 42 38000 65000 37670.59 60491.68 20000
## 43 38000 65000 37670.59 60491.68 20000
## 44 38000 65000 37670.59 60491.68 20000
## 46 38000 65000 37670.59 60491.68 20000
## 47 38000 65000 37670.59 60491.68 20000
## 48 38000 65000 37670.59 60491.68 20000
## 50 38000 65000 37670.59 60491.68 20000
## 52 38000 65000 37670.59 60491.68 20000
## 55 38000 65000 37670.59 60491.68 20000
## 56 38000 65000 37670.59 60491.68 20000
## maximumMaxSalary
## 3 70000
## 10 70000
## 11 70000
## 16 70000
## 17 70000
## 20 70000
## 22 70000
## 23 70000
## 24 70000
## 26 70000
## 27 70000
## 28 70000
## 30 70000
## 34 70000
## 36 70000
## 37 70000
## 41 70000
## 42 70000
## 43 70000
## 44 70000
## 46 70000
## 47 70000
## 48 70000
## 50 70000
## 52 70000
## 55 70000
## 56 70000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$25 - $38 an hour $25 - $38 25 38 25
## 2 \n$48 - $59 an hour $48 - $59 48 59 25
## 4 \n$32 - $36 an hour $32 - $36 32 36 25
## 6 \n$39 - $55 an hour $39 - $55 39 55 25
## 7 \n$40 - $52 an hour $40 - $52 40 52 25
## 8 \n$35 an hour $35 35 NA 25
## 9 \n$20 - $32 an hour $20 - $32 20 32 25
## 12 \n$20 - $30 an hour $20 - $30 20 30 25
## 14 \n$35 - $45 an hour $35 - $45 35 45 25
## 15 \n$25 - $31 an hour $25 - $31 25 31 25
## 18 \n$24 - $38 an hour $24 - $38 24 38 25
## 19 \n$18 an hour $18 18 NA 25
## 21 \n$48 - $59 an hour $48 - $59 48 59 25
## 25 \n$25 - $31 an hour $25 - $31 25 31 25
## 29 \n$24 - $38 an hour $24 - $38 24 38 25
## 31 \n$15 - $20 an hour $15 - $20 15 20 25
## 32 \n$25 - $38 an hour $25 - $38 25 38 25
## 33 \n$15 - $20 an hour $15 - $20 15 20 25
## 35 \n$25 - $38 an hour $25 - $38 25 38 25
## 38 \n$18 an hour $18 18 NA 25
## 39 \n$48 - $59 an hour $48 - $59 48 59 25
## 40 \n$32 - $36 an hour $32 - $36 32 36 25
## 45 \n$30 - $50 an hour $30 - $50 30 50 25
## 49 \n$24 - $38 an hour $24 - $38 24 38 25
## 51 \n$18 an hour $18 18 NA 25
## 53 \n$48 - $59 an hour $48 - $59 48 59 25
## 54 \n$15 - $20 an hour $15 - $20 15 20 25
## 57 \n$25 - $38 an hour $25 - $38 25 38 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 38 28.42857 40 15 59
## 2 38 28.42857 40 15 59
## 4 38 28.42857 40 15 59
## 6 38 28.42857 40 15 59
## 7 38 28.42857 40 15 59
## 8 38 28.42857 40 15 59
## 9 38 28.42857 40 15 59
## 12 38 28.42857 40 15 59
## 14 38 28.42857 40 15 59
## 15 38 28.42857 40 15 59
## 18 38 28.42857 40 15 59
## 19 38 28.42857 40 15 59
## 21 38 28.42857 40 15 59
## 25 38 28.42857 40 15 59
## 29 38 28.42857 40 15 59
## 31 38 28.42857 40 15 59
## 32 38 28.42857 40 15 59
## 33 38 28.42857 40 15 59
## 35 38 28.42857 40 15 59
## 38 38 28.42857 40 15 59
## 39 38 28.42857 40 15 59
## 40 38 28.42857 40 15 59
## 45 38 28.42857 40 15 59
## 49 38 28.42857 40 15 59
## 51 38 28.42857 40 15 59
## 53 38 28.42857 40 15 59
## 54 38 28.42857 40 15 59
## 57 38 28.42857 40 15 59
##
## [[7]]
## city state jobTitle
## 1 Boston MA Licensed Massage Therapist
## 2 Boston MA Licensed Massage Therapist With $300 Signing Bonus!
## 3 Boston MA Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 4 Boston MA Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 5 Boston MA Licensed Massage Therapist (LMT)
## 6 Boston MA Massage Therapist
## 7 Boston MA Licensed Massage Therapist
## 8 Boston MA Licensed Massage Therapist
## 9 Boston MA Massage Therapist
## 10 Boston MA Massage Therapist - Independent Contractor
## 11 Boston MA Licensed Massage Therapist (LMT)
## 12 Boston MA Massage Therapist
## 13 Boston MA Massage Therapist
## 14 Boston MA LICENSED MASSAGE THERAPISTS
## 15 Boston MA Stretch Therapist
## 16 Boston MA Licensed Massage Therapist - South End, Boston - Prime Shift...
## 17 Boston MA Massage Therapist - Full Time
## 18 Boston MA Licensed Massage Therapist
## 19 Boston MA Massage Therapist
## 20 Boston MA Massage Therapist - Skin Spa Back Bay
## 21 Boston MA Licensed Massage Therapist
## 22 Boston MA Licensed Massage Therapist
## 23 Boston MA Myofascial Release Massage Therapist
## 24 Boston MA Stretch Therapist / Fitness Professional / Personal Trainer
## 25 Boston MA Licensed Massage Therapist (LMT)
## 26 Boston MA Spa Space available to share! ESTHETICIAN,MASSAGE, MAKE-UP,...
## 27 Boston MA Licensed Massage Therapist
## 28 Boston MA Massage Therapist Full-Time 60-70K
## 29 Boston MA Massage Therapist - PartTime
## 30 Boston MA Licensed Massage Therapist
## 31 Boston MA Massage Therapist- Part-Time
## 32 Boston MA Licensed Massage Therapist (LMT)
## 33 Boston MA Massage Therapist- Full Time *Flexible*
## 34 Boston MA Licensed Massage Therapist - Immediate Clients Available!
## 35 Boston MA Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 36 Boston MA Licensed Massage Therapist
## 37 Boston MA Massage Therapist
## 38 Boston MA Licensed Massage Therapist
## 39 Boston MA Licensed Massage Therapist With $300 Signing Bonus!
## 40 Boston MA Licensed Massage Therapist (LMT)
## 41 Boston MA Spa Space available to share! ESTHETICIAN,MASSAGE, MAKE-UP,...
## 42 Boston MA Licensed Massage Therapist
## 43 Boston MA Licensed Massage Therapist (LMT)
## 44 Boston MA Massage Therapist Full-Time 60-70K
## 45 Boston MA Massage Therapist - PartTime
## 46 Boston MA Licensed Massage Therapist - Full Time
## 47 Boston MA Licensed Massage Therapist
## 48 Boston MA Massage Therapist- Part-Time
## 49 Boston MA Licensed Massage Therapist (LMT)
## 50 Boston MA Licensed Massage Therapist (LMT)
## 51 Boston MA Licensed Massage Therapist
## 52 Boston MA Licensed Massage Therapist
## 53 Boston MA Licensed Massage Therapist
## 54 Boston MA Licensed Massage Therapist
## 55 Boston MA Licensed Massage Therapist
## 56 Boston MA Licensed Massage Therapist
## 57 Boston MA Licensed Massage Therapist
## 58 Boston MA Massage Therapist
## 59 Boston MA Licensed Massage Therapist
## 60 Boston MA Licensed Massage Therapist With $300 Signing Bonus!
## 61 Boston MA Massage Therapist- Full Time *Flexible*
## 62 Boston MA Licensed Massage Therapist
## 63 Boston MA Massage Therapist-Full Time Nights & Weekends
## 64 Boston MA Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 65 Boston MA Licensed Massage Therapist (LMT)
## 66 Boston MA Massage Therapist
## 67 Boston MA Licensed Massage Therapist (LMT)
## 68 Boston MA Licensed Massage Therapist (LMT)
## 69 Boston MA Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 70 Boston MA Licensed Massage Therapist (LMT)
## 71 Boston MA Licensed Massage Therapist/$/NeedASAP
## 72 Boston MA Licensed Massage Therapist - Immediate Clients Available!
## 73 Boston MA Massage Therapist Full-Time 60-70K
## 74 Boston MA Massage Therapist - PartTime
## 75 Boston MA Licensed Massage Therapist - Full Time
## 76 Boston MA Licensed Massage Therapist
## 77 Boston MA Massage Therapist- Part-Time
## 78 Boston MA Licensed Massage Therapist (LMT)
## 79 Boston MA Licensed Massage Therapist (LMT)
## 80 Boston MA Massage Therapist- Full Time *Flexible*
## 81 Boston MA Licensed Massage Therapist
## 82 Boston MA Massage Therapist-Full Time Nights & Weekends
## 83 Boston MA Licensed Massage Therapist
## 84 Boston MA Licensed Massage Therapist
## 85 Boston MA Licensed Massage Therapist With $300 Signing Bonus!
## 86 Boston MA Licensed Massage Therapist (LMT)
## 87 Boston MA Looking for Intuitive Massage Therapist for COVID SAFE Heali...
## 88 Boston MA Licensed Massage Therapist
## 89 Boston MA Massage Therapist
## 90 Boston MA Licensed Massage Therapist
## 91 Boston MA Licensed Massage Therapist
## HiringAgency
## 1 Skin to Soul NewtonNewtonville, MA 02458
## 2 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 3 Skin To SoulWoburn, MA 01801
## 4 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 5 Elements Massage Belmont3.6Belmont, MA 02478
## 6 Maison Esthetique Christiane Bourque SpaDanvers, MA 01923
## 7 Soothe3.7Boston, MA
## 8 Backworks, IncBoston, MA 02109 (Downtown area)
## 9 WTS International3.3Boston, MA 02210 (South Boston area)
## 10 Indo-Pak Massage TherapyCambridge, MA+1 location•Remote work available
## 11 Water House Wellness LLCArlington, MA 02476
## 12 Elements3.6Needham Heights, MA 02494+17 locations
## 13 Performance and RecoveryBoston, MA 02134 (Allston area)
## 14 VIM Fitness3.2Cambridge, MA
## 15 Stretchlab Corporate3.8Wellesley, MA 02482
## 16 étant - A Spa for Well-beingBoston, MA 02116 (South End area)
## 17 Massage Envy3.2Boston, MA 02116 (Back Bay area)+15 locations
## 18 Hand & Stone - Bedford, MABedford, MA 01730
## 19 Elements Massage3.6Tewksbury, MA 01876
## 20 Skin Spa New YorkBoston, MA 02115 (Back Bay area)
## 21 Level Up Fitness and Wellness CenterWaltham, MA 02453
## 22 Hand and Stone3.0Bedford, MA 01730+2 locations
## 23 Skin To SoulWoburn, MA 01801
## 24 LYMBRNewton, MA 02459 (Newtown Centre area)
## 25 Whole Beauty and HealthLowell, MA
## 26 Robin Erb SkincareBoston, MA 02116 (Back Bay area)
## 27 Stoughton Massage TherapyStoughton, MA 02072
## 28 Massage Envy3.2North Reading, MA 01864+3 locations
## 29 Life Time3.6Framingham, MA 01701
## 30 Spavia Day Spa3.3Natick, MA 01760
## 31 Massage Envy3.2Brookline, MA 02446+3 locations
## 32 Mint Rose Day SpaBillerica, MA 01821
## 33 Massage Envy3.2Brockton, MA 02301
## 34 Invidia Salon and SpaSudbury, MA 01776
## 35 Skin To SoulWoburn, MA 01801
## 36 Massage EnvyBurlington, MA 01803
## 37 Elements Massage3.6Tewksbury, MA 01876
## 38 Hand & Stone - Bedford, MABedford, MA 01730
## 39 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 40 Elements Massage Belmont3.6Belmont, MA 02478
## 41 Robin Erb SkincareBoston, MA 02116 (Back Bay area)
## 42 Stoughton Massage TherapyStoughton, MA 02072
## 43 Massage EnvyBillerica, MA
## 44 Massage Envy3.2North Reading, MA 01864+3 locations
## 45 Life Time3.6Framingham, MA 01701
## 46 Massage Envy3.2Cambridge, MA 02139 (Cambridgeport area)+1 location
## 47 Spavia Day Spa3.3Natick, MA 01760
## 48 Massage Envy3.2Brookline, MA 02446+3 locations
## 49 Mint Rose Day SpaBillerica, MA 01821
## 50 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 51 Soothe3.7Boston, MA
## 52 Escape Day Spa3.7North Reading, MA 01864
## 53 Skin to Soul NewtonNewtonville, MA 02458
## 54 Escape Day Spa3.7North Reading, MA 01864
## 55 Massage EnvyBurlington, MA 01803
## 56 Soothe3.7Boston, MA
## 57 Skin to Soul NewtonNewtonville, MA 02458
## 58 Elements Massage3.6Tewksbury, MA 01876
## 59 Hand & Stone - Bedford, MABedford, MA 01730
## 60 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 61 Massage Envy3.2Brockton, MA 02301
## 62 Moodz Salon and SpaActon, MA 01720
## 63 Massage Envy3.2Arlington, MA 02476
## 64 Skin To SoulWoburn, MA 01801
## 65 Elements Massage Belmont3.6Belmont, MA 02478
## 66 Maison Esthetique Christiane Bourque SpaDanvers, MA 01923
## 67 Massage EnvyBillerica, MA
## 68 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 69 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 70 Hand & Stone - NatickNatick, MA 01760
## 71 Body Blueprint CenterNorwell, MA 02061
## 72 Invidia Salon and SpaSudbury, MA 01776
## 73 Massage Envy3.2North Reading, MA 01864+3 locations
## 74 Life Time3.6Framingham, MA 01701
## 75 Massage Envy3.2Cambridge, MA 02139 (Cambridgeport area)+1 location
## 76 Spavia Day Spa3.3Natick, MA 01760
## 77 Massage Envy3.2Brookline, MA 02446+3 locations
## 78 Mint Rose Day SpaBillerica, MA 01821
## 79 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 80 Massage Envy3.2Brockton, MA 02301
## 81 Moodz Salon and SpaActon, MA 01720
## 82 Massage Envy3.2Arlington, MA 02476
## 83 Soothe3.7Boston, MA
## 84 Massage EnvyBurlington, MA 01803
## 85 Newton Chiropractic & Wellness CentreNewton, MA 02464 (Newton Upper Falls area)
## 86 Elements Massage Belmont3.6Belmont, MA 02478
## 87 Skin To SoulWoburn, MA 01801
## 88 Escape Day Spa3.7North Reading, MA 01864
## 89 Elements Massage3.6Tewksbury, MA 01876
## 90 Hand & Stone - Bedford, MABedford, MA 01730
## 91 Skin to Soul NewtonNewtonville, MA 02458
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 16 15 59 20000 70000
## 2 6 15 59 20000 70000
## 3 4 15 59 20000 70000
## 4 30 15 59 20000 70000
## 5 30 15 59 20000 70000
## 6 12 15 59 20000 70000
## 7 24 15 59 20000 70000
## 8 1 15 59 20000 70000
## 9 Today 15 59 20000 70000
## 10 5 15 59 20000 70000
## 11 3 15 59 20000 70000
## 12 30 15 59 20000 70000
## 13 30 15 59 20000 70000
## 14 30 15 59 20000 70000
## 15 17 15 59 20000 70000
## 16 10 15 59 20000 70000
## 17 6 15 59 20000 70000
## 18 7 15 59 20000 70000
## 19 6 15 59 20000 70000
## 20 30 15 59 20000 70000
## 21 30 15 59 20000 70000
## 22 30 15 59 20000 70000
## 23 14 15 59 20000 70000
## 24 30 15 59 20000 70000
## 25 19 15 59 20000 70000
## 26 30 15 59 20000 70000
## 27 8 15 59 20000 70000
## 28 13 15 59 20000 70000
## 29 30 15 59 20000 70000
## 30 5 15 59 20000 70000
## 31 30 15 59 20000 70000
## 32 14 15 59 20000 70000
## 33 30 15 59 20000 70000
## 34 30 15 59 20000 70000
## 35 4 15 59 20000 70000
## 36 13 15 59 20000 70000
## 37 6 15 59 20000 70000
## 38 7 15 59 20000 70000
## 39 6 15 59 20000 70000
## 40 30 15 59 20000 70000
## 41 30 15 59 20000 70000
## 42 8 15 59 20000 70000
## 43 10 15 59 20000 70000
## 44 13 15 59 20000 70000
## 45 30 15 59 20000 70000
## 46 6 15 59 20000 70000
## 47 5 15 59 20000 70000
## 48 30 15 59 20000 70000
## 49 14 15 59 20000 70000
## 50 30 15 59 20000 70000
## 51 24 15 59 20000 70000
## 52 27 15 59 20000 70000
## 53 16 15 59 20000 70000
## 54 27 15 59 20000 70000
## 55 13 15 59 20000 70000
## 56 24 15 59 20000 70000
## 57 16 15 59 20000 70000
## 58 6 15 59 20000 70000
## 59 7 15 59 20000 70000
## 60 6 15 59 20000 70000
## 61 30 15 59 20000 70000
## 62 16 15 59 20000 70000
## 63 30 15 59 20000 70000
## 64 4 15 59 20000 70000
## 65 30 15 59 20000 70000
## 66 12 15 59 20000 70000
## 67 10 15 59 20000 70000
## 68 30 15 59 20000 70000
## 69 30 15 59 20000 70000
## 70 1 15 59 20000 70000
## 71 13 15 59 20000 70000
## 72 30 15 59 20000 70000
## 73 13 15 59 20000 70000
## 74 30 15 59 20000 70000
## 75 6 15 59 20000 70000
## 76 5 15 59 20000 70000
## 77 30 15 59 20000 70000
## 78 14 15 59 20000 70000
## 79 30 15 59 20000 70000
## 80 30 15 59 20000 70000
## 81 16 15 59 20000 70000
## 82 30 15 59 20000 70000
## 83 24 15 59 20000 70000
## 84 13 15 59 20000 70000
## 85 6 15 59 20000 70000
## 86 30 15 59 20000 70000
## 87 4 15 59 20000 70000
## 88 27 15 59 20000 70000
## 89 6 15 59 20000 70000
## 90 7 15 59 20000 70000
## 91 16 15 59 20000 70000
getIndeedJobData5pages("massage therapist","Worcester","MA")
## Warning in getIndeedJobData5pages("massage therapist", "Worcester", "MA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Worcester", "MA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Worcester", "MA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Licensed Massage Therapist - Immediate Clients Available!
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapists
## 11 Massage Therapist -Full Time
## 12 Licensed Massage Therapist
## 13 Massage Therapist (part-time)
## 14 Licensed Massage Therapist
## 15 Personal Trainer and Stretch Therapist
## 16 Licensed Massage Therapist (LMT)
## 17 Licensed Massage Therapist - Immediate Clients Available!
## 18 Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapists
## 21 Massage Therapist -Full Time
## 22 Massage Therapist (part-time)
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Personal Trainer and Stretch Therapist
## 26 Massage Therapist - PartTime
## 27 Licensed Massage Therapist
## 28 Massage Therapist- Full Time
## 29 Massage Therapist (full-time)
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist (LMT)
## 33 Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist (part-time)
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Personal Trainer and Stretch Therapist
## 39 Massage Therapist - PartTime
## 40 Licensed Massage Therapist
## 41 Massage Therapist- Full Time
## 42 Massage Therapist (full-time)
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist - Immediate Clients Available!
## 45 Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist (part-time)
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Personal Trainer and Stretch Therapist
## 51 Massage Therapist - PartTime
## 52 Licensed Massage Therapist
## 53 Massage Therapist- Full Time
## 54 Massage Therapist (full-time)
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist - Immediate Clients Available!
## 57 Licensed Massage Therapist (LMT)
## 58 Massage Therapist
## 59 Licensed Massage Therapist (LMT)
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Massage Therapist
## 63 Licensed Massage Therapist (LMT)
## 64 Licensed Massage Therapist - Immediate Clients Available!
## 65 Massage Therapist
## 66 Massage Therapist
## 67 Licensed Massage Therapists
## 68 Massage Therapist -Full Time
## 69 Massage Therapist (part-time)
## 70 Licensed Massage Therapist
## 71 Licensed Massage Therapist
## 72 Personal Trainer and Stretch Therapist
## 73 Massage Therapist - PartTime
## 74 Licensed Massage Therapist
## 75 Massage Therapist- Full Time
## 76 Massage Therapist (full-time)
## 77 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 2 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 3 \n$25 - $40 an hour $25 - $40 25 40
## 4 \n$35 an hour $35 35 NA
## 5 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 6 \n$50,000 a year $50000 50000 NA
## 7 \nUp to $65,000 a year $65000 65000 NA
## 8 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 9 \n$18 - $24 an hour $18 - $24 18 24
## 10 \n$18 - $24 an hour $18 - $24 18 24
## 11 \n$20 - $30 an hour $20 - $30 20 30
## 12 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 13 \n$50,000 a year $50000 50000 NA
## 14 \nUp to $65,000 a year $65000 65000 NA
## 15 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 16 \n$18 - $24 an hour $18 - $24 18 24
## 17 \n$18 - $24 an hour $18 - $24 18 24
## 18 \n$20 - $30 an hour $20 - $30 20 30
## 19 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 20 \n$18 - $24 an hour $18 - $24 18 24
## 21 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 22 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 23 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 24 \n$18 - $24 an hour $18 - $24 18 24
## 25 \n$45,000 - $60,000 a year ++ $45000 - $60000 45000 60000
## 26 \n$20 - $30 an hour $20 - $30 20 30
## 27 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 28 \n$18 - $24 an hour $18 - $24 18 24
## 29 \n$50,000 a year $50000 50000 NA
## 30 \n$35 an hour $35 35 NA
## 31 \n$25 - $40 an hour $25 - $40 25 40
## 32 \n$18 - $24 an hour $18 - $24 18 24
## 33 \n$45,000 - $60,000 a year ++ $45000 - $60000 45000 60000
## 34 \n$20 - $30 an hour $20 - $30 20 30
## 35 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 36 \n$18 - $24 an hour $18 - $24 18 24
## 37 \n$50,000 a year $50000 50000 NA
## 38 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 39 \n$35 an hour $35 35 NA
## 40 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 41 \n$25 - $40 an hour $25 - $40 25 40
## 42 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 43 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 44 \n$50,000 a year $50000 50000 NA
## 45 \nUp to $65,000 a year $65000 65000 NA
## 46 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 47 \n$18 - $24 an hour $18 - $24 18 24
## 48 \n$18 - $24 an hour $18 - $24 18 24
## 49 \n$20 - $30 an hour $20 - $30 20 30
## 50 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 51 \n$18 - $24 an hour $18 - $24 18 24
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25000 25000 22188.75 23750.21 18
## 2 25000 25000 22188.75 23750.21 18
## 3 25000 25000 22188.75 23750.21 18
## 4 25000 25000 22188.75 23750.21 18
## 5 25000 25000 22188.75 23750.21 18
## 6 25000 25000 22188.75 23750.21 18
## 7 25000 25000 22188.75 23750.21 18
## 8 25000 25000 22188.75 23750.21 18
## 9 25000 25000 22188.75 23750.21 18
## 10 25000 25000 22188.75 23750.21 18
## 11 25000 25000 22188.75 23750.21 18
## 12 25000 25000 22188.75 23750.21 18
## 13 25000 25000 22188.75 23750.21 18
## 14 25000 25000 22188.75 23750.21 18
## 15 25000 25000 22188.75 23750.21 18
## 16 25000 25000 22188.75 23750.21 18
## 17 25000 25000 22188.75 23750.21 18
## 18 25000 25000 22188.75 23750.21 18
## 19 25000 25000 22188.75 23750.21 18
## 20 25000 25000 22188.75 23750.21 18
## 21 25000 25000 22188.75 23750.21 18
## 22 25000 25000 22188.75 23750.21 18
## 23 25000 25000 22188.75 23750.21 18
## 24 25000 25000 22188.75 23750.21 18
## 25 25000 25000 22188.75 23750.21 18
## 26 25000 25000 22188.75 23750.21 18
## 27 25000 25000 22188.75 23750.21 18
## 28 25000 25000 22188.75 23750.21 18
## 29 25000 25000 22188.75 23750.21 18
## 30 25000 25000 22188.75 23750.21 18
## 31 25000 25000 22188.75 23750.21 18
## 32 25000 25000 22188.75 23750.21 18
## 33 25000 25000 22188.75 23750.21 18
## 34 25000 25000 22188.75 23750.21 18
## 35 25000 25000 22188.75 23750.21 18
## 36 25000 25000 22188.75 23750.21 18
## 37 25000 25000 22188.75 23750.21 18
## 38 25000 25000 22188.75 23750.21 18
## 39 25000 25000 22188.75 23750.21 18
## 40 25000 25000 22188.75 23750.21 18
## 41 25000 25000 22188.75 23750.21 18
## 42 25000 25000 22188.75 23750.21 18
## 43 25000 25000 22188.75 23750.21 18
## 44 25000 25000 22188.75 23750.21 18
## 45 25000 25000 22188.75 23750.21 18
## 46 25000 25000 22188.75 23750.21 18
## 47 25000 25000 22188.75 23750.21 18
## 48 25000 25000 22188.75 23750.21 18
## 49 25000 25000 22188.75 23750.21 18
## 50 25000 25000 22188.75 23750.21 18
## 51 25000 25000 22188.75 23750.21 18
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 28 65000
## 29 65000
## 30 65000
## 31 65000
## 32 65000
## 33 65000
## 34 65000
## 35 65000
## 36 65000
## 37 65000
## 38 65000
## 39 65000
## 40 65000
## 41 65000
## 42 65000
## 43 65000
## 44 65000
## 45 65000
## 46 65000
## 47 65000
## 48 65000
## 49 65000
## 50 65000
## 51 65000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 6
## 3 30
## 4 30
## 5 30
## 6 1
## 7 30
## 8 30
## 9 30
## 10 30
## 11 7
## 12 7
## 13 7
## 14 27
## 15 27
## 16 1
## 17 30
## 18 30
## 19 30
## 20 30
## 21 7
## 22 7
## 23 7
## 24 27
## 25 27
## 26 30
## 27 5
## 28 30
## 29 30
## 30 16
## 31 30
## 32 1
## 33 6
## 34 30
## 35 7
## 36 18
## 37 27
## 38 27
## 39 30
## 40 5
## 41 30
## 42 30
## 43 16
## 44 30
## 45 30
## 46 30
## 47 7
## 48 18
## 49 27
## 50 27
## 51 30
## 52 5
## 53 30
## 54 30
## 55 16
## 56 30
## 57 1
## 58 30
## 59 30
## 60 30
## 61 30
## 62 6
## 63 1
## 64 30
## 65 30
## 66 30
## 67 30
## 68 7
## 69 7
## 70 7
## 71 27
## 72 27
## 73 30
## 74 5
## 75 30
## 76 30
## 77 16
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Shrewsbury, MA 01545
## 2 Elements Massage3.6Marlborough, MA 01752 (Farm Road area)
## 3 Orthomed Massage ClinicNorthborough, MA 01532
## 4 LaRose Muscular TherapyMilford, MA 01757
## 5 Bellezza Day SpaFranklin, MA 02038
## 6 Hand & Stone - NatickNatick, MA 01760
## 7 Invidia Salon and SpaSudbury, MA 01776
## 8 inBalance Chiropractic and WellnessShrewsbury, MA 01545
## 9 Elements3.6Marlborough, MA 01752 (Elm Street area)+1 location
## 10 Elements3.6Shrewsbury, MA 01545
## 11 Massage Envy3.2Westborough, MA 01581+2 locations
## 12 Hand and Stone Spa3.0Hudson, MA 01749
## 13 Massage Envy3.2Westborough, MA 01581+1 location
## 14 Massage Envy3.2Shrewsbury, MA 01545
## 15 Stretchlab Corporate3.8Natick, MA
## 16 Hand & Stone - NatickNatick, MA 01760
## 17 Invidia Salon and SpaSudbury, MA 01776
## 18 inBalance Chiropractic and WellnessShrewsbury, MA 01545
## 19 Elements3.6Marlborough, MA 01752 (Elm Street area)+1 location
## 20 Elements3.6Shrewsbury, MA 01545
## 21 Massage Envy3.2Westborough, MA 01581+2 locations
## 22 Massage Envy3.2Westborough, MA 01581+1 location
## 23 Hand and Stone Spa3.0Hudson, MA 01749
## 24 Massage Envy3.2Shrewsbury, MA 01545
## 25 Stretchlab Corporate3.8Natick, MA
## 26 Life Time3.6Framingham, MA 01701
## 27 Spavia Day Spa3.3Natick, MA 01760
## 28 Life Time3.6Framingham, MA 01701
## 29 Massage Envy3.2Westborough, MA 01581+1 location
## 30 Moodz Salon and SpaActon, MA 01720
## 31 Bellezza Day SpaFranklin, MA 02038
## 32 Hand & Stone - NatickNatick, MA 01760
## 33 Elements Massage3.6Marlborough, MA 01752 (Farm Road area)
## 34 Elements Massage3.6Shrewsbury, MA 01545
## 35 Massage Envy3.2Westborough, MA 01581+1 location
## 36 Hand & Stone - Hudson3.0Hudson, MA 01749+1 location
## 37 Massage Envy3.2Shrewsbury, MA 01545
## 38 Stretchlab Corporate3.8Natick, MA
## 39 Life Time3.6Framingham, MA 01701
## 40 Spavia Day Spa3.3Natick, MA 01760
## 41 Life Time3.6Framingham, MA 01701
## 42 Massage Envy3.2Westborough, MA 01581+1 location
## 43 Moodz Salon and SpaActon, MA 01720
## 44 Invidia Salon and SpaSudbury, MA 01776
## 45 LaRose Muscular TherapyMilford, MA 01757
## 46 Orthomed Massage ClinicNorthborough, MA 01532
## 47 Massage Envy3.2Westborough, MA 01581+1 location
## 48 Hand & Stone - Hudson3.0Hudson, MA 01749+1 location
## 49 Massage Envy3.2Shrewsbury, MA 01545
## 50 Stretchlab Corporate3.8Natick, MA
## 51 Life Time3.6Framingham, MA 01701
## 52 Spavia Day Spa3.3Natick, MA 01760
## 53 Life Time3.6Framingham, MA 01701
## 54 Massage Envy3.2Westborough, MA 01581+1 location
## 55 Moodz Salon and SpaActon, MA 01720
## 56 Invidia Salon and SpaSudbury, MA 01776
## 57 Hand & Stone - NatickNatick, MA 01760
## 58 LaRose Muscular TherapyMilford, MA 01757
## 59 Elements Massage3.6Shrewsbury, MA 01545
## 60 Bellezza Day SpaFranklin, MA 02038
## 61 Orthomed Massage ClinicNorthborough, MA 01532
## 62 Elements Massage3.6Marlborough, MA 01752 (Farm Road area)
## 63 Hand & Stone - NatickNatick, MA 01760
## 64 Invidia Salon and SpaSudbury, MA 01776
## 65 inBalance Chiropractic and WellnessShrewsbury, MA 01545
## 66 Elements3.6Marlborough, MA 01752 (Elm Street area)+1 location
## 67 Elements3.6Shrewsbury, MA 01545
## 68 Massage Envy3.2Westborough, MA 01581+2 locations
## 69 Massage Envy3.2Westborough, MA 01581+1 location
## 70 Hand and Stone Spa3.0Hudson, MA 01749
## 71 Massage Envy3.2Shrewsbury, MA 01545
## 72 Stretchlab Corporate3.8Natick, MA
## 73 Life Time3.6Framingham, MA 01701
## 74 Spavia Day Spa3.3Natick, MA 01760
## 75 Life Time3.6Framingham, MA 01701
## 76 Massage Envy3.2Westborough, MA 01581+1 location
## 77 Moodz Salon and SpaActon, MA 01720
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 2 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 5 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 6 \n$50,000 a year $50000 50000 NA
## 7 \nUp to $65,000 a year $65000 65000 NA
## 8 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 12 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 13 \n$50,000 a year $50000 50000 NA
## 14 \nUp to $65,000 a year $65000 65000 NA
## 15 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 19 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 21 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 22 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 23 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 25 \n$45,000 - $60,000 a year ++ $45000 - $60000 45000 60000
## 27 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 29 \n$50,000 a year $50000 50000 NA
## 33 \n$45,000 - $60,000 a year ++ $45000 - $60000 45000 60000
## 35 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## 37 \n$50,000 a year $50000 50000 NA
## 38 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 40 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 42 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 43 \n$25,826 - $45,817 a year $25826 - $45817 25826 45817
## 44 \n$50,000 a year $50000 50000 NA
## 45 \nUp to $65,000 a year $65000 65000 NA
## 46 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 50 \n$38,000 - $50,000 a year $38000 - $50000 38000 50000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 38000 50000 40397.5 51454.25 25000
## 2 38000 50000 40397.5 51454.25 25000
## 5 38000 50000 40397.5 51454.25 25000
## 6 38000 50000 40397.5 51454.25 25000
## 7 38000 50000 40397.5 51454.25 25000
## 8 38000 50000 40397.5 51454.25 25000
## 12 38000 50000 40397.5 51454.25 25000
## 13 38000 50000 40397.5 51454.25 25000
## 14 38000 50000 40397.5 51454.25 25000
## 15 38000 50000 40397.5 51454.25 25000
## 19 38000 50000 40397.5 51454.25 25000
## 21 38000 50000 40397.5 51454.25 25000
## 22 38000 50000 40397.5 51454.25 25000
## 23 38000 50000 40397.5 51454.25 25000
## 25 38000 50000 40397.5 51454.25 25000
## 27 38000 50000 40397.5 51454.25 25000
## 29 38000 50000 40397.5 51454.25 25000
## 33 38000 50000 40397.5 51454.25 25000
## 35 38000 50000 40397.5 51454.25 25000
## 37 38000 50000 40397.5 51454.25 25000
## 38 38000 50000 40397.5 51454.25 25000
## 40 38000 50000 40397.5 51454.25 25000
## 42 38000 50000 40397.5 51454.25 25000
## 43 38000 50000 40397.5 51454.25 25000
## 44 38000 50000 40397.5 51454.25 25000
## 45 38000 50000 40397.5 51454.25 25000
## 46 38000 50000 40397.5 51454.25 25000
## 50 38000 50000 40397.5 51454.25 25000
## maximumMaxSalary
## 1 65000
## 2 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 19 65000
## 21 65000
## 22 65000
## 23 65000
## 25 65000
## 27 65000
## 29 65000
## 33 65000
## 35 65000
## 37 65000
## 38 65000
## 40 65000
## 42 65000
## 43 65000
## 44 65000
## 45 65000
## 46 65000
## 50 65000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 3 \n$25 - $40 an hour $25 - $40 25 40 18
## 4 \n$35 an hour $35 35 NA 18
## 9 \n$18 - $24 an hour $18 - $24 18 24 18
## 10 \n$18 - $24 an hour $18 - $24 18 24 18
## 11 \n$20 - $30 an hour $20 - $30 20 30 18
## 16 \n$18 - $24 an hour $18 - $24 18 24 18
## 17 \n$18 - $24 an hour $18 - $24 18 24 18
## 18 \n$20 - $30 an hour $20 - $30 20 30 18
## 20 \n$18 - $24 an hour $18 - $24 18 24 18
## 24 \n$18 - $24 an hour $18 - $24 18 24 18
## 26 \n$20 - $30 an hour $20 - $30 20 30 18
## 28 \n$18 - $24 an hour $18 - $24 18 24 18
## 30 \n$35 an hour $35 35 NA 18
## 31 \n$25 - $40 an hour $25 - $40 25 40 18
## 32 \n$18 - $24 an hour $18 - $24 18 24 18
## 34 \n$20 - $30 an hour $20 - $30 20 30 18
## 36 \n$18 - $24 an hour $18 - $24 18 24 18
## 39 \n$35 an hour $35 35 NA 18
## 41 \n$25 - $40 an hour $25 - $40 25 40 18
## 47 \n$18 - $24 an hour $18 - $24 18 24 18
## 48 \n$18 - $24 an hour $18 - $24 18 24 18
## 49 \n$20 - $30 an hour $20 - $30 20 30 18
## 51 \n$18 - $24 an hour $18 - $24 18 24 18
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 3 24 21.56522 27.9 18 40
## 4 24 21.56522 27.9 18 40
## 9 24 21.56522 27.9 18 40
## 10 24 21.56522 27.9 18 40
## 11 24 21.56522 27.9 18 40
## 16 24 21.56522 27.9 18 40
## 17 24 21.56522 27.9 18 40
## 18 24 21.56522 27.9 18 40
## 20 24 21.56522 27.9 18 40
## 24 24 21.56522 27.9 18 40
## 26 24 21.56522 27.9 18 40
## 28 24 21.56522 27.9 18 40
## 30 24 21.56522 27.9 18 40
## 31 24 21.56522 27.9 18 40
## 32 24 21.56522 27.9 18 40
## 34 24 21.56522 27.9 18 40
## 36 24 21.56522 27.9 18 40
## 39 24 21.56522 27.9 18 40
## 41 24 21.56522 27.9 18 40
## 47 24 21.56522 27.9 18 40
## 48 24 21.56522 27.9 18 40
## 49 24 21.56522 27.9 18 40
## 51 24 21.56522 27.9 18 40
##
## [[7]]
## city state jobTitle
## 1 Worcester MA Licensed Massage Therapist (LMT)
## 2 Worcester MA Massage Therapist
## 3 Worcester MA Licensed Massage Therapist
## 4 Worcester MA Massage Therapist
## 5 Worcester MA Licensed Massage Therapist
## 6 Worcester MA Licensed Massage Therapist (LMT)
## 7 Worcester MA Licensed Massage Therapist - Immediate Clients Available!
## 8 Worcester MA Massage Therapist
## 9 Worcester MA Massage Therapist
## 10 Worcester MA Licensed Massage Therapists
## 11 Worcester MA Massage Therapist -Full Time
## 12 Worcester MA Licensed Massage Therapist
## 13 Worcester MA Massage Therapist (part-time)
## 14 Worcester MA Licensed Massage Therapist
## 15 Worcester MA Personal Trainer and Stretch Therapist
## 16 Worcester MA Licensed Massage Therapist (LMT)
## 17 Worcester MA Licensed Massage Therapist - Immediate Clients Available!
## 18 Worcester MA Massage Therapist
## 19 Worcester MA Massage Therapist
## 20 Worcester MA Licensed Massage Therapists
## 21 Worcester MA Massage Therapist -Full Time
## 22 Worcester MA Massage Therapist (part-time)
## 23 Worcester MA Licensed Massage Therapist
## 24 Worcester MA Licensed Massage Therapist
## 25 Worcester MA Personal Trainer and Stretch Therapist
## 26 Worcester MA Massage Therapist - PartTime
## 27 Worcester MA Licensed Massage Therapist
## 28 Worcester MA Massage Therapist- Full Time
## 29 Worcester MA Massage Therapist (full-time)
## 30 Worcester MA Licensed Massage Therapist
## 31 Worcester MA Licensed Massage Therapist
## 32 Worcester MA Licensed Massage Therapist (LMT)
## 33 Worcester MA Massage Therapist
## 34 Worcester MA Licensed Massage Therapist (LMT)
## 35 Worcester MA Massage Therapist (part-time)
## 36 Worcester MA Licensed Massage Therapist
## 37 Worcester MA Licensed Massage Therapist
## 38 Worcester MA Personal Trainer and Stretch Therapist
## 39 Worcester MA Massage Therapist - PartTime
## 40 Worcester MA Licensed Massage Therapist
## 41 Worcester MA Massage Therapist- Full Time
## 42 Worcester MA Massage Therapist (full-time)
## 43 Worcester MA Licensed Massage Therapist
## 44 Worcester MA Licensed Massage Therapist - Immediate Clients Available!
## 45 Worcester MA Massage Therapist
## 46 Worcester MA Licensed Massage Therapist
## 47 Worcester MA Massage Therapist (part-time)
## 48 Worcester MA Licensed Massage Therapist
## 49 Worcester MA Licensed Massage Therapist
## 50 Worcester MA Personal Trainer and Stretch Therapist
## 51 Worcester MA Massage Therapist - PartTime
## 52 Worcester MA Licensed Massage Therapist
## 53 Worcester MA Massage Therapist- Full Time
## 54 Worcester MA Massage Therapist (full-time)
## 55 Worcester MA Licensed Massage Therapist
## 56 Worcester MA Licensed Massage Therapist - Immediate Clients Available!
## 57 Worcester MA Licensed Massage Therapist (LMT)
## 58 Worcester MA Massage Therapist
## 59 Worcester MA Licensed Massage Therapist (LMT)
## 60 Worcester MA Licensed Massage Therapist
## 61 Worcester MA Licensed Massage Therapist
## 62 Worcester MA Massage Therapist
## 63 Worcester MA Licensed Massage Therapist (LMT)
## 64 Worcester MA Licensed Massage Therapist - Immediate Clients Available!
## 65 Worcester MA Massage Therapist
## 66 Worcester MA Massage Therapist
## 67 Worcester MA Licensed Massage Therapists
## 68 Worcester MA Massage Therapist -Full Time
## 69 Worcester MA Massage Therapist (part-time)
## 70 Worcester MA Licensed Massage Therapist
## 71 Worcester MA Licensed Massage Therapist
## 72 Worcester MA Personal Trainer and Stretch Therapist
## 73 Worcester MA Massage Therapist - PartTime
## 74 Worcester MA Licensed Massage Therapist
## 75 Worcester MA Massage Therapist- Full Time
## 76 Worcester MA Massage Therapist (full-time)
## 77 Worcester MA Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Elements Massage3.6Shrewsbury, MA 01545 30
## 2 Elements Massage3.6Marlborough, MA 01752 (Farm Road area) 6
## 3 Orthomed Massage ClinicNorthborough, MA 01532 30
## 4 LaRose Muscular TherapyMilford, MA 01757 30
## 5 Bellezza Day SpaFranklin, MA 02038 30
## 6 Hand & Stone - NatickNatick, MA 01760 1
## 7 Invidia Salon and SpaSudbury, MA 01776 30
## 8 inBalance Chiropractic and WellnessShrewsbury, MA 01545 30
## 9 Elements3.6Marlborough, MA 01752 (Elm Street area)+1 location 30
## 10 Elements3.6Shrewsbury, MA 01545 30
## 11 Massage Envy3.2Westborough, MA 01581+2 locations 7
## 12 Hand and Stone Spa3.0Hudson, MA 01749 7
## 13 Massage Envy3.2Westborough, MA 01581+1 location 7
## 14 Massage Envy3.2Shrewsbury, MA 01545 27
## 15 Stretchlab Corporate3.8Natick, MA 27
## 16 Hand & Stone - NatickNatick, MA 01760 1
## 17 Invidia Salon and SpaSudbury, MA 01776 30
## 18 inBalance Chiropractic and WellnessShrewsbury, MA 01545 30
## 19 Elements3.6Marlborough, MA 01752 (Elm Street area)+1 location 30
## 20 Elements3.6Shrewsbury, MA 01545 30
## 21 Massage Envy3.2Westborough, MA 01581+2 locations 7
## 22 Massage Envy3.2Westborough, MA 01581+1 location 7
## 23 Hand and Stone Spa3.0Hudson, MA 01749 7
## 24 Massage Envy3.2Shrewsbury, MA 01545 27
## 25 Stretchlab Corporate3.8Natick, MA 27
## 26 Life Time3.6Framingham, MA 01701 30
## 27 Spavia Day Spa3.3Natick, MA 01760 5
## 28 Life Time3.6Framingham, MA 01701 30
## 29 Massage Envy3.2Westborough, MA 01581+1 location 30
## 30 Moodz Salon and SpaActon, MA 01720 16
## 31 Bellezza Day SpaFranklin, MA 02038 30
## 32 Hand & Stone - NatickNatick, MA 01760 1
## 33 Elements Massage3.6Marlborough, MA 01752 (Farm Road area) 6
## 34 Elements Massage3.6Shrewsbury, MA 01545 30
## 35 Massage Envy3.2Westborough, MA 01581+1 location 7
## 36 Hand & Stone - Hudson3.0Hudson, MA 01749+1 location 18
## 37 Massage Envy3.2Shrewsbury, MA 01545 27
## 38 Stretchlab Corporate3.8Natick, MA 27
## 39 Life Time3.6Framingham, MA 01701 30
## 40 Spavia Day Spa3.3Natick, MA 01760 5
## 41 Life Time3.6Framingham, MA 01701 30
## 42 Massage Envy3.2Westborough, MA 01581+1 location 30
## 43 Moodz Salon and SpaActon, MA 01720 16
## 44 Invidia Salon and SpaSudbury, MA 01776 30
## 45 LaRose Muscular TherapyMilford, MA 01757 30
## 46 Orthomed Massage ClinicNorthborough, MA 01532 30
## 47 Massage Envy3.2Westborough, MA 01581+1 location 7
## 48 Hand & Stone - Hudson3.0Hudson, MA 01749+1 location 18
## 49 Massage Envy3.2Shrewsbury, MA 01545 27
## 50 Stretchlab Corporate3.8Natick, MA 27
## 51 Life Time3.6Framingham, MA 01701 30
## 52 Spavia Day Spa3.3Natick, MA 01760 5
## 53 Life Time3.6Framingham, MA 01701 30
## 54 Massage Envy3.2Westborough, MA 01581+1 location 30
## 55 Moodz Salon and SpaActon, MA 01720 16
## 56 Invidia Salon and SpaSudbury, MA 01776 30
## 57 Hand & Stone - NatickNatick, MA 01760 1
## 58 LaRose Muscular TherapyMilford, MA 01757 30
## 59 Elements Massage3.6Shrewsbury, MA 01545 30
## 60 Bellezza Day SpaFranklin, MA 02038 30
## 61 Orthomed Massage ClinicNorthborough, MA 01532 30
## 62 Elements Massage3.6Marlborough, MA 01752 (Farm Road area) 6
## 63 Hand & Stone - NatickNatick, MA 01760 1
## 64 Invidia Salon and SpaSudbury, MA 01776 30
## 65 inBalance Chiropractic and WellnessShrewsbury, MA 01545 30
## 66 Elements3.6Marlborough, MA 01752 (Elm Street area)+1 location 30
## 67 Elements3.6Shrewsbury, MA 01545 30
## 68 Massage Envy3.2Westborough, MA 01581+2 locations 7
## 69 Massage Envy3.2Westborough, MA 01581+1 location 7
## 70 Hand and Stone Spa3.0Hudson, MA 01749 7
## 71 Massage Envy3.2Shrewsbury, MA 01545 27
## 72 Stretchlab Corporate3.8Natick, MA 27
## 73 Life Time3.6Framingham, MA 01701 30
## 74 Spavia Day Spa3.3Natick, MA 01760 5
## 75 Life Time3.6Framingham, MA 01701 30
## 76 Massage Envy3.2Westborough, MA 01581+1 location 30
## 77 Moodz Salon and SpaActon, MA 01720 16
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 18 40 25000 65000
## 2 18 40 25000 65000
## 3 18 40 25000 65000
## 4 18 40 25000 65000
## 5 18 40 25000 65000
## 6 18 40 25000 65000
## 7 18 40 25000 65000
## 8 18 40 25000 65000
## 9 18 40 25000 65000
## 10 18 40 25000 65000
## 11 18 40 25000 65000
## 12 18 40 25000 65000
## 13 18 40 25000 65000
## 14 18 40 25000 65000
## 15 18 40 25000 65000
## 16 18 40 25000 65000
## 17 18 40 25000 65000
## 18 18 40 25000 65000
## 19 18 40 25000 65000
## 20 18 40 25000 65000
## 21 18 40 25000 65000
## 22 18 40 25000 65000
## 23 18 40 25000 65000
## 24 18 40 25000 65000
## 25 18 40 25000 65000
## 26 18 40 25000 65000
## 27 18 40 25000 65000
## 28 18 40 25000 65000
## 29 18 40 25000 65000
## 30 18 40 25000 65000
## 31 18 40 25000 65000
## 32 18 40 25000 65000
## 33 18 40 25000 65000
## 34 18 40 25000 65000
## 35 18 40 25000 65000
## 36 18 40 25000 65000
## 37 18 40 25000 65000
## 38 18 40 25000 65000
## 39 18 40 25000 65000
## 40 18 40 25000 65000
## 41 18 40 25000 65000
## 42 18 40 25000 65000
## 43 18 40 25000 65000
## 44 18 40 25000 65000
## 45 18 40 25000 65000
## 46 18 40 25000 65000
## 47 18 40 25000 65000
## 48 18 40 25000 65000
## 49 18 40 25000 65000
## 50 18 40 25000 65000
## 51 18 40 25000 65000
## 52 18 40 25000 65000
## 53 18 40 25000 65000
## 54 18 40 25000 65000
## 55 18 40 25000 65000
## 56 18 40 25000 65000
## 57 18 40 25000 65000
## 58 18 40 25000 65000
## 59 18 40 25000 65000
## 60 18 40 25000 65000
## 61 18 40 25000 65000
## 62 18 40 25000 65000
## 63 18 40 25000 65000
## 64 18 40 25000 65000
## 65 18 40 25000 65000
## 66 18 40 25000 65000
## 67 18 40 25000 65000
## 68 18 40 25000 65000
## 69 18 40 25000 65000
## 70 18 40 25000 65000
## 71 18 40 25000 65000
## 72 18 40 25000 65000
## 73 18 40 25000 65000
## 74 18 40 25000 65000
## 75 18 40 25000 65000
## 76 18 40 25000 65000
## 77 18 40 25000 65000
getIndeedJobData5pages("massage therapist","Springfield","MA")
## Warning in getIndeedJobData5pages("massage therapist", "Springfield", "MA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Springfield", "MA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Springfield", "MA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist (Part-time)
## 4 Licensed Massage Therapist, Independent Contractor
## 5 Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist - Full Time
## 14 Licensed Massage Therapist
## 15 Massage Therapist
## 16 Massage Therapist (Part-time)
## 17 Licensed Massage Therapist, Independent Contractor
## 18 Licensed Massage Therapist
## 19 Massage Therapist
## 20 Massage Therapist - Full Time
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Mobile Massage Therapist
## 26 Licensed Massage Therapist (LMT)
## 27 Connecticut Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Massage Therapist (Part-time)
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist - Full Time
## 35 Licensed Massage Therapist
## 36 Massage Therapist
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Mobile Massage Therapist
## 40 Licensed Massage Therapist (LMT)
## 41 Connecticut Licensed Massage Therapist
## 42 Licensed Massage Therapist, Independent Contractor
## 43 Massage Therapist
## 44 Massage Therapist
## 45 Massage Therapist - Full Time
## 46 Licensed Massage Therapist
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Mobile Massage Therapist
## 51 Licensed Massage Therapist (LMT)
## 52 Connecticut Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Licensed Massage Therapist
## 55 Massage Therapist
## 56 Massage Therapist (Part-time)
## 57 Licensed Massage Therapist, Independent Contractor
## 58 Licensed Massage Therapist
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist - Independent Contractor
## 62 Licensed Massage Therapist (LMT)
## 63 Licensed Massage Therapist
## 64 Massage Therapist
## 65 Massage Therapist - Full Time
## 66 Connecticut Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist
## 69 Massage Therapist
## 70 Licensed Massage Therapist
## 71 Mobile Massage Therapist
## 72 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 2 \n$12 an hour $12 12 NA
## 3 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 4 \n$35 - $65 an hour $35 - $65 35 65
## 5 \nUp to $65,000 a year $65000 65000 NA
## 6 \n$21,000 - $48,000 a year $21000 - $48000 21000 48000
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$30 - $65 an hour $30 - $65 30 65
## 9 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 10 \n$35 - $55 an hour $35 - $55 35 55
## 11 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 12 \n$35 - $65 an hour $35 - $65 35 65
## 13 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 14 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 15 \n$35 - $55 an hour $35 - $55 35 55
## 16 \n$30 - $40 an hour $30 - $40 30 40
## 17 \n$45 - $70 an hour $45 - $70 45 70
## 18 \n$25 - $28 an hour $25 - $28 25 28
## 19 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 20 \n$12 an hour $12 12 NA
## 21 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 22 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 23 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 24 \n$35 - $55 an hour $35 - $55 35 55
## 25 \n$30 - $40 an hour $30 - $40 30 40
## 26 \n$45 - $70 an hour $45 - $70 45 70
## 27 \n$25 - $28 an hour $25 - $28 25 28
## 28 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 29 \n$35 - $65 an hour $35 - $65 35 65
## 30 \n$12 an hour $12 12 NA
## 31 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 32 \n$35 - $55 an hour $35 - $55 35 55
## 33 \n$30 - $40 an hour $30 - $40 30 40
## 34 \n$45 - $70 an hour $45 - $70 45 70
## 35 \n$25 - $28 an hour $25 - $28 25 28
## 36 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 37 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 38 \n$12 an hour $12 12 NA
## 39 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 40 \n$35 - $65 an hour $35 - $65 35 65
## 41 \n$21,000 - $48,000 a year $21000 - $48000 21000 48000
## 42 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 43 \n$30 - $65 an hour $30 - $65 30 65
## 44 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 45 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 46 \n$35 - $55 an hour $35 - $55 35 55
## 47 \n$30 - $40 an hour $30 - $40 30 40
## 48 \n$45 - $70 an hour $45 - $70 45 70
## 49 \n$25 - $28 an hour $25 - $28 25 28
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 70 13159.65 17753.12 12
## 2 45 70 13159.65 17753.12 12
## 3 45 70 13159.65 17753.12 12
## 4 45 70 13159.65 17753.12 12
## 5 45 70 13159.65 17753.12 12
## 6 45 70 13159.65 17753.12 12
## 7 45 70 13159.65 17753.12 12
## 8 45 70 13159.65 17753.12 12
## 9 45 70 13159.65 17753.12 12
## 10 45 70 13159.65 17753.12 12
## 11 45 70 13159.65 17753.12 12
## 12 45 70 13159.65 17753.12 12
## 13 45 70 13159.65 17753.12 12
## 14 45 70 13159.65 17753.12 12
## 15 45 70 13159.65 17753.12 12
## 16 45 70 13159.65 17753.12 12
## 17 45 70 13159.65 17753.12 12
## 18 45 70 13159.65 17753.12 12
## 19 45 70 13159.65 17753.12 12
## 20 45 70 13159.65 17753.12 12
## 21 45 70 13159.65 17753.12 12
## 22 45 70 13159.65 17753.12 12
## 23 45 70 13159.65 17753.12 12
## 24 45 70 13159.65 17753.12 12
## 25 45 70 13159.65 17753.12 12
## 26 45 70 13159.65 17753.12 12
## 27 45 70 13159.65 17753.12 12
## 28 45 70 13159.65 17753.12 12
## 29 45 70 13159.65 17753.12 12
## 30 45 70 13159.65 17753.12 12
## 31 45 70 13159.65 17753.12 12
## 32 45 70 13159.65 17753.12 12
## 33 45 70 13159.65 17753.12 12
## 34 45 70 13159.65 17753.12 12
## 35 45 70 13159.65 17753.12 12
## 36 45 70 13159.65 17753.12 12
## 37 45 70 13159.65 17753.12 12
## 38 45 70 13159.65 17753.12 12
## 39 45 70 13159.65 17753.12 12
## 40 45 70 13159.65 17753.12 12
## 41 45 70 13159.65 17753.12 12
## 42 45 70 13159.65 17753.12 12
## 43 45 70 13159.65 17753.12 12
## 44 45 70 13159.65 17753.12 12
## 45 45 70 13159.65 17753.12 12
## 46 45 70 13159.65 17753.12 12
## 47 45 70 13159.65 17753.12 12
## 48 45 70 13159.65 17753.12 12
## 49 45 70 13159.65 17753.12 12
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 28 65000
## 29 65000
## 30 65000
## 31 65000
## 32 65000
## 33 65000
## 34 65000
## 35 65000
## 36 65000
## 37 65000
## 38 65000
## 39 65000
## 40 65000
## 41 65000
## 42 65000
## 43 65000
## 44 65000
## 45 65000
## 46 65000
## 47 65000
## 48 65000
## 49 65000
##
## [[3]]
## date_daysAgo
## 1 25
## 2 25
## 3 1
## 4 30
## 5 30
## 6 24
## 7 30
## 8 6
## 9 17
## 10 9
## 11 7
## 12 29
## 13 24
## 14 8
## 15 22
## 16 1
## 17 30
## 18 25
## 19 29
## 20 24
## 21 8
## 22 22
## 23 30
## 24 6
## 25 30
## 26 7
## 27 21
## 28 24
## 29 25
## 30 1
## 31 24
## 32 25
## 33 29
## 34 24
## 35 8
## 36 22
## 37 30
## 38 6
## 39 30
## 40 7
## 41 21
## 42 30
## 43 25
## 44 29
## 45 24
## 46 8
## 47 22
## 48 30
## 49 6
## 50 30
## 51 7
## 52 21
## 53 24
## 54 25
## 55 25
## 56 1
## 57 30
## 58 24
## 59 30
## 60 6
## 61 17
## 62 9
## 63 7
## 64 29
## 65 24
## 66 21
## 67 8
## 68 30
## 69 22
## 70 6
## 71 30
## 72 7
##
## [[4]]
## HiringAgency
## 1 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 2 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 3 Mind Body & SkinWest Springfield, MA 01089
## 4 East HeavenNorthampton, MA 01060
## 5 Elements3.6East Longmeadow, MA 01028+2 locations
## 6 Soothe3.7Hartford, CT
## 7 D.Hotel Suites& SpaHolyoke, MA 01040
## 8 SkinCatering SpaSpringfield, MA 01103 (Metro Center area)
## 9 Indo-Pak Massage TherapyHartford, CT+2 locations•Remote work available
## 10 Somers Day Spa & SalonSomers, CT 06071
## 11 Puffer's Salon & Day SpaWestfield, MA 01085
## 12 Elements Massage3.6East Longmeadow, MA 01028
## 13 Massage Envy3.2West Springfield, MA 01089+3 locations
## 14 Greenwich HospitalityWest Hartford, CT 06107
## 15 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 16 Mind Body & SkinWest Springfield, MA 01089
## 17 East HeavenNorthampton, MA 01060
## 18 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 19 Elements Massage3.6East Longmeadow, MA 01028
## 20 Massage Envy3.2West Springfield, MA 01089+3 locations
## 21 Greenwich HospitalityWest Hartford, CT 06107
## 22 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 23 PS Lifestyle3.0Simsbury, CT
## 24 In Touch MassageWest Hartford, CT 06107
## 25 Indo-Pak Massage TherapyHartford, CT+1 location
## 26 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
## 27 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 28 Soothe3.7Hartford, CT
## 29 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 30 Mind Body & SkinWest Springfield, MA 01089
## 31 Soothe3.7Hartford, CT
## 32 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 33 Elements Massage3.6East Longmeadow, MA 01028
## 34 Massage Envy3.2West Springfield, MA 01089+3 locations
## 35 Greenwich HospitalityWest Hartford, CT 06107
## 36 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 37 PS Lifestyle3.0Simsbury, CT
## 38 In Touch MassageWest Hartford, CT 06107
## 39 Indo-Pak Massage TherapyHartford, CT+1 location
## 40 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
## 41 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 42 East HeavenNorthampton, MA 01060
## 43 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 44 Elements Massage3.6East Longmeadow, MA 01028
## 45 Massage Envy3.2West Springfield, MA 01089+3 locations
## 46 Greenwich HospitalityWest Hartford, CT 06107
## 47 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 48 PS Lifestyle3.0Simsbury, CT
## 49 In Touch MassageWest Hartford, CT 06107
## 50 Indo-Pak Massage TherapyHartford, CT+1 location
## 51 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
## 52 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 53 Soothe3.7Hartford, CT
## 54 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 55 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 56 Mind Body & SkinWest Springfield, MA 01089
## 57 East HeavenNorthampton, MA 01060
## 58 Soothe3.7Hartford, CT
## 59 D.Hotel Suites& SpaHolyoke, MA 01040
## 60 SkinCatering SpaSpringfield, MA 01103 (Metro Center area)
## 61 Indo-Pak Massage TherapyHartford, CT+2 locations•Remote work available
## 62 Somers Day Spa & SalonSomers, CT 06071
## 63 Puffer's Salon & Day SpaWestfield, MA 01085
## 64 Elements Massage3.6East Longmeadow, MA 01028
## 65 Massage Envy3.2West Springfield, MA 01089+3 locations
## 66 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 67 Greenwich HospitalityWest Hartford, CT 06107
## 68 PS Lifestyle3.0Simsbury, CT
## 69 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 70 In Touch MassageWest Hartford, CT 06107
## 71 Indo-Pak Massage TherapyHartford, CT+1 location
## 72 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 3 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 5 \nUp to $65,000 a year $65000 65000 NA
## 6 \n$21,000 - $48,000 a year $21000 - $48000 21000 48000
## 9 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 11 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 13 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 14 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 19 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 21 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 22 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 23 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 28 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 31 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 36 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 37 \n$30,000 - $60,000 a year $30000 - $60000 30000 60000
## 39 \n$20,000 - $26,000 a year $20000 - $26000 20000 26000
## 41 \n$21,000 - $48,000 a year $21000 - $48000 21000 48000
## 44 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 45 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 32500 54000 31700 51631.58 20000
## 3 32500 54000 31700 51631.58 20000
## 5 32500 54000 31700 51631.58 20000
## 6 32500 54000 31700 51631.58 20000
## 9 32500 54000 31700 51631.58 20000
## 11 32500 54000 31700 51631.58 20000
## 13 32500 54000 31700 51631.58 20000
## 14 32500 54000 31700 51631.58 20000
## 19 32500 54000 31700 51631.58 20000
## 21 32500 54000 31700 51631.58 20000
## 22 32500 54000 31700 51631.58 20000
## 23 32500 54000 31700 51631.58 20000
## 28 32500 54000 31700 51631.58 20000
## 31 32500 54000 31700 51631.58 20000
## 36 32500 54000 31700 51631.58 20000
## 37 32500 54000 31700 51631.58 20000
## 39 32500 54000 31700 51631.58 20000
## 41 32500 54000 31700 51631.58 20000
## 44 32500 54000 31700 51631.58 20000
## 45 32500 54000 31700 51631.58 20000
## maximumMaxSalary
## 1 65000
## 3 65000
## 5 65000
## 6 65000
## 9 65000
## 11 65000
## 13 65000
## 14 65000
## 19 65000
## 21 65000
## 22 65000
## 23 65000
## 28 65000
## 31 65000
## 36 65000
## 37 65000
## 39 65000
## 41 65000
## 44 65000
## 45 65000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$12 an hour $12 12 NA 30
## 4 \n$35 - $65 an hour $35 - $65 35 65 30
## 8 \n$30 - $65 an hour $30 - $65 30 65 30
## 10 \n$35 - $55 an hour $35 - $55 35 55 30
## 12 \n$35 - $65 an hour $35 - $65 35 65 30
## 15 \n$35 - $55 an hour $35 - $55 35 55 30
## 16 \n$30 - $40 an hour $30 - $40 30 40 30
## 17 \n$45 - $70 an hour $45 - $70 45 70 30
## 18 \n$25 - $28 an hour $25 - $28 25 28 30
## 20 \n$12 an hour $12 12 NA 30
## 24 \n$35 - $55 an hour $35 - $55 35 55 30
## 25 \n$30 - $40 an hour $30 - $40 30 40 30
## 26 \n$45 - $70 an hour $45 - $70 45 70 30
## 27 \n$25 - $28 an hour $25 - $28 25 28 30
## 29 \n$35 - $65 an hour $35 - $65 35 65 30
## 30 \n$12 an hour $12 12 NA 30
## 32 \n$35 - $55 an hour $35 - $55 35 55 30
## 33 \n$30 - $40 an hour $30 - $40 30 40 30
## 34 \n$45 - $70 an hour $45 - $70 45 70 30
## 35 \n$25 - $28 an hour $25 - $28 25 28 30
## 38 \n$12 an hour $12 12 NA 30
## 40 \n$35 - $65 an hour $35 - $65 35 65 30
## 43 \n$30 - $65 an hour $30 - $65 30 65 30
## 46 \n$35 - $55 an hour $35 - $55 35 55 30
## 47 \n$30 - $40 an hour $30 - $40 30 40 30
## 48 \n$45 - $70 an hour $45 - $70 45 70 30
## 49 \n$25 - $28 an hour $25 - $28 25 28 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 55 30.48148 52.91304 12 70
## 4 55 30.48148 52.91304 12 70
## 8 55 30.48148 52.91304 12 70
## 10 55 30.48148 52.91304 12 70
## 12 55 30.48148 52.91304 12 70
## 15 55 30.48148 52.91304 12 70
## 16 55 30.48148 52.91304 12 70
## 17 55 30.48148 52.91304 12 70
## 18 55 30.48148 52.91304 12 70
## 20 55 30.48148 52.91304 12 70
## 24 55 30.48148 52.91304 12 70
## 25 55 30.48148 52.91304 12 70
## 26 55 30.48148 52.91304 12 70
## 27 55 30.48148 52.91304 12 70
## 29 55 30.48148 52.91304 12 70
## 30 55 30.48148 52.91304 12 70
## 32 55 30.48148 52.91304 12 70
## 33 55 30.48148 52.91304 12 70
## 34 55 30.48148 52.91304 12 70
## 35 55 30.48148 52.91304 12 70
## 38 55 30.48148 52.91304 12 70
## 40 55 30.48148 52.91304 12 70
## 43 55 30.48148 52.91304 12 70
## 46 55 30.48148 52.91304 12 70
## 47 55 30.48148 52.91304 12 70
## 48 55 30.48148 52.91304 12 70
## 49 55 30.48148 52.91304 12 70
##
## [[7]]
## city state jobTitle
## 1 Springfield MA Licensed Massage Therapist
## 2 Springfield MA Massage Therapist
## 3 Springfield MA Massage Therapist (Part-time)
## 4 Springfield MA Licensed Massage Therapist, Independent Contractor
## 5 Springfield MA Massage Therapist
## 6 Springfield MA Licensed Massage Therapist
## 7 Springfield MA Licensed Massage Therapist
## 8 Springfield MA Licensed Massage Therapist
## 9 Springfield MA Massage Therapist - Independent Contractor
## 10 Springfield MA Licensed Massage Therapist (LMT)
## 11 Springfield MA Licensed Massage Therapist
## 12 Springfield MA Massage Therapist
## 13 Springfield MA Massage Therapist - Full Time
## 14 Springfield MA Licensed Massage Therapist
## 15 Springfield MA Massage Therapist
## 16 Springfield MA Massage Therapist (Part-time)
## 17 Springfield MA Licensed Massage Therapist, Independent Contractor
## 18 Springfield MA Licensed Massage Therapist
## 19 Springfield MA Massage Therapist
## 20 Springfield MA Massage Therapist - Full Time
## 21 Springfield MA Licensed Massage Therapist
## 22 Springfield MA Massage Therapist
## 23 Springfield MA Licensed Massage Therapist
## 24 Springfield MA Licensed Massage Therapist
## 25 Springfield MA Mobile Massage Therapist
## 26 Springfield MA Licensed Massage Therapist (LMT)
## 27 Springfield MA Connecticut Licensed Massage Therapist
## 28 Springfield MA Licensed Massage Therapist
## 29 Springfield MA Massage Therapist
## 30 Springfield MA Massage Therapist (Part-time)
## 31 Springfield MA Licensed Massage Therapist
## 32 Springfield MA Licensed Massage Therapist
## 33 Springfield MA Massage Therapist
## 34 Springfield MA Massage Therapist - Full Time
## 35 Springfield MA Licensed Massage Therapist
## 36 Springfield MA Massage Therapist
## 37 Springfield MA Licensed Massage Therapist
## 38 Springfield MA Licensed Massage Therapist
## 39 Springfield MA Mobile Massage Therapist
## 40 Springfield MA Licensed Massage Therapist (LMT)
## 41 Springfield MA Connecticut Licensed Massage Therapist
## 42 Springfield MA Licensed Massage Therapist, Independent Contractor
## 43 Springfield MA Massage Therapist
## 44 Springfield MA Massage Therapist
## 45 Springfield MA Massage Therapist - Full Time
## 46 Springfield MA Licensed Massage Therapist
## 47 Springfield MA Massage Therapist
## 48 Springfield MA Licensed Massage Therapist
## 49 Springfield MA Licensed Massage Therapist
## 50 Springfield MA Mobile Massage Therapist
## 51 Springfield MA Licensed Massage Therapist (LMT)
## 52 Springfield MA Connecticut Licensed Massage Therapist
## 53 Springfield MA Licensed Massage Therapist
## 54 Springfield MA Licensed Massage Therapist
## 55 Springfield MA Massage Therapist
## 56 Springfield MA Massage Therapist (Part-time)
## 57 Springfield MA Licensed Massage Therapist, Independent Contractor
## 58 Springfield MA Licensed Massage Therapist
## 59 Springfield MA Licensed Massage Therapist
## 60 Springfield MA Licensed Massage Therapist
## 61 Springfield MA Massage Therapist - Independent Contractor
## 62 Springfield MA Licensed Massage Therapist (LMT)
## 63 Springfield MA Licensed Massage Therapist
## 64 Springfield MA Massage Therapist
## 65 Springfield MA Massage Therapist - Full Time
## 66 Springfield MA Connecticut Licensed Massage Therapist
## 67 Springfield MA Licensed Massage Therapist
## 68 Springfield MA Licensed Massage Therapist
## 69 Springfield MA Massage Therapist
## 70 Springfield MA Licensed Massage Therapist
## 71 Springfield MA Mobile Massage Therapist
## 72 Springfield MA Licensed Massage Therapist (LMT)
## HiringAgency
## 1 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 2 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 3 Mind Body & SkinWest Springfield, MA 01089
## 4 East HeavenNorthampton, MA 01060
## 5 Elements3.6East Longmeadow, MA 01028+2 locations
## 6 Soothe3.7Hartford, CT
## 7 D.Hotel Suites& SpaHolyoke, MA 01040
## 8 SkinCatering SpaSpringfield, MA 01103 (Metro Center area)
## 9 Indo-Pak Massage TherapyHartford, CT+2 locations•Remote work available
## 10 Somers Day Spa & SalonSomers, CT 06071
## 11 Puffer's Salon & Day SpaWestfield, MA 01085
## 12 Elements Massage3.6East Longmeadow, MA 01028
## 13 Massage Envy3.2West Springfield, MA 01089+3 locations
## 14 Greenwich HospitalityWest Hartford, CT 06107
## 15 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 16 Mind Body & SkinWest Springfield, MA 01089
## 17 East HeavenNorthampton, MA 01060
## 18 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 19 Elements Massage3.6East Longmeadow, MA 01028
## 20 Massage Envy3.2West Springfield, MA 01089+3 locations
## 21 Greenwich HospitalityWest Hartford, CT 06107
## 22 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 23 PS Lifestyle3.0Simsbury, CT
## 24 In Touch MassageWest Hartford, CT 06107
## 25 Indo-Pak Massage TherapyHartford, CT+1 location
## 26 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
## 27 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 28 Soothe3.7Hartford, CT
## 29 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 30 Mind Body & SkinWest Springfield, MA 01089
## 31 Soothe3.7Hartford, CT
## 32 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 33 Elements Massage3.6East Longmeadow, MA 01028
## 34 Massage Envy3.2West Springfield, MA 01089+3 locations
## 35 Greenwich HospitalityWest Hartford, CT 06107
## 36 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 37 PS Lifestyle3.0Simsbury, CT
## 38 In Touch MassageWest Hartford, CT 06107
## 39 Indo-Pak Massage TherapyHartford, CT+1 location
## 40 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
## 41 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 42 East HeavenNorthampton, MA 01060
## 43 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 44 Elements Massage3.6East Longmeadow, MA 01028
## 45 Massage Envy3.2West Springfield, MA 01089+3 locations
## 46 Greenwich HospitalityWest Hartford, CT 06107
## 47 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 48 PS Lifestyle3.0Simsbury, CT
## 49 In Touch MassageWest Hartford, CT 06107
## 50 Indo-Pak Massage TherapyHartford, CT+1 location
## 51 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
## 52 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 53 Soothe3.7Hartford, CT
## 54 Escape Therapeutic MassageEast Longmeadow, MA 01028
## 55 Euro Coiffure Salon & Day SpaSpringfield, MA 01129 (Sixteen Acres area)
## 56 Mind Body & SkinWest Springfield, MA 01089
## 57 East HeavenNorthampton, MA 01060
## 58 Soothe3.7Hartford, CT
## 59 D.Hotel Suites& SpaHolyoke, MA 01040
## 60 SkinCatering SpaSpringfield, MA 01103 (Metro Center area)
## 61 Indo-Pak Massage TherapyHartford, CT+2 locations•Remote work available
## 62 Somers Day Spa & SalonSomers, CT 06071
## 63 Puffer's Salon & Day SpaWestfield, MA 01085
## 64 Elements Massage3.6East Longmeadow, MA 01028
## 65 Massage Envy3.2West Springfield, MA 01089+3 locations
## 66 THERPOINT MASSAGE2.0South Windsor, CT 06074
## 67 Greenwich HospitalityWest Hartford, CT 06107
## 68 PS Lifestyle3.0Simsbury, CT
## 69 Azure Hair & SpaManchester, CT 06040 (Highland Park area)
## 70 In Touch MassageWest Hartford, CT 06107
## 71 Indo-Pak Massage TherapyHartford, CT+1 location
## 72 R and R Massage and Day SpaCanton, CT 06019 (Collinsville area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 25 12 70 20000 65000
## 2 25 12 70 20000 65000
## 3 1 12 70 20000 65000
## 4 30 12 70 20000 65000
## 5 30 12 70 20000 65000
## 6 24 12 70 20000 65000
## 7 30 12 70 20000 65000
## 8 6 12 70 20000 65000
## 9 17 12 70 20000 65000
## 10 9 12 70 20000 65000
## 11 7 12 70 20000 65000
## 12 29 12 70 20000 65000
## 13 24 12 70 20000 65000
## 14 8 12 70 20000 65000
## 15 22 12 70 20000 65000
## 16 1 12 70 20000 65000
## 17 30 12 70 20000 65000
## 18 25 12 70 20000 65000
## 19 29 12 70 20000 65000
## 20 24 12 70 20000 65000
## 21 8 12 70 20000 65000
## 22 22 12 70 20000 65000
## 23 30 12 70 20000 65000
## 24 6 12 70 20000 65000
## 25 30 12 70 20000 65000
## 26 7 12 70 20000 65000
## 27 21 12 70 20000 65000
## 28 24 12 70 20000 65000
## 29 25 12 70 20000 65000
## 30 1 12 70 20000 65000
## 31 24 12 70 20000 65000
## 32 25 12 70 20000 65000
## 33 29 12 70 20000 65000
## 34 24 12 70 20000 65000
## 35 8 12 70 20000 65000
## 36 22 12 70 20000 65000
## 37 30 12 70 20000 65000
## 38 6 12 70 20000 65000
## 39 30 12 70 20000 65000
## 40 7 12 70 20000 65000
## 41 21 12 70 20000 65000
## 42 30 12 70 20000 65000
## 43 25 12 70 20000 65000
## 44 29 12 70 20000 65000
## 45 24 12 70 20000 65000
## 46 8 12 70 20000 65000
## 47 22 12 70 20000 65000
## 48 30 12 70 20000 65000
## 49 6 12 70 20000 65000
## 50 30 12 70 20000 65000
## 51 7 12 70 20000 65000
## 52 21 12 70 20000 65000
## 53 24 12 70 20000 65000
## 54 25 12 70 20000 65000
## 55 25 12 70 20000 65000
## 56 1 12 70 20000 65000
## 57 30 12 70 20000 65000
## 58 24 12 70 20000 65000
## 59 30 12 70 20000 65000
## 60 6 12 70 20000 65000
## 61 17 12 70 20000 65000
## 62 9 12 70 20000 65000
## 63 7 12 70 20000 65000
## 64 29 12 70 20000 65000
## 65 24 12 70 20000 65000
## 66 21 12 70 20000 65000
## 67 8 12 70 20000 65000
## 68 30 12 70 20000 65000
## 69 22 12 70 20000 65000
## 70 6 12 70 20000 65000
## 71 30 12 70 20000 65000
## 72 7 12 70 20000 65000
Michigan Detroit, Grand Rapids, Warren
getIndeedJobData5pages("massage therapist","Detroit","MI")
## Warning in getIndeedJobData5pages("massage therapist", "Detroit", "MI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Detroit", "MI"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist, $25~$65/service incl tips, ~$300...
## 10 Hospice Massage Therapist
## 11 SPA TECHNICIAN (MASSAGE THERAPIST)
## 12 Licensed Massage Therapist (LMT) - Contractor
## 13 Licensed Massage Therapist
## 14 WANTED - Massage Therapists, Nail Techs and Estheticians for...
## 15 Licensed Massage Therapist (LMT)
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist - Full Time
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist (LMT)
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist (LMT) - Contractor
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist - Independent Contractor
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage therapist Best Pay in Town
## 30 Licensed Massage Therapist
## 31 LifeSpa-Massage Therapist
## 32 Mobile Massage Therapist
## 33 Licensed Massage Therapist (LMT) - Contractor
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Part time Massage therapist
## 38 Now Hiring Massage Therapist LMT
## 39 Licensed Massage Therapist
## 40 Massage Therapist (Part-Time)
## 41 Massage Therapist - Licensed
## 42 Massage Therapist
## 43 Massage Therapist Full or Part Time
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist [CUSTOMIZATION REQUIRED]
## 47 Massage Therapist for Upscale Wellness Spa 3500 square feet
## 48 Massage Therapist
## 49 Massage Therapists
## 50 Licensed Massage Therapist, Independent Contractor
## 51 massage therapist
## 52 Massage Therapist - Independent Contractor
## 53 Massage Therapist (part-time, flexible hours)
## 54 Licensed Massage Therapist
## 55 Massage Therapist (Part-Time)
## 56 Massage Therapist - Licensed
## 57 Massage Therapist
## 58 Massage Therapist Full or Part Time
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist [CUSTOMIZATION REQUIRED]
## 62 Massage Therapist for Upscale Wellness Spa 3500 square feet
## 63 Massage Therapist
## 64 Massage Therapists
## 65 Licensed Massage Therapist, Independent Contractor
## 66 massage therapist
## 67 Massage Therapist - Independent Contractor
## 68 Massage Therapist (part-time, flexible hours)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$27 - $33 an hour $27 - $33 27.0 33
## 2 \n$18 - $28 an hour $18 - $28 18.0 28
## 3 \n$35 an hour $35 35.0 NA
## 4 \n$15 - $50 an hour $15 - $50 15.0 50
## 5 \n$29 - $45 an hour $29 - $45 29.0 45
## 6 \n$20 - $60 an hour $20 - $60 20.0 60
## 7 \n$50 an hour $50 50.0 NA
## 8 \n$30 - $45 an hour $30 - $45 30.0 45
## 9 \n$20 - $42 an hour $20 - $42 20.0 42
## 10 \n$25 - $35 an hour $25 - $35 25.0 35
## 11 \n$25 an hour $25 25.0 NA
## 12 \n$21 - $28 an hour $21 - $28 21.0 28
## 13 \n$30 - $45 an hour $30 - $45 30.0 45
## 14 \n$21 - $26 an hour $21 - $26 21.0 26
## 15 \n$50 an hour $50 50.0 NA
## 16 \n$10 - $35 an hour $10 - $35 10.0 35
## 17 \n$20 - $40 an hour $20 - $40 20.0 40
## 18 \n$30 - $45 an hour $30 - $45 30.0 45
## 19 \n$45 - $70 an hour $45 - $70 45.0 70
## 20 \n$40,000 - $50,000 a year $40000 - $50000 40000.0 50000
## 21 \n$25 - $31 an hour $25 - $31 25.0 31
## 22 \n$45 - $70 an hour $45 - $70 45.0 70
## 23 \n$50 an hour $50 50.0 NA
## 24 \n$40,000 - $50,000 a year $40000 - $50000 40000.0 50000
## 25 \n$30 - $45 an hour $30 - $45 30.0 45
## 26 \n$40,000 - $50,000 a year $40000 - $50000 40000.0 50000
## 27 \n$25 - $31 an hour $25 - $31 25.0 31
## 28 \n$35 an hour $35 35.0 NA
## 29 \n$17.50 - $22.00 an hour $17.50 - $22.00 17.5 22
## 30 \n$27 - $32 an hour $27 - $32 27.0 32
## 31 \n$18 - $22 an hour $18 - $22 18.0 22
## 32 \n$17.50 - $21.00 an hour $17.50 - $21.00 17.5 21
## 33 \n$24 an hour $24 24.0 NA
## 34 \n$18 - $40 an hour $18 - $40 18.0 40
## 35 \n$20 - $26 an hour $20 - $26 20.0 26
## 36 \n$20 - $30 an hour $20 - $30 20.0 30
## 37 \n$25 - $31 an hour $25 - $31 25.0 31
## 38 \n$35 an hour $35 35.0 NA
## 39 \n$17.50 - $22.00 an hour $17.50 - $22.00 17.5 22
## 40 \n$27 - $32 an hour $27 - $32 27.0 32
## 41 \n$18 - $22 an hour $18 - $22 18.0 22
## 42 \n$17.50 - $21.00 an hour $17.50 - $21.00 17.5 21
## 43 \n$24 an hour $24 24.0 NA
## 44 \n$18 - $40 an hour $18 - $40 18.0 40
## 45 \n$20 - $26 an hour $20 - $26 20.0 26
## 46 \n$20 - $30 an hour $20 - $30 20.0 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 29 2632.935 3281.157 10
## 2 25 29 2632.935 3281.157 10
## 3 25 29 2632.935 3281.157 10
## 4 25 29 2632.935 3281.157 10
## 5 25 29 2632.935 3281.157 10
## 6 25 29 2632.935 3281.157 10
## 7 25 29 2632.935 3281.157 10
## 8 25 29 2632.935 3281.157 10
## 9 25 29 2632.935 3281.157 10
## 10 25 29 2632.935 3281.157 10
## 11 25 29 2632.935 3281.157 10
## 12 25 29 2632.935 3281.157 10
## 13 25 29 2632.935 3281.157 10
## 14 25 29 2632.935 3281.157 10
## 15 25 29 2632.935 3281.157 10
## 16 25 29 2632.935 3281.157 10
## 17 25 29 2632.935 3281.157 10
## 18 25 29 2632.935 3281.157 10
## 19 25 29 2632.935 3281.157 10
## 20 25 29 2632.935 3281.157 10
## 21 25 29 2632.935 3281.157 10
## 22 25 29 2632.935 3281.157 10
## 23 25 29 2632.935 3281.157 10
## 24 25 29 2632.935 3281.157 10
## 25 25 29 2632.935 3281.157 10
## 26 25 29 2632.935 3281.157 10
## 27 25 29 2632.935 3281.157 10
## 28 25 29 2632.935 3281.157 10
## 29 25 29 2632.935 3281.157 10
## 30 25 29 2632.935 3281.157 10
## 31 25 29 2632.935 3281.157 10
## 32 25 29 2632.935 3281.157 10
## 33 25 29 2632.935 3281.157 10
## 34 25 29 2632.935 3281.157 10
## 35 25 29 2632.935 3281.157 10
## 36 25 29 2632.935 3281.157 10
## 37 25 29 2632.935 3281.157 10
## 38 25 29 2632.935 3281.157 10
## 39 25 29 2632.935 3281.157 10
## 40 25 29 2632.935 3281.157 10
## 41 25 29 2632.935 3281.157 10
## 42 25 29 2632.935 3281.157 10
## 43 25 29 2632.935 3281.157 10
## 44 25 29 2632.935 3281.157 10
## 45 25 29 2632.935 3281.157 10
## 46 25 29 2632.935 3281.157 10
## maximumMaxSalary
## 1 50000
## 2 50000
## 3 50000
## 4 50000
## 5 50000
## 6 50000
## 7 50000
## 8 50000
## 9 50000
## 10 50000
## 11 50000
## 12 50000
## 13 50000
## 14 50000
## 15 50000
## 16 50000
## 17 50000
## 18 50000
## 19 50000
## 20 50000
## 21 50000
## 22 50000
## 23 50000
## 24 50000
## 25 50000
## 26 50000
## 27 50000
## 28 50000
## 29 50000
## 30 50000
## 31 50000
## 32 50000
## 33 50000
## 34 50000
## 35 50000
## 36 50000
## 37 50000
## 38 50000
## 39 50000
## 40 50000
## 41 50000
## 42 50000
## 43 50000
## 44 50000
## 45 50000
## 46 50000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 4
## 3 13
## 4 19
## 5 Just posted
## 6 12
## 7 30
## 8 27
## 9 30
## 10 1
## 11 30
## 12 8
## 13 30
## 14 11
## 15 14
## 16 18
## 17 30
## 18 14
## 19 27
## 20 21
## 21 25
## 22 30
## 23 8
## 24 29
## 25 13
## 26 29
## 27 30
## 28 27
## 29 17
## 30 30
## 31 30
## 32 30
## 33 8
## 34 17
## 35 30
## 36 15
## 37 30
## 38 17
## 39 30
## 40 30
## 41 30
## 42 30
## 43 17
## 44 28
## 45 7
## 46 30
## 47 17
## 48 25
## 49 14
## 50 3
## 51 30
## 52 30
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 17
## 59 28
## 60 7
## 61 30
## 62 17
## 63 25
## 64 14
## 65 3
## 66 30
## 67 30
## 68 30
##
## [[4]]
## HiringAgency
## 1 Wellness Center4.2Northville, MI 48167
## 2 Daybreak Salon and SpaWyandotte, MI 48192
## 3 Cole Street Salon & SpaBirmingham, MI 48009
## 4 Rivage Day SpaBirmingham, MI 48009
## 5 Claddagh Chiropractic Wellness Center4.0Ferndale, MI 48220
## 6 Semlow Chiropractic TroyTroy, MI 48085
## 7 Margot European SpaBirmingham, MI 48009
## 8 LaVida Massage3.7Canton, MI 48187
## 9 MassageLuXe Spa BirminghamBirmingham, MI 48009
## 10 Premier Hospice and Palliative Care4.1Troy, MI 48083
## 11 MotorCity Casino3.5Detroit, MI 48201 (Briggs area)
## 12 Onward Therapy Services4.2Madison Heights, MI
## 13 ConfidentialTroy, MI 48085
## 14 Om Day SpaDearborn, MI 48124 (Morley area)
## 15 Tri-Covery Massage & FlexibilityNovi, MI 48375
## 16 Broad Family Chiropractic and Still Point MassageCanton, MI 48187
## 17 Life Time3.6Bloomfield Township, MI 48302+3 locations
## 18 OMPT Specialists, Inc.Royal Oak, MI
## 19 Life YogaClinton Township, MI 48038
## 20 Back to Health Wellness CenterUtica, MI 48317
## 21 Elements3.6Troy, MI 48085
## 22 Living in luxury beauty spaGarden City, MI 48135
## 23 Onward Therapy Services4.2Madison Heights, MI
## 24 My Moroccan SpaDearborn, MI
## 25 Relaxing Waters SpaShelby Charter Township, MI 48315
## 26 Michigan Complete Chiropractic & RehabCanton, MI 48187
## 27 ConfidentialTroy, MI 48085
## 28 Health spaNovi, MI
## 29 Hand & Stone - Troy, Northville & Rochester Hills3.0Troy, MI 48083+2 locations
## 30 Total Health SystemsClinton Township, MI 48038
## 31 Life Time3.6Novi, MI 48375
## 32 Indo-Pak Massage TherapyPlymouth, MI+1 location
## 33 Onward Therapy Services4.2Madison Heights, MI
## 34 Hand & Stone - Troy, Northville & Rochester Hills3.0Troy, MI 48084+2 locations
## 35 ConfidentialTroy, MI 48085
## 36 Mystique Day SpaDearborn, MI 48128 (Highland area)
## 37 Hand and Stone3.0Troy, MI 48083+3 locations
## 38 Hand & Stone - Troy, Northville & Rochester Hills3.0Northville, MI 48167
## 39 Total Health SystemsClinton Township, MI 48038
## 40 Life Time3.6Rochester Hills, MI 48307
## 41 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 42 Massage Envy3.2Canton, MI 48187+3 locations
## 43 LaVida Massage of LivoniaLivonia, MI 48154
## 44 Space SpaBloomfield Hills, MI 48302
## 45 Massage Green Spa - Clinton TownshipClinton Township, MI 48035
## 46 Massage Envy3.2Canton, MI 48187
## 47 Evexia Wellness Spa LLCBloomfield Hills, MI
## 48 Massage Envy Canton5.0Canton, MI 48187
## 49 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 50 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 51 Wellness Center of Plymouth, MiPlymouth, MI 48170
## 52 Beach House Day SpaBirmingham, MI 48009
## 53 Massage Envy3.2Woodhaven, MI 48183
## 54 Total Health SystemsClinton Township, MI 48038
## 55 Life Time3.6Rochester Hills, MI 48307
## 56 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 57 Massage Envy3.2Canton, MI 48187+3 locations
## 58 LaVida Massage of LivoniaLivonia, MI 48154
## 59 Space SpaBloomfield Hills, MI 48302
## 60 Massage Green Spa - Clinton TownshipClinton Township, MI 48035
## 61 Massage Envy3.2Canton, MI 48187
## 62 Evexia Wellness Spa LLCBloomfield Hills, MI
## 63 Massage Envy Canton5.0Canton, MI 48187
## 64 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 65 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 66 Wellness Center of Plymouth, MiPlymouth, MI 48170
## 67 Beach House Day SpaBirmingham, MI 48009
## 68 Massage Envy3.2Woodhaven, MI 48183
##
## [[5]]
## Salary salary minSalary maxSalary
## 20 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 24 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 26 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 20 40000 50000 40000 50000 40000
## 24 40000 50000 40000 50000 40000
## 26 40000 50000 40000 50000 40000
## maximumMaxSalary
## 20 50000
## 24 50000
## 26 50000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$27 - $33 an hour $27 - $33 27.0 33
## 2 \n$18 - $28 an hour $18 - $28 18.0 28
## 3 \n$35 an hour $35 35.0 NA
## 4 \n$15 - $50 an hour $15 - $50 15.0 50
## 5 \n$29 - $45 an hour $29 - $45 29.0 45
## 6 \n$20 - $60 an hour $20 - $60 20.0 60
## 7 \n$50 an hour $50 50.0 NA
## 8 \n$30 - $45 an hour $30 - $45 30.0 45
## 9 \n$20 - $42 an hour $20 - $42 20.0 42
## 10 \n$25 - $35 an hour $25 - $35 25.0 35
## 11 \n$25 an hour $25 25.0 NA
## 12 \n$21 - $28 an hour $21 - $28 21.0 28
## 13 \n$30 - $45 an hour $30 - $45 30.0 45
## 14 \n$21 - $26 an hour $21 - $26 21.0 26
## 15 \n$50 an hour $50 50.0 NA
## 16 \n$10 - $35 an hour $10 - $35 10.0 35
## 17 \n$20 - $40 an hour $20 - $40 20.0 40
## 18 \n$30 - $45 an hour $30 - $45 30.0 45
## 19 \n$45 - $70 an hour $45 - $70 45.0 70
## 21 \n$25 - $31 an hour $25 - $31 25.0 31
## 22 \n$45 - $70 an hour $45 - $70 45.0 70
## 23 \n$50 an hour $50 50.0 NA
## 25 \n$30 - $45 an hour $30 - $45 30.0 45
## 27 \n$25 - $31 an hour $25 - $31 25.0 31
## 28 \n$35 an hour $35 35.0 NA
## 29 \n$17.50 - $22.00 an hour $17.50 - $22.00 17.5 22
## 30 \n$27 - $32 an hour $27 - $32 27.0 32
## 31 \n$18 - $22 an hour $18 - $22 18.0 22
## 32 \n$17.50 - $21.00 an hour $17.50 - $21.00 17.5 21
## 33 \n$24 an hour $24 24.0 NA
## 34 \n$18 - $40 an hour $18 - $40 18.0 40
## 35 \n$20 - $26 an hour $20 - $26 20.0 26
## 36 \n$20 - $30 an hour $20 - $30 20.0 30
## 37 \n$25 - $31 an hour $25 - $31 25.0 31
## 38 \n$35 an hour $35 35.0 NA
## 39 \n$17.50 - $22.00 an hour $17.50 - $22.00 17.5 22
## 40 \n$27 - $32 an hour $27 - $32 27.0 32
## 41 \n$18 - $22 an hour $18 - $22 18.0 22
## 42 \n$17.50 - $21.00 an hour $17.50 - $21.00 17.5 21
## 43 \n$24 an hour $24 24.0 NA
## 44 \n$18 - $40 an hour $18 - $40 18.0 40
## 45 \n$20 - $26 an hour $20 - $26 20.0 26
## 46 \n$20 - $30 an hour $20 - $30 20.0 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 24 32 25.93023 35.91176 10
## 2 24 32 25.93023 35.91176 10
## 3 24 32 25.93023 35.91176 10
## 4 24 32 25.93023 35.91176 10
## 5 24 32 25.93023 35.91176 10
## 6 24 32 25.93023 35.91176 10
## 7 24 32 25.93023 35.91176 10
## 8 24 32 25.93023 35.91176 10
## 9 24 32 25.93023 35.91176 10
## 10 24 32 25.93023 35.91176 10
## 11 24 32 25.93023 35.91176 10
## 12 24 32 25.93023 35.91176 10
## 13 24 32 25.93023 35.91176 10
## 14 24 32 25.93023 35.91176 10
## 15 24 32 25.93023 35.91176 10
## 16 24 32 25.93023 35.91176 10
## 17 24 32 25.93023 35.91176 10
## 18 24 32 25.93023 35.91176 10
## 19 24 32 25.93023 35.91176 10
## 21 24 32 25.93023 35.91176 10
## 22 24 32 25.93023 35.91176 10
## 23 24 32 25.93023 35.91176 10
## 25 24 32 25.93023 35.91176 10
## 27 24 32 25.93023 35.91176 10
## 28 24 32 25.93023 35.91176 10
## 29 24 32 25.93023 35.91176 10
## 30 24 32 25.93023 35.91176 10
## 31 24 32 25.93023 35.91176 10
## 32 24 32 25.93023 35.91176 10
## 33 24 32 25.93023 35.91176 10
## 34 24 32 25.93023 35.91176 10
## 35 24 32 25.93023 35.91176 10
## 36 24 32 25.93023 35.91176 10
## 37 24 32 25.93023 35.91176 10
## 38 24 32 25.93023 35.91176 10
## 39 24 32 25.93023 35.91176 10
## 40 24 32 25.93023 35.91176 10
## 41 24 32 25.93023 35.91176 10
## 42 24 32 25.93023 35.91176 10
## 43 24 32 25.93023 35.91176 10
## 44 24 32 25.93023 35.91176 10
## 45 24 32 25.93023 35.91176 10
## 46 24 32 25.93023 35.91176 10
## maximumMaxSalary
## 1 70
## 2 70
## 3 70
## 4 70
## 5 70
## 6 70
## 7 70
## 8 70
## 9 70
## 10 70
## 11 70
## 12 70
## 13 70
## 14 70
## 15 70
## 16 70
## 17 70
## 18 70
## 19 70
## 21 70
## 22 70
## 23 70
## 25 70
## 27 70
## 28 70
## 29 70
## 30 70
## 31 70
## 32 70
## 33 70
## 34 70
## 35 70
## 36 70
## 37 70
## 38 70
## 39 70
## 40 70
## 41 70
## 42 70
## 43 70
## 44 70
## 45 70
## 46 70
##
## [[7]]
## city state
## 1 Detroit MI
## 2 Detroit MI
## 3 Detroit MI
## 4 Detroit MI
## 5 Detroit MI
## 6 Detroit MI
## 7 Detroit MI
## 8 Detroit MI
## 9 Detroit MI
## 10 Detroit MI
## 11 Detroit MI
## 12 Detroit MI
## 13 Detroit MI
## 14 Detroit MI
## 15 Detroit MI
## 16 Detroit MI
## 17 Detroit MI
## 18 Detroit MI
## 19 Detroit MI
## 20 Detroit MI
## 21 Detroit MI
## 22 Detroit MI
## 23 Detroit MI
## 24 Detroit MI
## 25 Detroit MI
## 26 Detroit MI
## 27 Detroit MI
## 28 Detroit MI
## 29 Detroit MI
## 30 Detroit MI
## 31 Detroit MI
## 32 Detroit MI
## 33 Detroit MI
## 34 Detroit MI
## 35 Detroit MI
## 36 Detroit MI
## 37 Detroit MI
## 38 Detroit MI
## 39 Detroit MI
## 40 Detroit MI
## 41 Detroit MI
## 42 Detroit MI
## 43 Detroit MI
## 44 Detroit MI
## 45 Detroit MI
## 46 Detroit MI
## 47 Detroit MI
## 48 Detroit MI
## 49 Detroit MI
## 50 Detroit MI
## 51 Detroit MI
## 52 Detroit MI
## 53 Detroit MI
## 54 Detroit MI
## 55 Detroit MI
## 56 Detroit MI
## 57 Detroit MI
## 58 Detroit MI
## 59 Detroit MI
## 60 Detroit MI
## 61 Detroit MI
## 62 Detroit MI
## 63 Detroit MI
## 64 Detroit MI
## 65 Detroit MI
## 66 Detroit MI
## 67 Detroit MI
## 68 Detroit MI
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist, $25~$65/service incl tips, ~$300...
## 10 Hospice Massage Therapist
## 11 SPA TECHNICIAN (MASSAGE THERAPIST)
## 12 Licensed Massage Therapist (LMT) - Contractor
## 13 Licensed Massage Therapist
## 14 WANTED - Massage Therapists, Nail Techs and Estheticians for...
## 15 Licensed Massage Therapist (LMT)
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist - Full Time
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist (LMT)
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist (LMT) - Contractor
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist - Independent Contractor
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage therapist Best Pay in Town
## 30 Licensed Massage Therapist
## 31 LifeSpa-Massage Therapist
## 32 Mobile Massage Therapist
## 33 Licensed Massage Therapist (LMT) - Contractor
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Part time Massage therapist
## 38 Now Hiring Massage Therapist LMT
## 39 Licensed Massage Therapist
## 40 Massage Therapist (Part-Time)
## 41 Massage Therapist - Licensed
## 42 Massage Therapist
## 43 Massage Therapist Full or Part Time
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist [CUSTOMIZATION REQUIRED]
## 47 Massage Therapist for Upscale Wellness Spa 3500 square feet
## 48 Massage Therapist
## 49 Massage Therapists
## 50 Licensed Massage Therapist, Independent Contractor
## 51 massage therapist
## 52 Massage Therapist - Independent Contractor
## 53 Massage Therapist (part-time, flexible hours)
## 54 Licensed Massage Therapist
## 55 Massage Therapist (Part-Time)
## 56 Massage Therapist - Licensed
## 57 Massage Therapist
## 58 Massage Therapist Full or Part Time
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist [CUSTOMIZATION REQUIRED]
## 62 Massage Therapist for Upscale Wellness Spa 3500 square feet
## 63 Massage Therapist
## 64 Massage Therapists
## 65 Licensed Massage Therapist, Independent Contractor
## 66 massage therapist
## 67 Massage Therapist - Independent Contractor
## 68 Massage Therapist (part-time, flexible hours)
## HiringAgency
## 1 Wellness Center4.2Northville, MI 48167
## 2 Daybreak Salon and SpaWyandotte, MI 48192
## 3 Cole Street Salon & SpaBirmingham, MI 48009
## 4 Rivage Day SpaBirmingham, MI 48009
## 5 Claddagh Chiropractic Wellness Center4.0Ferndale, MI 48220
## 6 Semlow Chiropractic TroyTroy, MI 48085
## 7 Margot European SpaBirmingham, MI 48009
## 8 LaVida Massage3.7Canton, MI 48187
## 9 MassageLuXe Spa BirminghamBirmingham, MI 48009
## 10 Premier Hospice and Palliative Care4.1Troy, MI 48083
## 11 MotorCity Casino3.5Detroit, MI 48201 (Briggs area)
## 12 Onward Therapy Services4.2Madison Heights, MI
## 13 ConfidentialTroy, MI 48085
## 14 Om Day SpaDearborn, MI 48124 (Morley area)
## 15 Tri-Covery Massage & FlexibilityNovi, MI 48375
## 16 Broad Family Chiropractic and Still Point MassageCanton, MI 48187
## 17 Life Time3.6Bloomfield Township, MI 48302+3 locations
## 18 OMPT Specialists, Inc.Royal Oak, MI
## 19 Life YogaClinton Township, MI 48038
## 20 Back to Health Wellness CenterUtica, MI 48317
## 21 Elements3.6Troy, MI 48085
## 22 Living in luxury beauty spaGarden City, MI 48135
## 23 Onward Therapy Services4.2Madison Heights, MI
## 24 My Moroccan SpaDearborn, MI
## 25 Relaxing Waters SpaShelby Charter Township, MI 48315
## 26 Michigan Complete Chiropractic & RehabCanton, MI 48187
## 27 ConfidentialTroy, MI 48085
## 28 Health spaNovi, MI
## 29 Hand & Stone - Troy, Northville & Rochester Hills3.0Troy, MI 48083+2 locations
## 30 Total Health SystemsClinton Township, MI 48038
## 31 Life Time3.6Novi, MI 48375
## 32 Indo-Pak Massage TherapyPlymouth, MI+1 location
## 33 Onward Therapy Services4.2Madison Heights, MI
## 34 Hand & Stone - Troy, Northville & Rochester Hills3.0Troy, MI 48084+2 locations
## 35 ConfidentialTroy, MI 48085
## 36 Mystique Day SpaDearborn, MI 48128 (Highland area)
## 37 Hand and Stone3.0Troy, MI 48083+3 locations
## 38 Hand & Stone - Troy, Northville & Rochester Hills3.0Northville, MI 48167
## 39 Total Health SystemsClinton Township, MI 48038
## 40 Life Time3.6Rochester Hills, MI 48307
## 41 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 42 Massage Envy3.2Canton, MI 48187+3 locations
## 43 LaVida Massage of LivoniaLivonia, MI 48154
## 44 Space SpaBloomfield Hills, MI 48302
## 45 Massage Green Spa - Clinton TownshipClinton Township, MI 48035
## 46 Massage Envy3.2Canton, MI 48187
## 47 Evexia Wellness Spa LLCBloomfield Hills, MI
## 48 Massage Envy Canton5.0Canton, MI 48187
## 49 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 50 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 51 Wellness Center of Plymouth, MiPlymouth, MI 48170
## 52 Beach House Day SpaBirmingham, MI 48009
## 53 Massage Envy3.2Woodhaven, MI 48183
## 54 Total Health SystemsClinton Township, MI 48038
## 55 Life Time3.6Rochester Hills, MI 48307
## 56 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 57 Massage Envy3.2Canton, MI 48187+3 locations
## 58 LaVida Massage of LivoniaLivonia, MI 48154
## 59 Space SpaBloomfield Hills, MI 48302
## 60 Massage Green Spa - Clinton TownshipClinton Township, MI 48035
## 61 Massage Envy3.2Canton, MI 48187
## 62 Evexia Wellness Spa LLCBloomfield Hills, MI
## 63 Massage Envy Canton5.0Canton, MI 48187
## 64 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 65 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 66 Wellness Center of Plymouth, MiPlymouth, MI 48170
## 67 Beach House Day SpaBirmingham, MI 48009
## 68 Massage Envy3.2Woodhaven, MI 48183
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 14 10 70 40000 50000
## 2 4 10 70 40000 50000
## 3 13 10 70 40000 50000
## 4 19 10 70 40000 50000
## 5 Just posted 10 70 40000 50000
## 6 12 10 70 40000 50000
## 7 30 10 70 40000 50000
## 8 27 10 70 40000 50000
## 9 30 10 70 40000 50000
## 10 1 10 70 40000 50000
## 11 30 10 70 40000 50000
## 12 8 10 70 40000 50000
## 13 30 10 70 40000 50000
## 14 11 10 70 40000 50000
## 15 14 10 70 40000 50000
## 16 18 10 70 40000 50000
## 17 30 10 70 40000 50000
## 18 14 10 70 40000 50000
## 19 27 10 70 40000 50000
## 20 21 10 70 40000 50000
## 21 25 10 70 40000 50000
## 22 30 10 70 40000 50000
## 23 8 10 70 40000 50000
## 24 29 10 70 40000 50000
## 25 13 10 70 40000 50000
## 26 29 10 70 40000 50000
## 27 30 10 70 40000 50000
## 28 27 10 70 40000 50000
## 29 17 10 70 40000 50000
## 30 30 10 70 40000 50000
## 31 30 10 70 40000 50000
## 32 30 10 70 40000 50000
## 33 8 10 70 40000 50000
## 34 17 10 70 40000 50000
## 35 30 10 70 40000 50000
## 36 15 10 70 40000 50000
## 37 30 10 70 40000 50000
## 38 17 10 70 40000 50000
## 39 30 10 70 40000 50000
## 40 30 10 70 40000 50000
## 41 30 10 70 40000 50000
## 42 30 10 70 40000 50000
## 43 17 10 70 40000 50000
## 44 28 10 70 40000 50000
## 45 7 10 70 40000 50000
## 46 30 10 70 40000 50000
## 47 17 10 70 40000 50000
## 48 25 10 70 40000 50000
## 49 14 10 70 40000 50000
## 50 3 10 70 40000 50000
## 51 30 10 70 40000 50000
## 52 30 10 70 40000 50000
## 53 30 10 70 40000 50000
## 54 30 10 70 40000 50000
## 55 30 10 70 40000 50000
## 56 30 10 70 40000 50000
## 57 30 10 70 40000 50000
## 58 17 10 70 40000 50000
## 59 28 10 70 40000 50000
## 60 7 10 70 40000 50000
## 61 30 10 70 40000 50000
## 62 17 10 70 40000 50000
## 63 25 10 70 40000 50000
## 64 14 10 70 40000 50000
## 65 3 10 70 40000 50000
## 66 30 10 70 40000 50000
## 67 30 10 70 40000 50000
## 68 30 10 70 40000 50000
getIndeedJobData5pages("massage therapist","Grand Rapids","MI")
## Warning in getIndeedJobData5pages("massage therapist", "Grand Rapids", "MI"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Grand Rapids", "MI"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Grand Rapids", "MI"):
## NAs introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist - $35/hr
## 7 UP TO $500 SIGN ON BONUS FOR LICENSED MASSAGE THERAPIST
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist
## 11 Licensed Massage Therapist, Independent Contractor
## 12 Licensed Massage Therapist (LMT)
## 13 Medical Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Massage Therapist (Part-time)
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 UP TO $500 SIGN ON BONUS FOR LICENSED MASSAGE THERAPIST
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist (Part-time)
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 LUXURY DAY SPA MASSAGE THERAPIST
## 30 Calling All Licensed Massage Therapists - Ready To Get Back...
## 31 Licensed Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist - $35/hr
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist - $35/hr
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist (Part-time)
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 LUXURY DAY SPA MASSAGE THERAPIST
## 47 Calling All Licensed Massage Therapists - Ready To Get Back...
## 48 Licensed Massage Therapist
## 49 Massage Therapist
## 50 Licensed Massage Therapist
## 51 UP TO $500 SIGN ON BONUS FOR LICENSED MASSAGE THERAPIST
## 52 Massage Therapist
## 53 Licensed Massage Therapist, Independent Contractor
## 54 Licensed Massage Therapist (LMT)
## 55 Licensed Massage Therapist - $35/hr
## 56 Medical Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Licensed Massage Therapist
## 60 Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 LUXURY DAY SPA MASSAGE THERAPIST
## 65 Calling All Licensed Massage Therapists - Ready To Get Back...
## 66 Licensed Massage Therapist
## 67 Massage Therapist
## 68 Licensed Massage Therapist, Independent Contractor
## 69 Licensed Massage Therapist (LMT)
## 70 Licensed Massage Therapist - $35/hr
## 71 Medical Massage Therapist
## 72 Licensed Massage Therapist
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Massage Therapist
## 76 Licensed Massage Therapist
## 77 Licensed Massage Therapist
## 78 Licensed Massage Therapist
## 79 LUXURY DAY SPA MASSAGE THERAPIST
## 80 Calling All Licensed Massage Therapists - Ready To Get Back...
## 81 Licensed Massage Therapist
## 82 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $25 an hour $20 - $25 20 25
## 2 \n$30 - $50 an hour $30 - $50 30 50
## 3 \n$25 - $30 an hour $25 - $30 25 30
## 4 \n$30 - $35 an hour $30 - $35 30 35
## 5 \n$30 - $35 an hour $30 - $35 30 35
## 6 \n$35 an hour $35 35 NA
## 7 \n$28,000 - $55,000 a year $28000 - $55000 28000 55000
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$1,000 a week $1000 a week NA NA
## 10 \n$30 an hour $30 30 NA
## 11 \n$25 - $35 an hour $25 - $35 25 35
## 12 \n$26 - $36 an hour $26 - $36 26 36
## 13 \n$35 - $40 an hour $35 - $40 35 40
## 14 \n$25 - $30 an hour $25 - $30 25 30
## 15 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 16 \n$25 - $30 an hour $25 - $30 25 30
## 17 \n$28,000 - $55,000 a year $28000 - $55000 28000 55000
## 18 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 19 \n$30 - $50 an hour $30 - $50 30 50
## 20 \n$25 - $30 an hour $25 - $30 25 30
## 21 \n$30 - $35 an hour $30 - $35 30 35
## 22 \n$20 - $25 an hour $20 - $25 20 25
## 23 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 24 \n$28 - $32 an hour $28 - $32 28 32
## 25 \n$30 an hour $30 30 NA
## 26 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## 27 \n$30 - $35 an hour $30 - $35 30 35
## 28 \n$35 an hour $35 35 NA
## 29 \n$20 - $25 an hour $20 - $25 20 25
## 30 \n$25 - $30 an hour $25 - $30 25 30
## 31 \n$35 an hour $35 35 NA
## 32 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 33 \n$30 - $50 an hour $30 - $50 30 50
## 34 \n$25 - $30 an hour $25 - $30 25 30
## 35 \n$30 - $35 an hour $30 - $35 30 35
## 36 \n$20 - $25 an hour $20 - $25 20 25
## 37 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 38 \n$28 - $32 an hour $28 - $32 28 32
## 39 \n$30 an hour $30 30 NA
## 40 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## 41 \n$30 - $35 an hour $30 - $35 30 35
## 42 \n$28,000 - $55,000 a year $28000 - $55000 28000 55000
## 43 \n$20 - $25 an hour $20 - $25 20 25
## 44 \n$30 an hour $30 30 NA
## 45 \n$35 an hour $35 35 NA
## 46 \n$25 - $35 an hour $25 - $35 25 35
## 47 \n$26 - $36 an hour $26 - $36 26 36
## 48 \n$35 - $40 an hour $35 - $40 35 40
## 49 \n$20 - $25 an hour $20 - $25 20 25
## 50 \n$30 - $35 an hour $30 - $35 30 35
## 51 \n$28 - $32 an hour $28 - $32 28 32
## 52 \n$30 an hour $30 30 NA
## 53 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## 54 \n$30 an hour $30 30 NA
## 55 \n$35 an hour $35 35 NA
## 56 \n$25 - $35 an hour $25 - $35 25 35
## 57 \n$26 - $36 an hour $26 - $36 26 36
## 58 \n$35 - $40 an hour $35 - $40 35 40
## 59 \n$20 - $25 an hour $20 - $25 20 25
## 60 \n$30 - $35 an hour $30 - $35 30 35
## 61 \n$28 - $32 an hour $28 - $32 28 32
## 62 \n$30 an hour $30 30 NA
## 63 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 32 7586.694 10746.62 20
## 2 30 32 7586.694 10746.62 20
## 3 30 32 7586.694 10746.62 20
## 4 30 32 7586.694 10746.62 20
## 5 30 32 7586.694 10746.62 20
## 6 30 32 7586.694 10746.62 20
## 7 30 32 7586.694 10746.62 20
## 8 30 32 7586.694 10746.62 20
## 9 30 32 7586.694 10746.62 20
## 10 30 32 7586.694 10746.62 20
## 11 30 32 7586.694 10746.62 20
## 12 30 32 7586.694 10746.62 20
## 13 30 32 7586.694 10746.62 20
## 14 30 32 7586.694 10746.62 20
## 15 30 32 7586.694 10746.62 20
## 16 30 32 7586.694 10746.62 20
## 17 30 32 7586.694 10746.62 20
## 18 30 32 7586.694 10746.62 20
## 19 30 32 7586.694 10746.62 20
## 20 30 32 7586.694 10746.62 20
## 21 30 32 7586.694 10746.62 20
## 22 30 32 7586.694 10746.62 20
## 23 30 32 7586.694 10746.62 20
## 24 30 32 7586.694 10746.62 20
## 25 30 32 7586.694 10746.62 20
## 26 30 32 7586.694 10746.62 20
## 27 30 32 7586.694 10746.62 20
## 28 30 32 7586.694 10746.62 20
## 29 30 32 7586.694 10746.62 20
## 30 30 32 7586.694 10746.62 20
## 31 30 32 7586.694 10746.62 20
## 32 30 32 7586.694 10746.62 20
## 33 30 32 7586.694 10746.62 20
## 34 30 32 7586.694 10746.62 20
## 35 30 32 7586.694 10746.62 20
## 36 30 32 7586.694 10746.62 20
## 37 30 32 7586.694 10746.62 20
## 38 30 32 7586.694 10746.62 20
## 39 30 32 7586.694 10746.62 20
## 40 30 32 7586.694 10746.62 20
## 41 30 32 7586.694 10746.62 20
## 42 30 32 7586.694 10746.62 20
## 43 30 32 7586.694 10746.62 20
## 44 30 32 7586.694 10746.62 20
## 45 30 32 7586.694 10746.62 20
## 46 30 32 7586.694 10746.62 20
## 47 30 32 7586.694 10746.62 20
## 48 30 32 7586.694 10746.62 20
## 49 30 32 7586.694 10746.62 20
## 50 30 32 7586.694 10746.62 20
## 51 30 32 7586.694 10746.62 20
## 52 30 32 7586.694 10746.62 20
## 53 30 32 7586.694 10746.62 20
## 54 30 32 7586.694 10746.62 20
## 55 30 32 7586.694 10746.62 20
## 56 30 32 7586.694 10746.62 20
## 57 30 32 7586.694 10746.62 20
## 58 30 32 7586.694 10746.62 20
## 59 30 32 7586.694 10746.62 20
## 60 30 32 7586.694 10746.62 20
## 61 30 32 7586.694 10746.62 20
## 62 30 32 7586.694 10746.62 20
## 63 30 32 7586.694 10746.62 20
## maximumMaxSalary
## 1 70000
## 2 70000
## 3 70000
## 4 70000
## 5 70000
## 6 70000
## 7 70000
## 8 70000
## 9 70000
## 10 70000
## 11 70000
## 12 70000
## 13 70000
## 14 70000
## 15 70000
## 16 70000
## 17 70000
## 18 70000
## 19 70000
## 20 70000
## 21 70000
## 22 70000
## 23 70000
## 24 70000
## 25 70000
## 26 70000
## 27 70000
## 28 70000
## 29 70000
## 30 70000
## 31 70000
## 32 70000
## 33 70000
## 34 70000
## 35 70000
## 36 70000
## 37 70000
## 38 70000
## 39 70000
## 40 70000
## 41 70000
## 42 70000
## 43 70000
## 44 70000
## 45 70000
## 46 70000
## 47 70000
## 48 70000
## 49 70000
## 50 70000
## 51 70000
## 52 70000
## 53 70000
## 54 70000
## 55 70000
## 56 70000
## 57 70000
## 58 70000
## 59 70000
## 60 70000
## 61 70000
## 62 70000
## 63 70000
##
## [[3]]
## date_daysAgo
## 1 12
## 2 27
## 3 1
## 4 30
## 5 30
## 6 30
## 7 25
## 8 5
## 9 30
## 10 30
## 11 1
## 12 12
## 13 11
## 14 6
## 15 30
## 16 13
## 17 30
## 18 26
## 19 1
## 20 25
## 21 26
## 22 27
## 23 30
## 24 30
## 25 30
## 26 3
## 27 23
## 28 12
## 29 29
## 30 30
## 31 18
## 32 30
## 33 30
## 34 30
## 35 12
## 36 1
## 37 30
## 38 26
## 39 27
## 40 30
## 41 30
## 42 30
## 43 3
## 44 23
## 45 12
## 46 29
## 47 30
## 48 18
## 49 30
## 50 30
## 51 25
## 52 12
## 53 1
## 54 12
## 55 30
## 56 11
## 57 6
## 58 30
## 59 13
## 60 30
## 61 30
## 62 23
## 63 12
## 64 29
## 65 30
## 66 18
## 67 30
## 68 1
## 69 12
## 70 30
## 71 11
## 72 6
## 73 30
## 74 13
## 75 30
## 76 30
## 77 23
## 78 12
## 79 29
## 80 30
## 81 18
## 82 30
##
## [[4]]
## HiringAgency
## 1 Simply Massage LLCRockford, MI 49341
## 2 Xanadu MassageGrand Rapids, MI 49544
## 3 100% Chiropractic4.0Grand Rapids, MI 49525
## 4 American Chiropractic CenterGrand Rapids, MI 49534
## 5 Healthy Choice Family ChiropracticHudsonville, MI 49426
## 6 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 7 NV MASSAGE THERAPY5.0Wyoming, MI 49519
## 8 Indo-Pak Massage TherapyGrand Rapids, MI•Remote work available
## 9 Trombly ChiropracticLowell, MI 49331
## 10 The Beautiful Group1.8Grand Rapids, MI 49506+2 locations
## 11 The Yoga ZenCaledonia, MI 49316
## 12 DeYoung ChiropracticGrand Rapids, MI 49548
## 13 Mikula Chiropractic P.C.Grand Rapids, MI 49525
## 14 Seif ChiropracticCaledonia, MI 49316
## 15 Apsara SpaGrand Rapids, MI 49506 (Eastown area)
## 16 Arntson Chiropractic Health and WellnessJenison, MI 49428
## 17 Genesis Salon and Day SpaRockford, MI
## 18 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 19 100% Chiropractic4.0Grand Rapids, MI 49525
## 20 NV MASSAGE THERAPY5.0Wyoming, MI 49519
## 21 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 22 Xanadu MassageGrand Rapids, MI 49544
## 23 Genesis Salon and Day SpaRockford, MI
## 24 Healthy Choice Family ChiropracticHudsonville, MI 49426
## 25 Dynamic Family ChiropracticGrandville, MI 49418
## 26 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 27 Lowell Family ChiropracticLowell, MI 49331
## 28 DeYoung ChiropracticWayland, MI 49348
## 29 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 30 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 31 Massage Envy3.2Grandville, MI 49418
## 32 Massage Envy3.2Grandville, MI 49418
## 33 American Chiropractic CenterGrand Rapids, MI 49534
## 34 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 35 Simply Massage LLCRockford, MI 49341
## 36 100% Chiropractic4.0Grand Rapids, MI 49525
## 37 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 38 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 39 Xanadu MassageGrand Rapids, MI 49544
## 40 Genesis Salon and Day SpaRockford, MI
## 41 Healthy Choice Family ChiropracticHudsonville, MI 49426
## 42 Dynamic Family ChiropracticGrandville, MI 49418
## 43 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 44 Lowell Family ChiropracticLowell, MI 49331
## 45 DeYoung ChiropracticWayland, MI 49348
## 46 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 47 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 48 Massage Envy3.2Grandville, MI 49418
## 49 Massage Envy3.2Grandville, MI 49418
## 50 American Chiropractic CenterGrand Rapids, MI 49534
## 51 NV MASSAGE THERAPY5.0Wyoming, MI 49519
## 52 Simply Massage LLCRockford, MI 49341
## 53 The Yoga ZenCaledonia, MI 49316
## 54 DeYoung ChiropracticGrand Rapids, MI 49548
## 55 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 56 Mikula Chiropractic P.C.Grand Rapids, MI 49525
## 57 Seif ChiropracticCaledonia, MI 49316
## 58 Apsara SpaGrand Rapids, MI 49506 (Eastown area)
## 59 Arntson Chiropractic Health and WellnessJenison, MI 49428
## 60 Dynamic Family ChiropracticGrandville, MI 49418
## 61 American Chiropractic CenterGrand Rapids, MI 49534
## 62 Lowell Family ChiropracticLowell, MI 49331
## 63 DeYoung ChiropracticWayland, MI 49348
## 64 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 65 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 66 Massage Envy3.2Grandville, MI 49418
## 67 Massage Envy3.2Grandville, MI 49418
## 68 The Yoga ZenCaledonia, MI 49316
## 69 DeYoung ChiropracticGrand Rapids, MI 49548
## 70 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 71 Mikula Chiropractic P.C.Grand Rapids, MI 49525
## 72 Seif ChiropracticCaledonia, MI 49316
## 73 Apsara SpaGrand Rapids, MI 49506 (Eastown area)
## 74 Arntson Chiropractic Health and WellnessJenison, MI 49428
## 75 Dynamic Family ChiropracticGrandville, MI 49418
## 76 American Chiropractic CenterGrand Rapids, MI 49534
## 77 Lowell Family ChiropracticLowell, MI 49331
## 78 DeYoung ChiropracticWayland, MI 49348
## 79 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 80 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 81 Massage Envy3.2Grandville, MI 49418
## 82 Massage Envy3.2Grandville, MI 49418
##
## [[5]]
## Salary salary minSalary maxSalary
## 7 \n$28,000 - $55,000 a year $28000 - $55000 28000 55000
## 15 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 17 \n$28,000 - $55,000 a year $28000 - $55000 28000 55000
## 18 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 23 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 26 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## 32 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 37 \n$32,000 - $55,000 a year $32000 - $55000 32000 55000
## 40 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## 42 \n$28,000 - $55,000 a year $28000 - $55000 28000 55000
## 53 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## 63 \n$55,000 - $70,000 a year ++ $55000 - $70000 55000 70000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 7 32000 55000 38666.67 60000 28000
## 15 32000 55000 38666.67 60000 28000
## 17 32000 55000 38666.67 60000 28000
## 18 32000 55000 38666.67 60000 28000
## 23 32000 55000 38666.67 60000 28000
## 26 32000 55000 38666.67 60000 28000
## 32 32000 55000 38666.67 60000 28000
## 37 32000 55000 38666.67 60000 28000
## 40 32000 55000 38666.67 60000 28000
## 42 32000 55000 38666.67 60000 28000
## 53 32000 55000 38666.67 60000 28000
## 63 32000 55000 38666.67 60000 28000
## maximumMaxSalary
## 7 70000
## 15 70000
## 17 70000
## 18 70000
## 23 70000
## 26 70000
## 32 70000
## 37 70000
## 40 70000
## 42 70000
## 53 70000
## 63 70000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 - $25 an hour $20 - $25 20 25 30
## 2 \n$30 - $50 an hour $30 - $50 30 50 30
## 3 \n$25 - $30 an hour $25 - $30 25 30 30
## 4 \n$30 - $35 an hour $30 - $35 30 35 30
## 5 \n$30 - $35 an hour $30 - $35 30 35 30
## 6 \n$35 an hour $35 35 NA 30
## 10 \n$30 an hour $30 30 NA 30
## 11 \n$25 - $35 an hour $25 - $35 25 35 30
## 12 \n$26 - $36 an hour $26 - $36 26 36 30
## 13 \n$35 - $40 an hour $35 - $40 35 40 30
## 14 \n$25 - $30 an hour $25 - $30 25 30 30
## 16 \n$25 - $30 an hour $25 - $30 25 30 30
## 19 \n$30 - $50 an hour $30 - $50 30 50 30
## 20 \n$25 - $30 an hour $25 - $30 25 30 30
## 21 \n$30 - $35 an hour $30 - $35 30 35 30
## 22 \n$20 - $25 an hour $20 - $25 20 25 30
## 24 \n$28 - $32 an hour $28 - $32 28 32 30
## 25 \n$30 an hour $30 30 NA 30
## 27 \n$30 - $35 an hour $30 - $35 30 35 30
## 28 \n$35 an hour $35 35 NA 30
## 29 \n$20 - $25 an hour $20 - $25 20 25 30
## 30 \n$25 - $30 an hour $25 - $30 25 30 30
## 31 \n$35 an hour $35 35 NA 30
## 33 \n$30 - $50 an hour $30 - $50 30 50 30
## 34 \n$25 - $30 an hour $25 - $30 25 30 30
## 35 \n$30 - $35 an hour $30 - $35 30 35 30
## 36 \n$20 - $25 an hour $20 - $25 20 25 30
## 38 \n$28 - $32 an hour $28 - $32 28 32 30
## 39 \n$30 an hour $30 30 NA 30
## 41 \n$30 - $35 an hour $30 - $35 30 35 30
## 43 \n$20 - $25 an hour $20 - $25 20 25 30
## 44 \n$30 an hour $30 30 NA 30
## 45 \n$35 an hour $35 35 NA 30
## 46 \n$25 - $35 an hour $25 - $35 25 35 30
## 47 \n$26 - $36 an hour $26 - $36 26 36 30
## 48 \n$35 - $40 an hour $35 - $40 35 40 30
## 49 \n$20 - $25 an hour $20 - $25 20 25 30
## 50 \n$30 - $35 an hour $30 - $35 30 35 30
## 51 \n$28 - $32 an hour $28 - $32 28 32 30
## 52 \n$30 an hour $30 30 NA 30
## 54 \n$30 an hour $30 30 NA 30
## 55 \n$35 an hour $35 35 NA 30
## 56 \n$25 - $35 an hour $25 - $35 25 35 30
## 57 \n$26 - $36 an hour $26 - $36 26 36 30
## 58 \n$35 - $40 an hour $35 - $40 35 40 30
## 59 \n$20 - $25 an hour $20 - $25 20 25 30
## 60 \n$30 - $35 an hour $30 - $35 30 35 30
## 61 \n$28 - $32 an hour $28 - $32 28 32 30
## 62 \n$30 an hour $30 30 NA 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 35 28.06122 33.67568 20 50
## 2 35 28.06122 33.67568 20 50
## 3 35 28.06122 33.67568 20 50
## 4 35 28.06122 33.67568 20 50
## 5 35 28.06122 33.67568 20 50
## 6 35 28.06122 33.67568 20 50
## 10 35 28.06122 33.67568 20 50
## 11 35 28.06122 33.67568 20 50
## 12 35 28.06122 33.67568 20 50
## 13 35 28.06122 33.67568 20 50
## 14 35 28.06122 33.67568 20 50
## 16 35 28.06122 33.67568 20 50
## 19 35 28.06122 33.67568 20 50
## 20 35 28.06122 33.67568 20 50
## 21 35 28.06122 33.67568 20 50
## 22 35 28.06122 33.67568 20 50
## 24 35 28.06122 33.67568 20 50
## 25 35 28.06122 33.67568 20 50
## 27 35 28.06122 33.67568 20 50
## 28 35 28.06122 33.67568 20 50
## 29 35 28.06122 33.67568 20 50
## 30 35 28.06122 33.67568 20 50
## 31 35 28.06122 33.67568 20 50
## 33 35 28.06122 33.67568 20 50
## 34 35 28.06122 33.67568 20 50
## 35 35 28.06122 33.67568 20 50
## 36 35 28.06122 33.67568 20 50
## 38 35 28.06122 33.67568 20 50
## 39 35 28.06122 33.67568 20 50
## 41 35 28.06122 33.67568 20 50
## 43 35 28.06122 33.67568 20 50
## 44 35 28.06122 33.67568 20 50
## 45 35 28.06122 33.67568 20 50
## 46 35 28.06122 33.67568 20 50
## 47 35 28.06122 33.67568 20 50
## 48 35 28.06122 33.67568 20 50
## 49 35 28.06122 33.67568 20 50
## 50 35 28.06122 33.67568 20 50
## 51 35 28.06122 33.67568 20 50
## 52 35 28.06122 33.67568 20 50
## 54 35 28.06122 33.67568 20 50
## 55 35 28.06122 33.67568 20 50
## 56 35 28.06122 33.67568 20 50
## 57 35 28.06122 33.67568 20 50
## 58 35 28.06122 33.67568 20 50
## 59 35 28.06122 33.67568 20 50
## 60 35 28.06122 33.67568 20 50
## 61 35 28.06122 33.67568 20 50
## 62 35 28.06122 33.67568 20 50
##
## [[7]]
## city state
## 1 Grand Rapids MI
## 2 Grand Rapids MI
## 3 Grand Rapids MI
## 4 Grand Rapids MI
## 5 Grand Rapids MI
## 6 Grand Rapids MI
## 7 Grand Rapids MI
## 8 Grand Rapids MI
## 9 Grand Rapids MI
## 10 Grand Rapids MI
## 11 Grand Rapids MI
## 12 Grand Rapids MI
## 13 Grand Rapids MI
## 14 Grand Rapids MI
## 15 Grand Rapids MI
## 16 Grand Rapids MI
## 17 Grand Rapids MI
## 18 Grand Rapids MI
## 19 Grand Rapids MI
## 20 Grand Rapids MI
## 21 Grand Rapids MI
## 22 Grand Rapids MI
## 23 Grand Rapids MI
## 24 Grand Rapids MI
## 25 Grand Rapids MI
## 26 Grand Rapids MI
## 27 Grand Rapids MI
## 28 Grand Rapids MI
## 29 Grand Rapids MI
## 30 Grand Rapids MI
## 31 Grand Rapids MI
## 32 Grand Rapids MI
## 33 Grand Rapids MI
## 34 Grand Rapids MI
## 35 Grand Rapids MI
## 36 Grand Rapids MI
## 37 Grand Rapids MI
## 38 Grand Rapids MI
## 39 Grand Rapids MI
## 40 Grand Rapids MI
## 41 Grand Rapids MI
## 42 Grand Rapids MI
## 43 Grand Rapids MI
## 44 Grand Rapids MI
## 45 Grand Rapids MI
## 46 Grand Rapids MI
## 47 Grand Rapids MI
## 48 Grand Rapids MI
## 49 Grand Rapids MI
## 50 Grand Rapids MI
## 51 Grand Rapids MI
## 52 Grand Rapids MI
## 53 Grand Rapids MI
## 54 Grand Rapids MI
## 55 Grand Rapids MI
## 56 Grand Rapids MI
## 57 Grand Rapids MI
## 58 Grand Rapids MI
## 59 Grand Rapids MI
## 60 Grand Rapids MI
## 61 Grand Rapids MI
## 62 Grand Rapids MI
## 63 Grand Rapids MI
## 64 Grand Rapids MI
## 65 Grand Rapids MI
## 66 Grand Rapids MI
## 67 Grand Rapids MI
## 68 Grand Rapids MI
## 69 Grand Rapids MI
## 70 Grand Rapids MI
## 71 Grand Rapids MI
## 72 Grand Rapids MI
## 73 Grand Rapids MI
## 74 Grand Rapids MI
## 75 Grand Rapids MI
## 76 Grand Rapids MI
## 77 Grand Rapids MI
## 78 Grand Rapids MI
## 79 Grand Rapids MI
## 80 Grand Rapids MI
## 81 Grand Rapids MI
## 82 Grand Rapids MI
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist - $35/hr
## 7 UP TO $500 SIGN ON BONUS FOR LICENSED MASSAGE THERAPIST
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist
## 11 Licensed Massage Therapist, Independent Contractor
## 12 Licensed Massage Therapist (LMT)
## 13 Medical Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Massage Therapist (Part-time)
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 UP TO $500 SIGN ON BONUS FOR LICENSED MASSAGE THERAPIST
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist (Part-time)
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 LUXURY DAY SPA MASSAGE THERAPIST
## 30 Calling All Licensed Massage Therapists - Ready To Get Back...
## 31 Licensed Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist - $35/hr
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist - $35/hr
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist (Part-time)
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 LUXURY DAY SPA MASSAGE THERAPIST
## 47 Calling All Licensed Massage Therapists - Ready To Get Back...
## 48 Licensed Massage Therapist
## 49 Massage Therapist
## 50 Licensed Massage Therapist
## 51 UP TO $500 SIGN ON BONUS FOR LICENSED MASSAGE THERAPIST
## 52 Massage Therapist
## 53 Licensed Massage Therapist, Independent Contractor
## 54 Licensed Massage Therapist (LMT)
## 55 Licensed Massage Therapist - $35/hr
## 56 Medical Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Licensed Massage Therapist
## 60 Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 LUXURY DAY SPA MASSAGE THERAPIST
## 65 Calling All Licensed Massage Therapists - Ready To Get Back...
## 66 Licensed Massage Therapist
## 67 Massage Therapist
## 68 Licensed Massage Therapist, Independent Contractor
## 69 Licensed Massage Therapist (LMT)
## 70 Licensed Massage Therapist - $35/hr
## 71 Medical Massage Therapist
## 72 Licensed Massage Therapist
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Massage Therapist
## 76 Licensed Massage Therapist
## 77 Licensed Massage Therapist
## 78 Licensed Massage Therapist
## 79 LUXURY DAY SPA MASSAGE THERAPIST
## 80 Calling All Licensed Massage Therapists - Ready To Get Back...
## 81 Licensed Massage Therapist
## 82 Massage Therapist
## HiringAgency
## 1 Simply Massage LLCRockford, MI 49341
## 2 Xanadu MassageGrand Rapids, MI 49544
## 3 100% Chiropractic4.0Grand Rapids, MI 49525
## 4 American Chiropractic CenterGrand Rapids, MI 49534
## 5 Healthy Choice Family ChiropracticHudsonville, MI 49426
## 6 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 7 NV MASSAGE THERAPY5.0Wyoming, MI 49519
## 8 Indo-Pak Massage TherapyGrand Rapids, MI•Remote work available
## 9 Trombly ChiropracticLowell, MI 49331
## 10 The Beautiful Group1.8Grand Rapids, MI 49506+2 locations
## 11 The Yoga ZenCaledonia, MI 49316
## 12 DeYoung ChiropracticGrand Rapids, MI 49548
## 13 Mikula Chiropractic P.C.Grand Rapids, MI 49525
## 14 Seif ChiropracticCaledonia, MI 49316
## 15 Apsara SpaGrand Rapids, MI 49506 (Eastown area)
## 16 Arntson Chiropractic Health and WellnessJenison, MI 49428
## 17 Genesis Salon and Day SpaRockford, MI
## 18 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 19 100% Chiropractic4.0Grand Rapids, MI 49525
## 20 NV MASSAGE THERAPY5.0Wyoming, MI 49519
## 21 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 22 Xanadu MassageGrand Rapids, MI 49544
## 23 Genesis Salon and Day SpaRockford, MI
## 24 Healthy Choice Family ChiropracticHudsonville, MI 49426
## 25 Dynamic Family ChiropracticGrandville, MI 49418
## 26 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 27 Lowell Family ChiropracticLowell, MI 49331
## 28 DeYoung ChiropracticWayland, MI 49348
## 29 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 30 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 31 Massage Envy3.2Grandville, MI 49418
## 32 Massage Envy3.2Grandville, MI 49418
## 33 American Chiropractic CenterGrand Rapids, MI 49534
## 34 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 35 Simply Massage LLCRockford, MI 49341
## 36 100% Chiropractic4.0Grand Rapids, MI 49525
## 37 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 38 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 39 Xanadu MassageGrand Rapids, MI 49544
## 40 Genesis Salon and Day SpaRockford, MI
## 41 Healthy Choice Family ChiropracticHudsonville, MI 49426
## 42 Dynamic Family ChiropracticGrandville, MI 49418
## 43 Hand & Stone - Grand Rapids3.0Grand Rapids, MI 49512
## 44 Lowell Family ChiropracticLowell, MI 49331
## 45 DeYoung ChiropracticWayland, MI 49348
## 46 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 47 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 48 Massage Envy3.2Grandville, MI 49418
## 49 Massage Envy3.2Grandville, MI 49418
## 50 American Chiropractic CenterGrand Rapids, MI 49534
## 51 NV MASSAGE THERAPY5.0Wyoming, MI 49519
## 52 Simply Massage LLCRockford, MI 49341
## 53 The Yoga ZenCaledonia, MI 49316
## 54 DeYoung ChiropracticGrand Rapids, MI 49548
## 55 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 56 Mikula Chiropractic P.C.Grand Rapids, MI 49525
## 57 Seif ChiropracticCaledonia, MI 49316
## 58 Apsara SpaGrand Rapids, MI 49506 (Eastown area)
## 59 Arntson Chiropractic Health and WellnessJenison, MI 49428
## 60 Dynamic Family ChiropracticGrandville, MI 49418
## 61 American Chiropractic CenterGrand Rapids, MI 49534
## 62 Lowell Family ChiropracticLowell, MI 49331
## 63 DeYoung ChiropracticWayland, MI 49348
## 64 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 65 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 66 Massage Envy3.2Grandville, MI 49418
## 67 Massage Envy3.2Grandville, MI 49418
## 68 The Yoga ZenCaledonia, MI 49316
## 69 DeYoung ChiropracticGrand Rapids, MI 49548
## 70 Brusveen Chiropractic - AllendaleAllendale, MI 49401
## 71 Mikula Chiropractic P.C.Grand Rapids, MI 49525
## 72 Seif ChiropracticCaledonia, MI 49316
## 73 Apsara SpaGrand Rapids, MI 49506 (Eastown area)
## 74 Arntson Chiropractic Health and WellnessJenison, MI 49428
## 75 Dynamic Family ChiropracticGrandville, MI 49418
## 76 American Chiropractic CenterGrand Rapids, MI 49534
## 77 Lowell Family ChiropracticLowell, MI 49331
## 78 DeYoung ChiropracticWayland, MI 49348
## 79 The Woodhouse Day Spa - Grand RapidsGrand Rapids, MI 49525 (Norteast Citizens Action area)
## 80 Total Health Chiropractic3.4Grand Rapids, MI 49546
## 81 Massage Envy3.2Grandville, MI 49418
## 82 Massage Envy3.2Grandville, MI 49418
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 12 20 50 28000 70000
## 2 27 20 50 28000 70000
## 3 1 20 50 28000 70000
## 4 30 20 50 28000 70000
## 5 30 20 50 28000 70000
## 6 30 20 50 28000 70000
## 7 25 20 50 28000 70000
## 8 5 20 50 28000 70000
## 9 30 20 50 28000 70000
## 10 30 20 50 28000 70000
## 11 1 20 50 28000 70000
## 12 12 20 50 28000 70000
## 13 11 20 50 28000 70000
## 14 6 20 50 28000 70000
## 15 30 20 50 28000 70000
## 16 13 20 50 28000 70000
## 17 30 20 50 28000 70000
## 18 26 20 50 28000 70000
## 19 1 20 50 28000 70000
## 20 25 20 50 28000 70000
## 21 26 20 50 28000 70000
## 22 27 20 50 28000 70000
## 23 30 20 50 28000 70000
## 24 30 20 50 28000 70000
## 25 30 20 50 28000 70000
## 26 3 20 50 28000 70000
## 27 23 20 50 28000 70000
## 28 12 20 50 28000 70000
## 29 29 20 50 28000 70000
## 30 30 20 50 28000 70000
## 31 18 20 50 28000 70000
## 32 30 20 50 28000 70000
## 33 30 20 50 28000 70000
## 34 30 20 50 28000 70000
## 35 12 20 50 28000 70000
## 36 1 20 50 28000 70000
## 37 30 20 50 28000 70000
## 38 26 20 50 28000 70000
## 39 27 20 50 28000 70000
## 40 30 20 50 28000 70000
## 41 30 20 50 28000 70000
## 42 30 20 50 28000 70000
## 43 3 20 50 28000 70000
## 44 23 20 50 28000 70000
## 45 12 20 50 28000 70000
## 46 29 20 50 28000 70000
## 47 30 20 50 28000 70000
## 48 18 20 50 28000 70000
## 49 30 20 50 28000 70000
## 50 30 20 50 28000 70000
## 51 25 20 50 28000 70000
## 52 12 20 50 28000 70000
## 53 1 20 50 28000 70000
## 54 12 20 50 28000 70000
## 55 30 20 50 28000 70000
## 56 11 20 50 28000 70000
## 57 6 20 50 28000 70000
## 58 30 20 50 28000 70000
## 59 13 20 50 28000 70000
## 60 30 20 50 28000 70000
## 61 30 20 50 28000 70000
## 62 23 20 50 28000 70000
## 63 12 20 50 28000 70000
## 64 29 20 50 28000 70000
## 65 30 20 50 28000 70000
## 66 18 20 50 28000 70000
## 67 30 20 50 28000 70000
## 68 1 20 50 28000 70000
## 69 12 20 50 28000 70000
## 70 30 20 50 28000 70000
## 71 11 20 50 28000 70000
## 72 6 20 50 28000 70000
## 73 30 20 50 28000 70000
## 74 13 20 50 28000 70000
## 75 30 20 50 28000 70000
## 76 30 20 50 28000 70000
## 77 23 20 50 28000 70000
## 78 12 20 50 28000 70000
## 79 29 20 50 28000 70000
## 80 30 20 50 28000 70000
## 81 18 20 50 28000 70000
## 82 30 20 50 28000 70000
getIndeedJobData5pages("massage therapist","Warren","MI")
## Warning in getIndeedJobData5pages("massage therapist", "Warren", "MI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Warren", "MI"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Hospice Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist - Good Pay! Paid Vacation! Free Massage! G...
## 13 Licensed Massage Therapist (LMT)
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 Stretch Practitioner
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist - Good Pay! Paid Vacation! Free Massage! G...
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 SPA TECHNICIAN (MASSAGE THERAPIST)
## 26 Massage therapist Best Pay in Town
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapists
## 29 Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Massage Therapist - Good Pay! Paid Vacation! Free Massage! G...
## 33 Licensed Massage Therapist
## 34 Massage Therapist (Part-Time)
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist (LMT)
## 37 LifeSpa-Massage Therapist
## 38 Part time Massage therapist
## 39 WANTED - Massage Therapists, Nail Techs and Estheticians for...
## 40 Licensed Massage Therapist
## 41 Stretch Service Provider
## 42 Massage Therapist for Upscale Wellness Spa 3500 square feet
## 43 Massage Therapist - Licensed
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Mobile Massage Therapist
## 47 Massage Therapists
## 48 Massage Therapist - Licensed
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist, Independent Contractor
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist (LMT) - Contractor
## 53 Weekend/Evening Certified Massage Therapist
## 54 Now Hiring Massage Therapist LMT
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Massage Therapist [CUSTOMIZATION REQUIRED]
## 58 Massage Therapist Full or Part Time
## 59 Massage Therapist
## 60 Licensed Massage Therapist
## 61 Stretch Service Provider
## 62 Massage Therapist for Upscale Wellness Spa 3500 square feet
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Mobile Massage Therapist
## 67 WANTED - Massage Therapists, Nail Techs and Estheticians for...
## 68 Massage Therapists
## 69 Licensed Massage Therapist, Independent Contractor
## 70 Weekend/Evening Certified Massage Therapist
## 71 Licensed Massage Therapist
## 72 Licensed Massage Therapist, $25~$65/service incl tips, ~$300...
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist
## 76 Massage Therapist
## 77 Massage Therapist
## 78 Massage Therapist
## 79 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30 an hour $30 30.0 NA
## 2 \n$35 an hour $35 35.0 NA
## 3 \n$18 - $28 an hour $18 - $28 18.0 28
## 4 \n$15 - $50 an hour $15 - $50 15.0 50
## 5 \n$27 - $33 an hour $27 - $33 27.0 33
## 6 \n$25 an hour $25 25.0 NA
## 7 \n$20 - $25 an hour $20 - $25 20.0 25
## 8 \n$21 - $27 an hour $21 - $27 21.0 27
## 9 \n$20 - $30 an hour $20 - $30 20.0 30
## 10 \n$20 - $22 an hour $20 - $22 20.0 22
## 11 \n$20 - $25 an hour $20 - $25 20.0 25
## 12 \n$20 an hour $20 20.0 NA
## 13 \n$18 - $40 an hour $18 - $40 18.0 40
## 14 \n$20 - $30 an hour $20 - $30 20.0 30
## 15 \n$21 - $28 an hour $21 - $28 21.0 28
## 16 \n$18 - $22 an hour $18 - $22 18.0 22
## 17 \n$30 - $37 an hour $30 - $37 30.0 37
## 18 \n$25 - $35 an hour $25 - $35 25.0 35
## 19 \n$35,000 - $90,000 a year $35000 - $90000 35000.0 90000
## 20 \nFrom $40 an hour $40 40.0 NA
## 21 \n$20 - $30 an hour $20 - $30 20.0 30
## 22 \n$25 - $35 an hour $25 - $35 25.0 35
## 23 \n$45 - $70 an hour $45 - $70 45.0 70
## 24 \n$25 an hour $25 25.0 NA
## 25 \n$20 - $42 an hour $20 - $42 20.0 42
## 26 \n$24 an hour $24 24.0 NA
## 27 \n$35 an hour $35 35.0 NA
## 28 \n$25 - $31 an hour $25 - $31 25.0 31
## 29 \n$21 - $26 an hour $21 - $26 21.0 26
## 30 \n$45 - $70 an hour $45 - $70 45.0 70
## 31 \n$20 - $26 an hour $20 - $26 20.0 26
## 32 \n$35 an hour $35 35.0 NA
## 33 \n$25 - $31 an hour $25 - $31 25.0 31
## 34 \n$30 - $45 an hour $30 - $45 30.0 45
## 35 \n$50 an hour $50 50.0 NA
## 36 \n$48,000 - $60,000 a year $48000 - $60000 48000.0 60000
## 37 \n$40,000 - $50,000 a year $40000 - $50000 40000.0 50000
## 38 \n$19 - $23 an hour $19 - $23 19.0 23
## 39 \n$17.50 - $21.00 an hour $17.50 - $21.00 17.5 21
## 40 \n$27 - $32 an hour $27 - $32 27.0 32
## 41 \n$18 - $40 an hour $18 - $40 18.0 40
## 42 \n$20 - $25 an hour $20 - $25 20.0 25
## 43 \n$24 an hour $24 24.0 NA
## 44 \n$21 - $26 an hour $21 - $26 21.0 26
## 45 \n$10 - $35 an hour $10 - $35 10.0 35
## 46 \n$45 - $70 an hour $45 - $70 45.0 70
## 47 \n$20 - $42 an hour $20 - $42 20.0 42
## 48 \n$20 - $26 an hour $20 - $26 20.0 26
## 49 \n$48,000 - $60,000 a year $48000 - $60000 48000.0 60000
## 50 \n$18 - $28 an hour $18 - $28 18.0 28
## 51 \n$20 - $60 an hour $20 - $60 20.0 60
## 52 \n$15 - $50 an hour $15 - $50 15.0 50
## 53 \n$27 - $33 an hour $27 - $33 27.0 33
## 54 \n$35 an hour $35 35.0 NA
## 55 \n$30 an hour $30 30.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 24 27 3132.264 4470.345 10
## 2 24 27 3132.264 4470.345 10
## 3 24 27 3132.264 4470.345 10
## 4 24 27 3132.264 4470.345 10
## 5 24 27 3132.264 4470.345 10
## 6 24 27 3132.264 4470.345 10
## 7 24 27 3132.264 4470.345 10
## 8 24 27 3132.264 4470.345 10
## 9 24 27 3132.264 4470.345 10
## 10 24 27 3132.264 4470.345 10
## 11 24 27 3132.264 4470.345 10
## 12 24 27 3132.264 4470.345 10
## 13 24 27 3132.264 4470.345 10
## 14 24 27 3132.264 4470.345 10
## 15 24 27 3132.264 4470.345 10
## 16 24 27 3132.264 4470.345 10
## 17 24 27 3132.264 4470.345 10
## 18 24 27 3132.264 4470.345 10
## 19 24 27 3132.264 4470.345 10
## 20 24 27 3132.264 4470.345 10
## 21 24 27 3132.264 4470.345 10
## 22 24 27 3132.264 4470.345 10
## 23 24 27 3132.264 4470.345 10
## 24 24 27 3132.264 4470.345 10
## 25 24 27 3132.264 4470.345 10
## 26 24 27 3132.264 4470.345 10
## 27 24 27 3132.264 4470.345 10
## 28 24 27 3132.264 4470.345 10
## 29 24 27 3132.264 4470.345 10
## 30 24 27 3132.264 4470.345 10
## 31 24 27 3132.264 4470.345 10
## 32 24 27 3132.264 4470.345 10
## 33 24 27 3132.264 4470.345 10
## 34 24 27 3132.264 4470.345 10
## 35 24 27 3132.264 4470.345 10
## 36 24 27 3132.264 4470.345 10
## 37 24 27 3132.264 4470.345 10
## 38 24 27 3132.264 4470.345 10
## 39 24 27 3132.264 4470.345 10
## 40 24 27 3132.264 4470.345 10
## 41 24 27 3132.264 4470.345 10
## 42 24 27 3132.264 4470.345 10
## 43 24 27 3132.264 4470.345 10
## 44 24 27 3132.264 4470.345 10
## 45 24 27 3132.264 4470.345 10
## 46 24 27 3132.264 4470.345 10
## 47 24 27 3132.264 4470.345 10
## 48 24 27 3132.264 4470.345 10
## 49 24 27 3132.264 4470.345 10
## 50 24 27 3132.264 4470.345 10
## 51 24 27 3132.264 4470.345 10
## 52 24 27 3132.264 4470.345 10
## 53 24 27 3132.264 4470.345 10
## 54 24 27 3132.264 4470.345 10
## 55 24 27 3132.264 4470.345 10
## maximumMaxSalary
## 1 90000
## 2 90000
## 3 90000
## 4 90000
## 5 90000
## 6 90000
## 7 90000
## 8 90000
## 9 90000
## 10 90000
## 11 90000
## 12 90000
## 13 90000
## 14 90000
## 15 90000
## 16 90000
## 17 90000
## 18 90000
## 19 90000
## 20 90000
## 21 90000
## 22 90000
## 23 90000
## 24 90000
## 25 90000
## 26 90000
## 27 90000
## 28 90000
## 29 90000
## 30 90000
## 31 90000
## 32 90000
## 33 90000
## 34 90000
## 35 90000
## 36 90000
## 37 90000
## 38 90000
## 39 90000
## 40 90000
## 41 90000
## 42 90000
## 43 90000
## 44 90000
## 45 90000
## 46 90000
## 47 90000
## 48 90000
## 49 90000
## 50 90000
## 51 90000
## 52 90000
## 53 90000
## 54 90000
## 55 90000
##
## [[3]]
## date_daysAgo
## 1 8
## 2 19
## 3 12
## 4 Just posted
## 5 13
## 6 30
## 7 14
## 8 21
## 9 1
## 10 19
## 11 30
## 12 30
## 13 13
## 14 7
## 15 19
## 16 10
## 17 25
## 18 14
## 19 16
## 20 30
## 21 17
## 22 14
## 23 5
## 24 7
## 25 30
## 26 30
## 27 10
## 28 30
## 29 30
## 30 1
## 31 30
## 32 30
## 33 30
## 34 30
## 35 27
## 36 18
## 37 30
## 38 30
## 39 11
## 40 28
## 41 30
## 42 17
## 43 30
## 44 30
## 45 30
## 46 30
## 47 14
## 48 30
## 49 30
## 50 3
## 51 30
## 52 8
## 53 27
## 54 17
## 55 15
## 56 30
## 57 30
## 58 17
## 59 25
## 60 21
## 61 30
## 62 17
## 63 30
## 64 29
## 65 30
## 66 30
## 67 11
## 68 14
## 69 3
## 70 27
## 71 Just posted
## 72 30
## 73 30
## 74 14
## 75 12
## 76 4
## 77 13
## 78 19
## 79 8
##
## [[4]]
## HiringAgency
## 1 Associates Therapeutic Massage4.5Clinton Township, MI 48035
## 2 Rivage Day SpaBirmingham, MI 48009
## 3 Semlow Chiropractic TroyTroy, MI 48085
## 4 Claddagh Chiropractic Wellness Center4.0Ferndale, MI 48220
## 5 Cole Street Salon & SpaBirmingham, MI 48009
## 6 Margot European SpaBirmingham, MI 48009
## 7 Wellness Center4.2Northville, MI 48167
## 8 Doctor WellnessShelby Twp, MI 48316
## 9 Premier Hospice and Palliative Care4.1Troy, MI 48083
## 10 Rochester Holistic ArtsRochester, MI 48307
## 11 Belle Sante SpaSaint Clair Shores, MI 48082
## 12 LaVida Massage3.7Shelby Charter Township, MI
## 13 Greenleaf BodyworkFerndale, MI 48220
## 14 Back 2 Health Physical Therapy4.0Sterling Heights, MI
## 15 Massage Green Spa3.2Sterling Heights, MI 48312+1 location
## 16 Stretch Zone2.7Bloomfield Hills, MI 48302+2 locations
## 17 Elements3.6Troy, MI 48085
## 18 McCartney Family Chiropractic & WellnessLake Orion, MI 48360
## 19 LaVida Massage3.7Bloomfield Hills, MI 48304
## 20 LaVida Massage3.7Shelby Charter Township, MI
## 21 Hand & Stone - Chesterfield3.0Chesterfield, MI 48051
## 22 OMPT Specialists, Inc.Royal Oak, MI
## 23 Massage Rain, LLCBirmingham, MI 48009
## 24 Massage Green Spa - Clinton TownshipClinton Township, MI 48035
## 25 MotorCity Casino3.5Detroit, MI 48201 (Briggs area)
## 26 Hand and Stone3.0Troy, MI 48083+2 locations
## 27 Kneaded Relief Wellness SpaSouthgate, MI 48195
## 28 Elements3.6Birmingham, MI 48009
## 29 Dolecki Chiropractic ClinicLake Orion, MI 48359
## 30 The Woodhouse Day Spa - Rochester HillsRochester Hills, MI 48309
## 31 Massage Envy3.2Troy, MI 48083+2 locations
## 32 LaVida Massage3.7Shelby Charter Township, MI
## 33 Thai Massage and Day Spa Grosse PointeGrosse Pointe Farms, MI 48236
## 34 Life Time3.6Rochester Hills, MI 48307
## 35 Health spaNovi, MI
## 36 Broad Family Chiropractic and Still Point MassageCanton, MI 48187
## 37 Life Time3.6Novi, MI 48375
## 38 Hand and Stone3.0Troy, MI 48083+3 locations
## 39 Om Day SpaDearborn, MI 48124 (Morley area)
## 40 Space SpaBloomfield Hills, MI 48302
## 41 Massage Envy3.2West Bloomfield Township, MI 48324+1 location
## 42 Evexia Wellness Spa LLCBloomfield Hills, MI+2 locations
## 43 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 44 Total Health SystemsClinton Township, MI 48038
## 45 Living in luxury beauty spaGarden City, MI 48135
## 46 Indo-Pak Massage TherapyPlymouth, MI
## 47 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 48 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 49 Total Health SystemsClinton Township, MI 48038
## 50 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 51 ConfidentialTroy, MI 48085
## 52 Onward Therapy Services4.2Madison Heights, MI
## 53 The Woodhouse Day Spa - Rochester HillsRochester Hills, MI 48309
## 54 Hand & Stone - Troy, Northville & Rochester Hills3.0Northville, MI 48167
## 55 Mystique Day SpaDearborn, MI 48128 (Highland area)
## 56 Massage Green Spa Grosse PointeGrosse Pointe, MI
## 57 Massage Envy3.2Canton, MI 48187
## 58 LaVida Massage of LivoniaLivonia, MI 48154
## 59 Massage Envy Canton5.0Canton, MI 48187
## 60 Massage Green Spa3.2Novi, MI 48374
## 61 Massage Envy3.2West Bloomfield Township, MI 48324+1 location
## 62 Evexia Wellness Spa LLCBloomfield Hills, MI+2 locations
## 63 Living in luxury beauty spaGarden City, MI 48135
## 64 My Moroccan SpaDearborn, MI
## 65 Massage Envy3.2Rochester Hills, MI 48309+5 locations
## 66 Indo-Pak Massage TherapyPlymouth, MI
## 67 Om Day SpaDearborn, MI 48124 (Morley area)
## 68 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 69 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 70 The Woodhouse Day Spa - Rochester HillsRochester Hills, MI 48309
## 71 Claddagh Chiropractic Wellness Center4.0Ferndale, MI 48220
## 72 MassageLuXe Spa BirminghamBirmingham, MI 48009
## 73 Margot European SpaBirmingham, MI 48009
## 74 Wellness Center4.2Northville, MI 48167
## 75 Semlow Chiropractic TroyTroy, MI 48085
## 76 Daybreak Salon and SpaWyandotte, MI 48192
## 77 Cole Street Salon & SpaBirmingham, MI 48009
## 78 Rivage Day SpaBirmingham, MI 48009
## 79 Associates Therapeutic Massage4.5Clinton Township, MI 48035
##
## [[5]]
## Salary salary minSalary maxSalary
## 19 \n$35,000 - $90,000 a year $35000 - $90000 35000 90000
## 36 \n$48,000 - $60,000 a year $48000 - $60000 48000 60000
## 37 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 49 \n$48,000 - $60,000 a year $48000 - $60000 48000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 19 44000 60000 42750 65000 35000
## 36 44000 60000 42750 65000 35000
## 37 44000 60000 42750 65000 35000
## 49 44000 60000 42750 65000 35000
## maximumMaxSalary
## 19 90000
## 36 90000
## 37 90000
## 49 90000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$30 an hour $30 30.0 NA
## 2 \n$35 an hour $35 35.0 NA
## 3 \n$18 - $28 an hour $18 - $28 18.0 28
## 4 \n$15 - $50 an hour $15 - $50 15.0 50
## 5 \n$27 - $33 an hour $27 - $33 27.0 33
## 6 \n$25 an hour $25 25.0 NA
## 7 \n$20 - $25 an hour $20 - $25 20.0 25
## 8 \n$21 - $27 an hour $21 - $27 21.0 27
## 9 \n$20 - $30 an hour $20 - $30 20.0 30
## 10 \n$20 - $22 an hour $20 - $22 20.0 22
## 11 \n$20 - $25 an hour $20 - $25 20.0 25
## 12 \n$20 an hour $20 20.0 NA
## 13 \n$18 - $40 an hour $18 - $40 18.0 40
## 14 \n$20 - $30 an hour $20 - $30 20.0 30
## 15 \n$21 - $28 an hour $21 - $28 21.0 28
## 16 \n$18 - $22 an hour $18 - $22 18.0 22
## 17 \n$30 - $37 an hour $30 - $37 30.0 37
## 18 \n$25 - $35 an hour $25 - $35 25.0 35
## 20 \nFrom $40 an hour $40 40.0 NA
## 21 \n$20 - $30 an hour $20 - $30 20.0 30
## 22 \n$25 - $35 an hour $25 - $35 25.0 35
## 23 \n$45 - $70 an hour $45 - $70 45.0 70
## 24 \n$25 an hour $25 25.0 NA
## 25 \n$20 - $42 an hour $20 - $42 20.0 42
## 26 \n$24 an hour $24 24.0 NA
## 27 \n$35 an hour $35 35.0 NA
## 28 \n$25 - $31 an hour $25 - $31 25.0 31
## 29 \n$21 - $26 an hour $21 - $26 21.0 26
## 30 \n$45 - $70 an hour $45 - $70 45.0 70
## 31 \n$20 - $26 an hour $20 - $26 20.0 26
## 32 \n$35 an hour $35 35.0 NA
## 33 \n$25 - $31 an hour $25 - $31 25.0 31
## 34 \n$30 - $45 an hour $30 - $45 30.0 45
## 35 \n$50 an hour $50 50.0 NA
## 38 \n$19 - $23 an hour $19 - $23 19.0 23
## 39 \n$17.50 - $21.00 an hour $17.50 - $21.00 17.5 21
## 40 \n$27 - $32 an hour $27 - $32 27.0 32
## 41 \n$18 - $40 an hour $18 - $40 18.0 40
## 42 \n$20 - $25 an hour $20 - $25 20.0 25
## 43 \n$24 an hour $24 24.0 NA
## 44 \n$21 - $26 an hour $21 - $26 21.0 26
## 45 \n$10 - $35 an hour $10 - $35 10.0 35
## 46 \n$45 - $70 an hour $45 - $70 45.0 70
## 47 \n$20 - $42 an hour $20 - $42 20.0 42
## 48 \n$20 - $26 an hour $20 - $26 20.0 26
## 50 \n$18 - $28 an hour $18 - $28 18.0 28
## 51 \n$20 - $60 an hour $20 - $60 20.0 60
## 52 \n$15 - $50 an hour $15 - $50 15.0 50
## 53 \n$27 - $33 an hour $27 - $33 27.0 33
## 54 \n$35 an hour $35 35.0 NA
## 55 \n$30 an hour $30 30.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 21 31 24.9902 35.5 10
## 2 21 31 24.9902 35.5 10
## 3 21 31 24.9902 35.5 10
## 4 21 31 24.9902 35.5 10
## 5 21 31 24.9902 35.5 10
## 6 21 31 24.9902 35.5 10
## 7 21 31 24.9902 35.5 10
## 8 21 31 24.9902 35.5 10
## 9 21 31 24.9902 35.5 10
## 10 21 31 24.9902 35.5 10
## 11 21 31 24.9902 35.5 10
## 12 21 31 24.9902 35.5 10
## 13 21 31 24.9902 35.5 10
## 14 21 31 24.9902 35.5 10
## 15 21 31 24.9902 35.5 10
## 16 21 31 24.9902 35.5 10
## 17 21 31 24.9902 35.5 10
## 18 21 31 24.9902 35.5 10
## 20 21 31 24.9902 35.5 10
## 21 21 31 24.9902 35.5 10
## 22 21 31 24.9902 35.5 10
## 23 21 31 24.9902 35.5 10
## 24 21 31 24.9902 35.5 10
## 25 21 31 24.9902 35.5 10
## 26 21 31 24.9902 35.5 10
## 27 21 31 24.9902 35.5 10
## 28 21 31 24.9902 35.5 10
## 29 21 31 24.9902 35.5 10
## 30 21 31 24.9902 35.5 10
## 31 21 31 24.9902 35.5 10
## 32 21 31 24.9902 35.5 10
## 33 21 31 24.9902 35.5 10
## 34 21 31 24.9902 35.5 10
## 35 21 31 24.9902 35.5 10
## 38 21 31 24.9902 35.5 10
## 39 21 31 24.9902 35.5 10
## 40 21 31 24.9902 35.5 10
## 41 21 31 24.9902 35.5 10
## 42 21 31 24.9902 35.5 10
## 43 21 31 24.9902 35.5 10
## 44 21 31 24.9902 35.5 10
## 45 21 31 24.9902 35.5 10
## 46 21 31 24.9902 35.5 10
## 47 21 31 24.9902 35.5 10
## 48 21 31 24.9902 35.5 10
## 50 21 31 24.9902 35.5 10
## 51 21 31 24.9902 35.5 10
## 52 21 31 24.9902 35.5 10
## 53 21 31 24.9902 35.5 10
## 54 21 31 24.9902 35.5 10
## 55 21 31 24.9902 35.5 10
## maximumMaxSalary
## 1 70
## 2 70
## 3 70
## 4 70
## 5 70
## 6 70
## 7 70
## 8 70
## 9 70
## 10 70
## 11 70
## 12 70
## 13 70
## 14 70
## 15 70
## 16 70
## 17 70
## 18 70
## 20 70
## 21 70
## 22 70
## 23 70
## 24 70
## 25 70
## 26 70
## 27 70
## 28 70
## 29 70
## 30 70
## 31 70
## 32 70
## 33 70
## 34 70
## 35 70
## 38 70
## 39 70
## 40 70
## 41 70
## 42 70
## 43 70
## 44 70
## 45 70
## 46 70
## 47 70
## 48 70
## 50 70
## 51 70
## 52 70
## 53 70
## 54 70
## 55 70
##
## [[7]]
## city state jobTitle
## 1 Warren MI Licensed Massage Therapist
## 2 Warren MI Massage Therapist
## 3 Warren MI Licensed Massage Therapist
## 4 Warren MI Licensed Massage Therapist
## 5 Warren MI Massage Therapist
## 6 Warren MI Licensed Massage Therapist
## 7 Warren MI Licensed Massage Therapist
## 8 Warren MI Licensed Massage Therapist
## 9 Warren MI Hospice Massage Therapist
## 10 Warren MI Licensed Massage Therapist
## 11 Warren MI Massage Therapist
## 12 Warren MI Massage Therapist - Good Pay! Paid Vacation! Free Massage! G...
## 13 Warren MI Licensed Massage Therapist (LMT)
## 14 Warren MI Licensed Massage Therapist
## 15 Warren MI Licensed Massage Therapist (LMT)
## 16 Warren MI Stretch Practitioner
## 17 Warren MI Massage Therapist
## 18 Warren MI Massage Therapist
## 19 Warren MI Licensed Massage Therapist
## 20 Warren MI Massage Therapist - Good Pay! Paid Vacation! Free Massage! G...
## 21 Warren MI Licensed Massage Therapist
## 22 Warren MI Licensed Massage Therapist
## 23 Warren MI Licensed Massage Therapist
## 24 Warren MI Licensed Massage Therapist
## 25 Warren MI SPA TECHNICIAN (MASSAGE THERAPIST)
## 26 Warren MI Massage therapist Best Pay in Town
## 27 Warren MI Licensed Massage Therapist
## 28 Warren MI Licensed Massage Therapists
## 29 Warren MI Massage Therapist
## 30 Warren MI Massage Therapist
## 31 Warren MI Licensed Massage Therapist
## 32 Warren MI Massage Therapist - Good Pay! Paid Vacation! Free Massage! G...
## 33 Warren MI Licensed Massage Therapist
## 34 Warren MI Massage Therapist (Part-Time)
## 35 Warren MI Licensed Massage Therapist
## 36 Warren MI Licensed Massage Therapist (LMT)
## 37 Warren MI LifeSpa-Massage Therapist
## 38 Warren MI Part time Massage therapist
## 39 Warren MI WANTED - Massage Therapists, Nail Techs and Estheticians for...
## 40 Warren MI Licensed Massage Therapist
## 41 Warren MI Stretch Service Provider
## 42 Warren MI Massage Therapist for Upscale Wellness Spa 3500 square feet
## 43 Warren MI Massage Therapist - Licensed
## 44 Warren MI Licensed Massage Therapist
## 45 Warren MI Licensed Massage Therapist
## 46 Warren MI Mobile Massage Therapist
## 47 Warren MI Massage Therapists
## 48 Warren MI Massage Therapist - Licensed
## 49 Warren MI Licensed Massage Therapist
## 50 Warren MI Licensed Massage Therapist, Independent Contractor
## 51 Warren MI Licensed Massage Therapist
## 52 Warren MI Licensed Massage Therapist (LMT) - Contractor
## 53 Warren MI Weekend/Evening Certified Massage Therapist
## 54 Warren MI Now Hiring Massage Therapist LMT
## 55 Warren MI Licensed Massage Therapist
## 56 Warren MI Licensed Massage Therapist
## 57 Warren MI Massage Therapist [CUSTOMIZATION REQUIRED]
## 58 Warren MI Massage Therapist Full or Part Time
## 59 Warren MI Massage Therapist
## 60 Warren MI Licensed Massage Therapist
## 61 Warren MI Stretch Service Provider
## 62 Warren MI Massage Therapist for Upscale Wellness Spa 3500 square feet
## 63 Warren MI Licensed Massage Therapist
## 64 Warren MI Licensed Massage Therapist
## 65 Warren MI Massage Therapist
## 66 Warren MI Mobile Massage Therapist
## 67 Warren MI WANTED - Massage Therapists, Nail Techs and Estheticians for...
## 68 Warren MI Massage Therapists
## 69 Warren MI Licensed Massage Therapist, Independent Contractor
## 70 Warren MI Weekend/Evening Certified Massage Therapist
## 71 Warren MI Licensed Massage Therapist
## 72 Warren MI Licensed Massage Therapist, $25~$65/service incl tips, ~$300...
## 73 Warren MI Licensed Massage Therapist
## 74 Warren MI Licensed Massage Therapist
## 75 Warren MI Licensed Massage Therapist
## 76 Warren MI Massage Therapist
## 77 Warren MI Massage Therapist
## 78 Warren MI Massage Therapist
## 79 Warren MI Licensed Massage Therapist
## HiringAgency
## 1 Associates Therapeutic Massage4.5Clinton Township, MI 48035
## 2 Rivage Day SpaBirmingham, MI 48009
## 3 Semlow Chiropractic TroyTroy, MI 48085
## 4 Claddagh Chiropractic Wellness Center4.0Ferndale, MI 48220
## 5 Cole Street Salon & SpaBirmingham, MI 48009
## 6 Margot European SpaBirmingham, MI 48009
## 7 Wellness Center4.2Northville, MI 48167
## 8 Doctor WellnessShelby Twp, MI 48316
## 9 Premier Hospice and Palliative Care4.1Troy, MI 48083
## 10 Rochester Holistic ArtsRochester, MI 48307
## 11 Belle Sante SpaSaint Clair Shores, MI 48082
## 12 LaVida Massage3.7Shelby Charter Township, MI
## 13 Greenleaf BodyworkFerndale, MI 48220
## 14 Back 2 Health Physical Therapy4.0Sterling Heights, MI
## 15 Massage Green Spa3.2Sterling Heights, MI 48312+1 location
## 16 Stretch Zone2.7Bloomfield Hills, MI 48302+2 locations
## 17 Elements3.6Troy, MI 48085
## 18 McCartney Family Chiropractic & WellnessLake Orion, MI 48360
## 19 LaVida Massage3.7Bloomfield Hills, MI 48304
## 20 LaVida Massage3.7Shelby Charter Township, MI
## 21 Hand & Stone - Chesterfield3.0Chesterfield, MI 48051
## 22 OMPT Specialists, Inc.Royal Oak, MI
## 23 Massage Rain, LLCBirmingham, MI 48009
## 24 Massage Green Spa - Clinton TownshipClinton Township, MI 48035
## 25 MotorCity Casino3.5Detroit, MI 48201 (Briggs area)
## 26 Hand and Stone3.0Troy, MI 48083+2 locations
## 27 Kneaded Relief Wellness SpaSouthgate, MI 48195
## 28 Elements3.6Birmingham, MI 48009
## 29 Dolecki Chiropractic ClinicLake Orion, MI 48359
## 30 The Woodhouse Day Spa - Rochester HillsRochester Hills, MI 48309
## 31 Massage Envy3.2Troy, MI 48083+2 locations
## 32 LaVida Massage3.7Shelby Charter Township, MI
## 33 Thai Massage and Day Spa Grosse PointeGrosse Pointe Farms, MI 48236
## 34 Life Time3.6Rochester Hills, MI 48307
## 35 Health spaNovi, MI
## 36 Broad Family Chiropractic and Still Point MassageCanton, MI 48187
## 37 Life Time3.6Novi, MI 48375
## 38 Hand and Stone3.0Troy, MI 48083+3 locations
## 39 Om Day SpaDearborn, MI 48124 (Morley area)
## 40 Space SpaBloomfield Hills, MI 48302
## 41 Massage Envy3.2West Bloomfield Township, MI 48324+1 location
## 42 Evexia Wellness Spa LLCBloomfield Hills, MI+2 locations
## 43 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 44 Total Health SystemsClinton Township, MI 48038
## 45 Living in luxury beauty spaGarden City, MI 48135
## 46 Indo-Pak Massage TherapyPlymouth, MI
## 47 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 48 Therapeutic Concepts, LLCSterling Heights, MI 48310
## 49 Total Health SystemsClinton Township, MI 48038
## 50 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 51 ConfidentialTroy, MI 48085
## 52 Onward Therapy Services4.2Madison Heights, MI
## 53 The Woodhouse Day Spa - Rochester HillsRochester Hills, MI 48309
## 54 Hand & Stone - Troy, Northville & Rochester Hills3.0Northville, MI 48167
## 55 Mystique Day SpaDearborn, MI 48128 (Highland area)
## 56 Massage Green Spa Grosse PointeGrosse Pointe, MI
## 57 Massage Envy3.2Canton, MI 48187
## 58 LaVida Massage of LivoniaLivonia, MI 48154
## 59 Massage Envy Canton5.0Canton, MI 48187
## 60 Massage Green Spa3.2Novi, MI 48374
## 61 Massage Envy3.2West Bloomfield Township, MI 48324+1 location
## 62 Evexia Wellness Spa LLCBloomfield Hills, MI+2 locations
## 63 Living in luxury beauty spaGarden City, MI 48135
## 64 My Moroccan SpaDearborn, MI
## 65 Massage Envy3.2Rochester Hills, MI 48309+5 locations
## 66 Indo-Pak Massage TherapyPlymouth, MI
## 67 Om Day SpaDearborn, MI 48124 (Morley area)
## 68 Serenity Touch Massage5.0Lathrup Village, MI 48076
## 69 It's A Zen Thing Massage & Skin Care Health SpaFarmington Hills, MI
## 70 The Woodhouse Day Spa - Rochester HillsRochester Hills, MI 48309
## 71 Claddagh Chiropractic Wellness Center4.0Ferndale, MI 48220
## 72 MassageLuXe Spa BirminghamBirmingham, MI 48009
## 73 Margot European SpaBirmingham, MI 48009
## 74 Wellness Center4.2Northville, MI 48167
## 75 Semlow Chiropractic TroyTroy, MI 48085
## 76 Daybreak Salon and SpaWyandotte, MI 48192
## 77 Cole Street Salon & SpaBirmingham, MI 48009
## 78 Rivage Day SpaBirmingham, MI 48009
## 79 Associates Therapeutic Massage4.5Clinton Township, MI 48035
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 8 10 70 35000 90000
## 2 19 10 70 35000 90000
## 3 12 10 70 35000 90000
## 4 Just posted 10 70 35000 90000
## 5 13 10 70 35000 90000
## 6 30 10 70 35000 90000
## 7 14 10 70 35000 90000
## 8 21 10 70 35000 90000
## 9 1 10 70 35000 90000
## 10 19 10 70 35000 90000
## 11 30 10 70 35000 90000
## 12 30 10 70 35000 90000
## 13 13 10 70 35000 90000
## 14 7 10 70 35000 90000
## 15 19 10 70 35000 90000
## 16 10 10 70 35000 90000
## 17 25 10 70 35000 90000
## 18 14 10 70 35000 90000
## 19 16 10 70 35000 90000
## 20 30 10 70 35000 90000
## 21 17 10 70 35000 90000
## 22 14 10 70 35000 90000
## 23 5 10 70 35000 90000
## 24 7 10 70 35000 90000
## 25 30 10 70 35000 90000
## 26 30 10 70 35000 90000
## 27 10 10 70 35000 90000
## 28 30 10 70 35000 90000
## 29 30 10 70 35000 90000
## 30 1 10 70 35000 90000
## 31 30 10 70 35000 90000
## 32 30 10 70 35000 90000
## 33 30 10 70 35000 90000
## 34 30 10 70 35000 90000
## 35 27 10 70 35000 90000
## 36 18 10 70 35000 90000
## 37 30 10 70 35000 90000
## 38 30 10 70 35000 90000
## 39 11 10 70 35000 90000
## 40 28 10 70 35000 90000
## 41 30 10 70 35000 90000
## 42 17 10 70 35000 90000
## 43 30 10 70 35000 90000
## 44 30 10 70 35000 90000
## 45 30 10 70 35000 90000
## 46 30 10 70 35000 90000
## 47 14 10 70 35000 90000
## 48 30 10 70 35000 90000
## 49 30 10 70 35000 90000
## 50 3 10 70 35000 90000
## 51 30 10 70 35000 90000
## 52 8 10 70 35000 90000
## 53 27 10 70 35000 90000
## 54 17 10 70 35000 90000
## 55 15 10 70 35000 90000
## 56 30 10 70 35000 90000
## 57 30 10 70 35000 90000
## 58 17 10 70 35000 90000
## 59 25 10 70 35000 90000
## 60 21 10 70 35000 90000
## 61 30 10 70 35000 90000
## 62 17 10 70 35000 90000
## 63 30 10 70 35000 90000
## 64 29 10 70 35000 90000
## 65 30 10 70 35000 90000
## 66 30 10 70 35000 90000
## 67 11 10 70 35000 90000
## 68 14 10 70 35000 90000
## 69 3 10 70 35000 90000
## 70 27 10 70 35000 90000
## 71 Just posted 10 70 35000 90000
## 72 30 10 70 35000 90000
## 73 30 10 70 35000 90000
## 74 14 10 70 35000 90000
## 75 12 10 70 35000 90000
## 76 4 10 70 35000 90000
## 77 13 10 70 35000 90000
## 78 19 10 70 35000 90000
## 79 8 10 70 35000 90000
Minnesota Minneapolis, St. Paul, Rochester
getIndeedJobData5pages("massage therapist","Minneapolis","MN")
## Warning in getIndeedJobData5pages("massage therapist", "Minneapolis", "MN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Minneapolis", "MN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Minneapolis", "MN"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Part time Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Retail Sales Associate / Customer Service Jobs | Elements Ma...
## 17 Certified Massage Therapist-Chair Massage
## 18 Massage Therapist (Part-time)
## 19 Mobile Massage Therapist
## 20 Clinical Massage Therapist
## 21 Massage Therapist - Full Time
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist- FT or PT
## 24 Licensed Massage Therapist (LMT)
## 25 Part-time Massage Therapist
## 26 Certified Massage Therapist
## 27 LifeSpa-Massage Therapist
## 28 Life-Spa Massage Therapist
## 29 Deep tissue massage therapist
## 30 Massage Therapy/Physical Therapy/Yoga/Pilates/Dance/Personal...
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 LifeSpa-Massage Therapist
## 38 Life-Spa Massage Therapist
## 39 Deep tissue massage therapist
## 40 Massage Therapy/Physical Therapy/Yoga/Pilates/Dance/Personal...
## 41 Massage Therapist
## 42 Massage Therapist FT
## 43 Licensed Massage Therapist (LMT)
## 44 Massage Therapist Full and Part Time
## 45 Massage Therapist PT
## 46 Massage Therapist - Independent Contractor
## 47 Massage Therapist
## 48 Massage Therapist
## 49 Licensed Massage Therapist
## 50 Certified Massage Therapist
## 51 Certified Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Massage Therapist
## 56 Esthetician/Massage Therapist, also have spa room rentals av...
## 57 Part-time Massage Therapist
## 58 Salon Massage Therapist
## 59 Massage Therapist
## 60 Massage Therapist
## 61 Massage Therapist
## 62 Licensed Massage Therapist
## 63 Massage Therapist
## 64 Massage Therapist
## 65 Massage Therapist
## 66 Licensed Massage Therapist (LMT)
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Certified Massage Therapist
## 70 Massage Therapist PT / FT
## 71 Fitness Professional Personal Training Stretch Professional
## 72 Fitness Professional Yoga Pilates Stretch Professional
## 73 Fitness Professional Physical Therapy Stretch Professional
## 74 Wellness Massage Therapist
## 75 Part time or Full time MASSAGE THERAPISTS
## 76 Massage Therapist
## 77 Massage Therapist - Full Time - Flex Schedule
## 78 Total Body Stretch Service Provider - Full Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$28 - $30 an hour $28 - $30 28 30
## 2 \n$20 - $27 an hour $20 - $27 20 27
## 3 \n$25 - $35 an hour $25 - $35 25 35
## 4 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 5 \n$27 - $40 an hour $27 - $40 27 40
## 6 \n$25 an hour $25 25 NA
## 7 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 8 \n$20 - $40 an hour $20 - $40 20 40
## 9 \n$53,000 - $73,000 a year $53000 - $73000 53000 73000
## 10 \n$26 - $40 an hour $26 - $40 26 40
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$62,000 a year $62000 62000 NA
## 13 \n$12 - $13 an hour $12 - $13 12 13
## 14 \n$45 an hour $45 45 NA
## 15 \n$18 - $20 an hour $18 - $20 18 20
## 16 \n$45 - $70 an hour $45 - $70 45 70
## 17 \n$25 - $35 an hour $25 - $35 25 35
## 18 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 19 \n$43,000 - $58,000 a year $43000 - $58000 43000 58000
## 20 \n$16 - $22 an hour $16 - $22 16 22
## 21 \n$25 - $45 an hour $25 - $45 25 45
## 22 \n$30 - $50 an hour $30 - $50 30 50
## 23 \n$25 - $30 an hour $25 - $30 25 30
## 24 \n$25 an hour $25 25 NA
## 25 \n$28 - $30 an hour $28 - $30 28 30
## 26 \n$25 - $35 an hour $25 - $35 25 35
## 27 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 28 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 29 \n$25 - $30 an hour $25 - $30 25 30
## 30 \n$18 - $35 an hour $18 - $35 18 35
## 31 \n$15 - $25 an hour ++ $15 - $25 15 25
## 32 \n$30 - $40 an hour $30 - $40 30 40
## 33 \n$60,000 a year $60000 60000 NA
## 34 \n$15 - $25 an hour ++ $15 - $25 15 25
## 35 \n$32 - $40 an hour $32 - $40 32 40
## 36 \n$27 - $40 an hour $27 - $40 27 40
## 37 \n$20 - $27 an hour $20 - $27 20 27
## 38 \n$25 - $35 an hour $25 - $35 25 35
## 39 \n$20 an hour $20 20 NA
## 40 \n$25,000 - $80,000 a year $25000 - $80000 25000 80000
## 41 \n$22 - $30 an hour $22 - $30 22 30
## 42 \n$27 - $40 an hour $27 - $40 27 40
## 43 \n$25 an hour $25 25 NA
## 44 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 45 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 46 \n$28 - $30 an hour $28 - $30 28 30
## 47 \n$25 - $35 an hour $25 - $35 25 35
## 48 \n$20 - $27 an hour $20 - $27 20 27
## 49 \nFrom $15 an hour $15 15 NA
## 50 \n$20 - $45 an hour $20 - $45 20 45
## 51 \n$34 - $38 an hour ++ $34 - $38 34 38
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 26 30 10567.31 12904.65 12
## 2 26 30 10567.31 12904.65 12
## 3 26 30 10567.31 12904.65 12
## 4 26 30 10567.31 12904.65 12
## 5 26 30 10567.31 12904.65 12
## 6 26 30 10567.31 12904.65 12
## 7 26 30 10567.31 12904.65 12
## 8 26 30 10567.31 12904.65 12
## 9 26 30 10567.31 12904.65 12
## 10 26 30 10567.31 12904.65 12
## 11 26 30 10567.31 12904.65 12
## 12 26 30 10567.31 12904.65 12
## 13 26 30 10567.31 12904.65 12
## 14 26 30 10567.31 12904.65 12
## 15 26 30 10567.31 12904.65 12
## 16 26 30 10567.31 12904.65 12
## 17 26 30 10567.31 12904.65 12
## 18 26 30 10567.31 12904.65 12
## 19 26 30 10567.31 12904.65 12
## 20 26 30 10567.31 12904.65 12
## 21 26 30 10567.31 12904.65 12
## 22 26 30 10567.31 12904.65 12
## 23 26 30 10567.31 12904.65 12
## 24 26 30 10567.31 12904.65 12
## 25 26 30 10567.31 12904.65 12
## 26 26 30 10567.31 12904.65 12
## 27 26 30 10567.31 12904.65 12
## 28 26 30 10567.31 12904.65 12
## 29 26 30 10567.31 12904.65 12
## 30 26 30 10567.31 12904.65 12
## 31 26 30 10567.31 12904.65 12
## 32 26 30 10567.31 12904.65 12
## 33 26 30 10567.31 12904.65 12
## 34 26 30 10567.31 12904.65 12
## 35 26 30 10567.31 12904.65 12
## 36 26 30 10567.31 12904.65 12
## 37 26 30 10567.31 12904.65 12
## 38 26 30 10567.31 12904.65 12
## 39 26 30 10567.31 12904.65 12
## 40 26 30 10567.31 12904.65 12
## 41 26 30 10567.31 12904.65 12
## 42 26 30 10567.31 12904.65 12
## 43 26 30 10567.31 12904.65 12
## 44 26 30 10567.31 12904.65 12
## 45 26 30 10567.31 12904.65 12
## 46 26 30 10567.31 12904.65 12
## 47 26 30 10567.31 12904.65 12
## 48 26 30 10567.31 12904.65 12
## 49 26 30 10567.31 12904.65 12
## 50 26 30 10567.31 12904.65 12
## 51 26 30 10567.31 12904.65 12
## maximumMaxSalary
## 1 80000
## 2 80000
## 3 80000
## 4 80000
## 5 80000
## 6 80000
## 7 80000
## 8 80000
## 9 80000
## 10 80000
## 11 80000
## 12 80000
## 13 80000
## 14 80000
## 15 80000
## 16 80000
## 17 80000
## 18 80000
## 19 80000
## 20 80000
## 21 80000
## 22 80000
## 23 80000
## 24 80000
## 25 80000
## 26 80000
## 27 80000
## 28 80000
## 29 80000
## 30 80000
## 31 80000
## 32 80000
## 33 80000
## 34 80000
## 35 80000
## 36 80000
## 37 80000
## 38 80000
## 39 80000
## 40 80000
## 41 80000
## 42 80000
## 43 80000
## 44 80000
## 45 80000
## 46 80000
## 47 80000
## 48 80000
## 49 80000
## 50 80000
## 51 80000
##
## [[3]]
## date_daysAgo
## 1 6
## 2 5
## 3 22
## 4 7
## 5 30
## 6 12
## 7 30
## 8 30
## 9 28
## 10 14
## 11 8
## 12 5
## 13 7
## 14 30
## 15 30
## 16 24
## 17 30
## 18 13
## 19 30
## 20 27
## 21 30
## 22 30
## 23 30
## 24 12
## 25 1
## 26 30
## 27 30
## 28 30
## 29 11
## 30 30
## 31 7
## 32 12
## 33 6
## 34 22
## 35 30
## 36 7
## 37 30
## 38 30
## 39 11
## 40 30
## 41 7
## 42 30
## 43 27
## 44 13
## 45 30
## 46 1
## 47 30
## 48 30
## 49 5
## 50 30
## 51 28
## 52 20
## 53 14
## 54 25
## 55 30
## 56 Just posted
## 57 30
## 58 30
## 59 30
## 60 12
## 61 30
## 62 7
## 63 7
## 64 30
## 65 6
## 66 22
## 67 5
## 68 22
## 69 13
## 70 6
## 71 14
## 72 14
## 73 19
## 74 30
## 75 30
## 76 30
## 77 30
## 78 30
##
## [[4]]
## HiringAgency
## 1 Healthy Living ChiropracticEden Prairie, MN 55344
## 2 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 3 Ackerman Acupuncture & MassageBlaine, MN 55449
## 4 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 5 Plymouth Spine and Health CenterPlymouth, MN 55447
## 6 Oak Springs ChiropracticOakdale, MN 55128
## 7 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 8 Brooklyn ChiropracticMinneapolis, MN 55429
## 9 Hand and Stone Massage & Facial SpaMaple Grove, MN 55369
## 10 Green Lotus Yoga & Healing Center of Apple ValleyApple Valley, MN 55124 (Industrial District area)
## 11 Modern Point AcupunctureMaple Grove, MN 55369
## 12 Indo-Pak Massage TherapyMinneapolis, MN+1 location•Remote work available
## 13 Bella on the BayExcelsior, MN 55331
## 14 Sanctuary SalonspaMinneapolis, MN
## 15 Elements3.6Eden Prairie, MN 55347+5 locations
## 16 Elements3.6Saint Louis Park, MN 55416
## 17 Minnesota Massage OutreachBrooklyn Center, MN 55444
## 18 HealthWise Family ChiropracticSaint Anthony, MN 55421
## 19 Indo-Pak Massage TherapyMinneapolis, MN+2 locations
## 20 Return to Play Institute, LLCSaint Paul, MN 55108 (Como area)
## 21 Spalon Montage, IncChanhassen, MN 55317+2 locations
## 22 CLOVR Life SpaApple Valley, MN (Industrial District area)
## 23 Spavia Day Spa3.3Maple Grove, MN 55369
## 24 Spa810Roseville, MN 55113
## 25 Clearwater ChiropracticSavage, MN 55378
## 26 Simply Massage & SpaRosemount, MN 55068
## 27 Life Time3.6Saint Louis Park, MN 55416 (Blackstone area)+3 locations
## 28 Life Time3.6Edina, MN 55433 (Southdale area)
## 29 Tree of Life Therapeutic MassageMinneapolis, MN 55447
## 30 StretchLab Minnesota3.8Minneapolis, MN+2 locations
## 31 Bella on the BayExcelsior, MN 55331
## 32 Oak Springs ChiropracticOakdale, MN 55128
## 33 Healthy Living ChiropracticEden Prairie, MN 55344
## 34 Ackerman Acupuncture & MassageBlaine, MN 55449
## 35 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 36 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 37 Life Time3.6Saint Louis Park, MN 55416 (Blackstone area)+3 locations
## 38 Life Time3.6Edina, MN 55433 (Southdale area)
## 39 Tree of Life Therapeutic MassageMinneapolis, MN 55447
## 40 StretchLab Minnesota3.8Minneapolis, MN+2 locations
## 41 Clearwater ChiropracticSavage, MN 55378
## 42 Massage Envy3.2Minneapolis, MN 55415 (Downtown West area)+5 locations
## 43 Family Chiropractic CenterFarmington, MN 55024
## 44 The Woodhouse Day Spa3.3Maple Grove, MN 55369
## 45 Massage Envy3.2Minneapolis, MN 55415 (Downtown West area)+5 locations
## 46 Balancing Touch MassageSavage, MN 55378
## 47 Plymouth Spine and Health CenterPlymouth, MN 55447
## 48 Sanctuary SalonspaMinneapolis, MN
## 49 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 50 Just For Me Spa3.8Stillwater, MN 55082
## 51 Dockter - Lutz ChiropracticCircle Pines, MN 55014
## 52 Optimize Physical TherapyBlaine, MN 55449
## 53 Green Lotus Yoga & Healing Center of Apple ValleyApple Valley, MN 55124 (Industrial District area)
## 54 Phenix Salon Suites EaganEagan, MN 55121
## 55 Aurora SpaMinneapolis, MN 55408 (East Calhoun area)
## 56 Parlour 9 Salon & SpaLakeville, MN 55044
## 57 Genesis Chiropractic Health CenterEagan, MN 55122
## 58 JCPenney3.7Minnetonka, MN 55305+1 location
## 59 Plymouth Spine and Health CenterPlymouth, MN 55447
## 60 Oak Springs ChiropracticOakdale, MN 55128
## 61 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 62 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 63 Bella on the BayExcelsior, MN 55331
## 64 Sanctuary SalonspaMinneapolis, MN
## 65 Healthy Living ChiropracticEden Prairie, MN 55344
## 66 Ackerman Acupuncture & MassageBlaine, MN 55449
## 67 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 68 Q Salon and SpaAnoka, MN 55303
## 69 Just For Me The Spa3.8Stillwater, MN 55082
## 70 Massage Envy3.2Stillwater, MN 55082
## 71 StretchLab - Woodbury MN3.8Woodbury, MN
## 72 StretchLab - Woodbury MN3.8Woodbury, MN
## 73 StretchLab - Woodbury MN3.8Woodbury, MN
## 74 Turning Leaf ChiropracticLakeville, MN 55044
## 75 Harel Chiropractic & MassageHudson, WI
## 76 Physical Therapy ConsultantsRamsey, MN
## 77 Massage Envy3.2Eagan, MN 55121
## 78 Massage Envy3.2Plymouth, MN 55447
##
## [[5]]
## Salary salary minSalary maxSalary
## 4 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 7 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 9 \n$53,000 - $73,000 a year $53000 - $73000 53000 73000
## 12 \n$62,000 a year $62000 62000 NA
## 18 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 19 \n$43,000 - $58,000 a year $43000 - $58000 43000 58000
## 27 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 28 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 33 \n$60,000 a year $60000 60000 NA
## 40 \n$25,000 - $80,000 a year $25000 - $80000 25000 80000
## 44 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 45 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 4 45000 66500 44416.67 66100 25000
## 7 45000 66500 44416.67 66100 25000
## 9 45000 66500 44416.67 66100 25000
## 12 45000 66500 44416.67 66100 25000
## 18 45000 66500 44416.67 66100 25000
## 19 45000 66500 44416.67 66100 25000
## 27 45000 66500 44416.67 66100 25000
## 28 45000 66500 44416.67 66100 25000
## 33 45000 66500 44416.67 66100 25000
## 40 45000 66500 44416.67 66100 25000
## 44 45000 66500 44416.67 66100 25000
## 45 45000 66500 44416.67 66100 25000
## maximumMaxSalary
## 4 80000
## 7 80000
## 9 80000
## 12 80000
## 18 80000
## 19 80000
## 27 80000
## 28 80000
## 33 80000
## 40 80000
## 44 80000
## 45 80000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$28 - $30 an hour $28 - $30 28 30 25
## 2 \n$20 - $27 an hour $20 - $27 20 27 25
## 3 \n$25 - $35 an hour $25 - $35 25 35 25
## 5 \n$27 - $40 an hour $27 - $40 27 40 25
## 6 \n$25 an hour $25 25 NA 25
## 8 \n$20 - $40 an hour $20 - $40 20 40 25
## 10 \n$26 - $40 an hour $26 - $40 26 40 25
## 13 \n$12 - $13 an hour $12 - $13 12 13 25
## 14 \n$45 an hour $45 45 NA 25
## 15 \n$18 - $20 an hour $18 - $20 18 20 25
## 16 \n$45 - $70 an hour $45 - $70 45 70 25
## 17 \n$25 - $35 an hour $25 - $35 25 35 25
## 20 \n$16 - $22 an hour $16 - $22 16 22 25
## 21 \n$25 - $45 an hour $25 - $45 25 45 25
## 22 \n$30 - $50 an hour $30 - $50 30 50 25
## 23 \n$25 - $30 an hour $25 - $30 25 30 25
## 24 \n$25 an hour $25 25 NA 25
## 25 \n$28 - $30 an hour $28 - $30 28 30 25
## 26 \n$25 - $35 an hour $25 - $35 25 35 25
## 29 \n$25 - $30 an hour $25 - $30 25 30 25
## 30 \n$18 - $35 an hour $18 - $35 18 35 25
## 31 \n$15 - $25 an hour ++ $15 - $25 15 25 25
## 32 \n$30 - $40 an hour $30 - $40 30 40 25
## 34 \n$15 - $25 an hour ++ $15 - $25 15 25 25
## 35 \n$32 - $40 an hour $32 - $40 32 40 25
## 36 \n$27 - $40 an hour $27 - $40 27 40 25
## 37 \n$20 - $27 an hour $20 - $27 20 27 25
## 38 \n$25 - $35 an hour $25 - $35 25 35 25
## 39 \n$20 an hour $20 20 NA 25
## 41 \n$22 - $30 an hour $22 - $30 22 30 25
## 42 \n$27 - $40 an hour $27 - $40 27 40 25
## 43 \n$25 an hour $25 25 NA 25
## 46 \n$28 - $30 an hour $28 - $30 28 30 25
## 47 \n$25 - $35 an hour $25 - $35 25 35 25
## 48 \n$20 - $27 an hour $20 - $27 20 27 25
## 49 \nFrom $15 an hour $15 15 NA 25
## 50 \n$20 - $45 an hour $20 - $45 20 45 25
## 51 \n$34 - $38 an hour ++ $34 - $38 34 38 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 35 24.55263 34.5 12 70
## 2 35 24.55263 34.5 12 70
## 3 35 24.55263 34.5 12 70
## 5 35 24.55263 34.5 12 70
## 6 35 24.55263 34.5 12 70
## 8 35 24.55263 34.5 12 70
## 10 35 24.55263 34.5 12 70
## 13 35 24.55263 34.5 12 70
## 14 35 24.55263 34.5 12 70
## 15 35 24.55263 34.5 12 70
## 16 35 24.55263 34.5 12 70
## 17 35 24.55263 34.5 12 70
## 20 35 24.55263 34.5 12 70
## 21 35 24.55263 34.5 12 70
## 22 35 24.55263 34.5 12 70
## 23 35 24.55263 34.5 12 70
## 24 35 24.55263 34.5 12 70
## 25 35 24.55263 34.5 12 70
## 26 35 24.55263 34.5 12 70
## 29 35 24.55263 34.5 12 70
## 30 35 24.55263 34.5 12 70
## 31 35 24.55263 34.5 12 70
## 32 35 24.55263 34.5 12 70
## 34 35 24.55263 34.5 12 70
## 35 35 24.55263 34.5 12 70
## 36 35 24.55263 34.5 12 70
## 37 35 24.55263 34.5 12 70
## 38 35 24.55263 34.5 12 70
## 39 35 24.55263 34.5 12 70
## 41 35 24.55263 34.5 12 70
## 42 35 24.55263 34.5 12 70
## 43 35 24.55263 34.5 12 70
## 46 35 24.55263 34.5 12 70
## 47 35 24.55263 34.5 12 70
## 48 35 24.55263 34.5 12 70
## 49 35 24.55263 34.5 12 70
## 50 35 24.55263 34.5 12 70
## 51 35 24.55263 34.5 12 70
##
## [[7]]
## city state
## 1 Minneapolis MN
## 2 Minneapolis MN
## 3 Minneapolis MN
## 4 Minneapolis MN
## 5 Minneapolis MN
## 6 Minneapolis MN
## 7 Minneapolis MN
## 8 Minneapolis MN
## 9 Minneapolis MN
## 10 Minneapolis MN
## 11 Minneapolis MN
## 12 Minneapolis MN
## 13 Minneapolis MN
## 14 Minneapolis MN
## 15 Minneapolis MN
## 16 Minneapolis MN
## 17 Minneapolis MN
## 18 Minneapolis MN
## 19 Minneapolis MN
## 20 Minneapolis MN
## 21 Minneapolis MN
## 22 Minneapolis MN
## 23 Minneapolis MN
## 24 Minneapolis MN
## 25 Minneapolis MN
## 26 Minneapolis MN
## 27 Minneapolis MN
## 28 Minneapolis MN
## 29 Minneapolis MN
## 30 Minneapolis MN
## 31 Minneapolis MN
## 32 Minneapolis MN
## 33 Minneapolis MN
## 34 Minneapolis MN
## 35 Minneapolis MN
## 36 Minneapolis MN
## 37 Minneapolis MN
## 38 Minneapolis MN
## 39 Minneapolis MN
## 40 Minneapolis MN
## 41 Minneapolis MN
## 42 Minneapolis MN
## 43 Minneapolis MN
## 44 Minneapolis MN
## 45 Minneapolis MN
## 46 Minneapolis MN
## 47 Minneapolis MN
## 48 Minneapolis MN
## 49 Minneapolis MN
## 50 Minneapolis MN
## 51 Minneapolis MN
## 52 Minneapolis MN
## 53 Minneapolis MN
## 54 Minneapolis MN
## 55 Minneapolis MN
## 56 Minneapolis MN
## 57 Minneapolis MN
## 58 Minneapolis MN
## 59 Minneapolis MN
## 60 Minneapolis MN
## 61 Minneapolis MN
## 62 Minneapolis MN
## 63 Minneapolis MN
## 64 Minneapolis MN
## 65 Minneapolis MN
## 66 Minneapolis MN
## 67 Minneapolis MN
## 68 Minneapolis MN
## 69 Minneapolis MN
## 70 Minneapolis MN
## 71 Minneapolis MN
## 72 Minneapolis MN
## 73 Minneapolis MN
## 74 Minneapolis MN
## 75 Minneapolis MN
## 76 Minneapolis MN
## 77 Minneapolis MN
## 78 Minneapolis MN
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Part time Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Retail Sales Associate / Customer Service Jobs | Elements Ma...
## 17 Certified Massage Therapist-Chair Massage
## 18 Massage Therapist (Part-time)
## 19 Mobile Massage Therapist
## 20 Clinical Massage Therapist
## 21 Massage Therapist - Full Time
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist- FT or PT
## 24 Licensed Massage Therapist (LMT)
## 25 Part-time Massage Therapist
## 26 Certified Massage Therapist
## 27 LifeSpa-Massage Therapist
## 28 Life-Spa Massage Therapist
## 29 Deep tissue massage therapist
## 30 Massage Therapy/Physical Therapy/Yoga/Pilates/Dance/Personal...
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 LifeSpa-Massage Therapist
## 38 Life-Spa Massage Therapist
## 39 Deep tissue massage therapist
## 40 Massage Therapy/Physical Therapy/Yoga/Pilates/Dance/Personal...
## 41 Massage Therapist
## 42 Massage Therapist FT
## 43 Licensed Massage Therapist (LMT)
## 44 Massage Therapist Full and Part Time
## 45 Massage Therapist PT
## 46 Massage Therapist - Independent Contractor
## 47 Massage Therapist
## 48 Massage Therapist
## 49 Licensed Massage Therapist
## 50 Certified Massage Therapist
## 51 Certified Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Massage Therapist
## 56 Esthetician/Massage Therapist, also have spa room rentals av...
## 57 Part-time Massage Therapist
## 58 Salon Massage Therapist
## 59 Massage Therapist
## 60 Massage Therapist
## 61 Massage Therapist
## 62 Licensed Massage Therapist
## 63 Massage Therapist
## 64 Massage Therapist
## 65 Massage Therapist
## 66 Licensed Massage Therapist (LMT)
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Certified Massage Therapist
## 70 Massage Therapist PT / FT
## 71 Fitness Professional Personal Training Stretch Professional
## 72 Fitness Professional Yoga Pilates Stretch Professional
## 73 Fitness Professional Physical Therapy Stretch Professional
## 74 Wellness Massage Therapist
## 75 Part time or Full time MASSAGE THERAPISTS
## 76 Massage Therapist
## 77 Massage Therapist - Full Time - Flex Schedule
## 78 Total Body Stretch Service Provider - Full Time
## HiringAgency
## 1 Healthy Living ChiropracticEden Prairie, MN 55344
## 2 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 3 Ackerman Acupuncture & MassageBlaine, MN 55449
## 4 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 5 Plymouth Spine and Health CenterPlymouth, MN 55447
## 6 Oak Springs ChiropracticOakdale, MN 55128
## 7 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 8 Brooklyn ChiropracticMinneapolis, MN 55429
## 9 Hand and Stone Massage & Facial SpaMaple Grove, MN 55369
## 10 Green Lotus Yoga & Healing Center of Apple ValleyApple Valley, MN 55124 (Industrial District area)
## 11 Modern Point AcupunctureMaple Grove, MN 55369
## 12 Indo-Pak Massage TherapyMinneapolis, MN+1 location•Remote work available
## 13 Bella on the BayExcelsior, MN 55331
## 14 Sanctuary SalonspaMinneapolis, MN
## 15 Elements3.6Eden Prairie, MN 55347+5 locations
## 16 Elements3.6Saint Louis Park, MN 55416
## 17 Minnesota Massage OutreachBrooklyn Center, MN 55444
## 18 HealthWise Family ChiropracticSaint Anthony, MN 55421
## 19 Indo-Pak Massage TherapyMinneapolis, MN+2 locations
## 20 Return to Play Institute, LLCSaint Paul, MN 55108 (Como area)
## 21 Spalon Montage, IncChanhassen, MN 55317+2 locations
## 22 CLOVR Life SpaApple Valley, MN (Industrial District area)
## 23 Spavia Day Spa3.3Maple Grove, MN 55369
## 24 Spa810Roseville, MN 55113
## 25 Clearwater ChiropracticSavage, MN 55378
## 26 Simply Massage & SpaRosemount, MN 55068
## 27 Life Time3.6Saint Louis Park, MN 55416 (Blackstone area)+3 locations
## 28 Life Time3.6Edina, MN 55433 (Southdale area)
## 29 Tree of Life Therapeutic MassageMinneapolis, MN 55447
## 30 StretchLab Minnesota3.8Minneapolis, MN+2 locations
## 31 Bella on the BayExcelsior, MN 55331
## 32 Oak Springs ChiropracticOakdale, MN 55128
## 33 Healthy Living ChiropracticEden Prairie, MN 55344
## 34 Ackerman Acupuncture & MassageBlaine, MN 55449
## 35 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 36 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 37 Life Time3.6Saint Louis Park, MN 55416 (Blackstone area)+3 locations
## 38 Life Time3.6Edina, MN 55433 (Southdale area)
## 39 Tree of Life Therapeutic MassageMinneapolis, MN 55447
## 40 StretchLab Minnesota3.8Minneapolis, MN+2 locations
## 41 Clearwater ChiropracticSavage, MN 55378
## 42 Massage Envy3.2Minneapolis, MN 55415 (Downtown West area)+5 locations
## 43 Family Chiropractic CenterFarmington, MN 55024
## 44 The Woodhouse Day Spa3.3Maple Grove, MN 55369
## 45 Massage Envy3.2Minneapolis, MN 55415 (Downtown West area)+5 locations
## 46 Balancing Touch MassageSavage, MN 55378
## 47 Plymouth Spine and Health CenterPlymouth, MN 55447
## 48 Sanctuary SalonspaMinneapolis, MN
## 49 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 50 Just For Me Spa3.8Stillwater, MN 55082
## 51 Dockter - Lutz ChiropracticCircle Pines, MN 55014
## 52 Optimize Physical TherapyBlaine, MN 55449
## 53 Green Lotus Yoga & Healing Center of Apple ValleyApple Valley, MN 55124 (Industrial District area)
## 54 Phenix Salon Suites EaganEagan, MN 55121
## 55 Aurora SpaMinneapolis, MN 55408 (East Calhoun area)
## 56 Parlour 9 Salon & SpaLakeville, MN 55044
## 57 Genesis Chiropractic Health CenterEagan, MN 55122
## 58 JCPenney3.7Minnetonka, MN 55305+1 location
## 59 Plymouth Spine and Health CenterPlymouth, MN 55447
## 60 Oak Springs ChiropracticOakdale, MN 55128
## 61 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 62 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 63 Bella on the BayExcelsior, MN 55331
## 64 Sanctuary SalonspaMinneapolis, MN
## 65 Healthy Living ChiropracticEden Prairie, MN 55344
## 66 Ackerman Acupuncture & MassageBlaine, MN 55449
## 67 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 68 Q Salon and SpaAnoka, MN 55303
## 69 Just For Me The Spa3.8Stillwater, MN 55082
## 70 Massage Envy3.2Stillwater, MN 55082
## 71 StretchLab - Woodbury MN3.8Woodbury, MN
## 72 StretchLab - Woodbury MN3.8Woodbury, MN
## 73 StretchLab - Woodbury MN3.8Woodbury, MN
## 74 Turning Leaf ChiropracticLakeville, MN 55044
## 75 Harel Chiropractic & MassageHudson, WI
## 76 Physical Therapy ConsultantsRamsey, MN
## 77 Massage Envy3.2Eagan, MN 55121
## 78 Massage Envy3.2Plymouth, MN 55447
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 12 70 25000 80000
## 2 5 12 70 25000 80000
## 3 22 12 70 25000 80000
## 4 7 12 70 25000 80000
## 5 30 12 70 25000 80000
## 6 12 12 70 25000 80000
## 7 30 12 70 25000 80000
## 8 30 12 70 25000 80000
## 9 28 12 70 25000 80000
## 10 14 12 70 25000 80000
## 11 8 12 70 25000 80000
## 12 5 12 70 25000 80000
## 13 7 12 70 25000 80000
## 14 30 12 70 25000 80000
## 15 30 12 70 25000 80000
## 16 24 12 70 25000 80000
## 17 30 12 70 25000 80000
## 18 13 12 70 25000 80000
## 19 30 12 70 25000 80000
## 20 27 12 70 25000 80000
## 21 30 12 70 25000 80000
## 22 30 12 70 25000 80000
## 23 30 12 70 25000 80000
## 24 12 12 70 25000 80000
## 25 1 12 70 25000 80000
## 26 30 12 70 25000 80000
## 27 30 12 70 25000 80000
## 28 30 12 70 25000 80000
## 29 11 12 70 25000 80000
## 30 30 12 70 25000 80000
## 31 7 12 70 25000 80000
## 32 12 12 70 25000 80000
## 33 6 12 70 25000 80000
## 34 22 12 70 25000 80000
## 35 30 12 70 25000 80000
## 36 7 12 70 25000 80000
## 37 30 12 70 25000 80000
## 38 30 12 70 25000 80000
## 39 11 12 70 25000 80000
## 40 30 12 70 25000 80000
## 41 7 12 70 25000 80000
## 42 30 12 70 25000 80000
## 43 27 12 70 25000 80000
## 44 13 12 70 25000 80000
## 45 30 12 70 25000 80000
## 46 1 12 70 25000 80000
## 47 30 12 70 25000 80000
## 48 30 12 70 25000 80000
## 49 5 12 70 25000 80000
## 50 30 12 70 25000 80000
## 51 28 12 70 25000 80000
## 52 20 12 70 25000 80000
## 53 14 12 70 25000 80000
## 54 25 12 70 25000 80000
## 55 30 12 70 25000 80000
## 56 Just posted 12 70 25000 80000
## 57 30 12 70 25000 80000
## 58 30 12 70 25000 80000
## 59 30 12 70 25000 80000
## 60 12 12 70 25000 80000
## 61 30 12 70 25000 80000
## 62 7 12 70 25000 80000
## 63 7 12 70 25000 80000
## 64 30 12 70 25000 80000
## 65 6 12 70 25000 80000
## 66 22 12 70 25000 80000
## 67 5 12 70 25000 80000
## 68 22 12 70 25000 80000
## 69 13 12 70 25000 80000
## 70 6 12 70 25000 80000
## 71 14 12 70 25000 80000
## 72 14 12 70 25000 80000
## 73 19 12 70 25000 80000
## 74 30 12 70 25000 80000
## 75 30 12 70 25000 80000
## 76 30 12 70 25000 80000
## 77 30 12 70 25000 80000
## 78 30 12 70 25000 80000
getIndeedJobData5pages("massage therapist","St. Paul","MN")
## Warning in getIndeedJobData5pages("massage therapist", "St. Paul", "MN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "St. Paul", "MN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "St. Paul", "MN"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Clinical Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Certified Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist
## 20 Massage Therapist Full Time and Part Time
## 21 Massage Therapist 1 Full Time 1 Part Time (Great Pay & Benef...
## 22 Massage Therapist
## 23 Part-time Massage Therapist
## 24 Massage Therapist
## 25 Leadership Management Trainee - Operations (LMT-O) - System...
## 26 Massage Therapist - Full Time
## 27 Massage Therapist
## 28 Licensed Massage Therapist - Minneapolis-Saint Paul, MN
## 29 Part time Massage Therapist
## 30 Licensed Massage Therapist
## 31 Certified Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist (Part-time)
## 35 Massage Therapist
## 36 Stretch Professional - Flexologist
## 37 Licensed Massage Therapist
## 38 Certified Massage Therapist-Chair Massage
## 39 Fitness Professional Massage Stretch Professional
## 40 Massage Therapist - Independent Contractor
## 41 Esthetician/Massage Therapist, also have spa room rentals av...
## 42 Massage Therapist for Chiropractic office
## 43 Massage Therapist
## 44 Life-Spa Massage Therapist
## 45 Mobile Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapy/Physical Therapy/Yoga/Pilates/Dance/Personal...
## 48 Massage Therapist FT / PT
## 49 Licensed Massage Therapist- FT or PT
## 50 Licensed Massage Therapist
## 51 Salon Massage Therapist
## 52 Certified Massage Therapist
## 53 Massage Therapist Full and Part Time
## 54 Deep tissue massage therapist
## 55 Massage Therapist FT
## 56 Retail Sales Associate / Customer Service Jobs | Elements Ma...
## 57 Fitness Professional Physical Therapy Stretch Professional
## 58 Massage Therapist PT
## 59 Fitness Professional Stretch Professional Flexologist
## 60 Part time or Full time MASSAGE THERAPISTS
## 61 Fitness Professional Yoga Pilates Stretch Professional
## 62 Fitness Professional Personal Training Stretch Professional
## 63 Wellness Massage Therapist
## 64 Massage Therapist PT Make your own hours!
## 65 Massage Therapist
## 66 Wellness Massage Therapist
## 67 Massage Therapist
## 68 Licensed Massage Therapist
## 69 Fitness Professional: Massage Therapy/Physical Therapy/Yoga/...
## 70 Massage Therapist - Full Time - Flex Schedule
## 71 Massage Therapists
## 72 Massage Therapist- FT or PT- FLEX SCHEDULE
## 73 Massage Therapist (Licensed) - LMT @ Massage Envy
## 74 Massage Therapist - LMT (Licensed Massage Therapist) Best Go...
## 75 Total Body Stretch Service Provider - Full Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$28 - $30 an hour $28 - $30 28.0 30
## 2 \n$25 an hour $25 25.0 NA
## 3 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 4 \n$50,000 - $60,000 a year $50000 - $60000 50000.0 60000
## 5 \n$45,000 - $80,000 a year $45000 - $80000 45000.0 80000
## 6 \n$25 - $35 an hour $25 - $35 25.0 35
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 8 \n$16 - $22 an hour $16 - $22 16.0 22
## 9 \n$26 - $40 an hour $26 - $40 26.0 40
## 10 \n$25 - $30 an hour $25 - $30 25.0 30
## 11 \n$30 an hour $30 30.0 NA
## 12 \n$30 - $50 an hour $30 - $50 30.0 50
## 13 \n$25 - $35 an hour $25 - $35 25.0 35
## 14 \n$20 - $27 an hour $20 - $27 20.0 27
## 15 \n$28 - $30 an hour $28 - $30 28.0 30
## 16 \n$18 - $35 an hour $18 - $35 18.0 35
## 17 \n$25 - $45 an hour $25 - $45 25.0 45
## 18 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 19 \n$60 - $65 an hour $60 - $65 60.0 65
## 20 \n$50,000 - $70,000 a year $50000 - $70000 50000.0 70000
## 21 \n$30 an hour $30 30.0 NA
## 22 \n$25 - $35 an hour $25 - $35 25.0 35
## 23 \n$40 an hour $40 40.0 NA
## 24 \n$18 - $20 an hour $18 - $20 18.0 20
## 25 \n$20 an hour $20 20.0 NA
## 26 \n$45 an hour $45 45.0 NA
## 27 \n$32 - $40 an hour $32 - $40 32.0 40
## 28 \n$25,000 - $80,000 a year $25000 - $80000 25000.0 80000
## 29 \n$20 - $30 an hour $20 - $30 20.0 30
## 30 \n$25 - $40 an hour $25 - $40 25.0 40
## 31 \n$45 - $70 an hour $45 - $70 45.0 70
## 32 \n$34 - $38 an hour $34 - $38 34.0 38
## 33 \n$43,000 - $58,000 a year $43000 - $58000 43000.0 58000
## 34 \n$34 - $38 an hour $34 - $38 34.0 38
## 35 \nFrom $15 an hour $15 15.0 NA
## 36 \n$60,000 a year $60000 60000.0 NA
## 37 \n$25 - $30 an hour $25 - $30 25.0 30
## 38 \n$15 - $25 an hour ++ $15 - $25 15.0 25
## 39 \n$12 - $13 an hour $12 - $13 12.0 13
## 40 \n$15 - $25 an hour ++ $15 - $25 15.0 25
## 41 \n$34 - $38 an hour ++ $34 - $38 34.0 38
## 42 \n$20 - $45 an hour $20 - $45 20.0 45
## 43 \n$20 - $45 an hour $20 - $45 20.0 45
## 44 \n$18.50 - $21.00 an hour $18.50 - $21.00 18.5 21
## 45 \n$28 - $35 an hour $28 - $35 28.0 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 26 31 6977.144 8842.238 12
## 2 26 31 6977.144 8842.238 12
## 3 26 31 6977.144 8842.238 12
## 4 26 31 6977.144 8842.238 12
## 5 26 31 6977.144 8842.238 12
## 6 26 31 6977.144 8842.238 12
## 7 26 31 6977.144 8842.238 12
## 8 26 31 6977.144 8842.238 12
## 9 26 31 6977.144 8842.238 12
## 10 26 31 6977.144 8842.238 12
## 11 26 31 6977.144 8842.238 12
## 12 26 31 6977.144 8842.238 12
## 13 26 31 6977.144 8842.238 12
## 14 26 31 6977.144 8842.238 12
## 15 26 31 6977.144 8842.238 12
## 16 26 31 6977.144 8842.238 12
## 17 26 31 6977.144 8842.238 12
## 18 26 31 6977.144 8842.238 12
## 19 26 31 6977.144 8842.238 12
## 20 26 31 6977.144 8842.238 12
## 21 26 31 6977.144 8842.238 12
## 22 26 31 6977.144 8842.238 12
## 23 26 31 6977.144 8842.238 12
## 24 26 31 6977.144 8842.238 12
## 25 26 31 6977.144 8842.238 12
## 26 26 31 6977.144 8842.238 12
## 27 26 31 6977.144 8842.238 12
## 28 26 31 6977.144 8842.238 12
## 29 26 31 6977.144 8842.238 12
## 30 26 31 6977.144 8842.238 12
## 31 26 31 6977.144 8842.238 12
## 32 26 31 6977.144 8842.238 12
## 33 26 31 6977.144 8842.238 12
## 34 26 31 6977.144 8842.238 12
## 35 26 31 6977.144 8842.238 12
## 36 26 31 6977.144 8842.238 12
## 37 26 31 6977.144 8842.238 12
## 38 26 31 6977.144 8842.238 12
## 39 26 31 6977.144 8842.238 12
## 40 26 31 6977.144 8842.238 12
## 41 26 31 6977.144 8842.238 12
## 42 26 31 6977.144 8842.238 12
## 43 26 31 6977.144 8842.238 12
## 44 26 31 6977.144 8842.238 12
## 45 26 31 6977.144 8842.238 12
## maximumMaxSalary
## 1 80000
## 2 80000
## 3 80000
## 4 80000
## 5 80000
## 6 80000
## 7 80000
## 8 80000
## 9 80000
## 10 80000
## 11 80000
## 12 80000
## 13 80000
## 14 80000
## 15 80000
## 16 80000
## 17 80000
## 18 80000
## 19 80000
## 20 80000
## 21 80000
## 22 80000
## 23 80000
## 24 80000
## 25 80000
## 26 80000
## 27 80000
## 28 80000
## 29 80000
## 30 80000
## 31 80000
## 32 80000
## 33 80000
## 34 80000
## 35 80000
## 36 80000
## 37 80000
## 38 80000
## 39 80000
## 40 80000
## 41 80000
## 42 80000
## 43 80000
## 44 80000
## 45 80000
##
## [[3]]
## date_daysAgo
## 1 6
## 2 12
## 3 30
## 4 30
## 5 14
## 6 7
## 7 7
## 8 27
## 9 5
## 10 2
## 11 12
## 12 30
## 13 8
## 14 20
## 15 7
## 16 30
## 17 30
## 18 22
## 19 5
## 20 30
## 21 6
## 22 7
## 23 1
## 24 30
## 25 30
## 26 30
## 27 25
## 28 30
## 29 9
## 30 7
## 31 28
## 32 16
## 33 22
## 34 13
## 35 30
## 36 6
## 37 20
## 38 30
## 39 14
## 40 1
## 41 Just posted
## 42 15
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 6
## 49 30
## 50 30
## 51 30
## 52 13
## 53 13
## 54 11
## 55 30
## 56 24
## 57 19
## 58 30
## 59 14
## 60 30
## 61 14
## 62 14
## 63 30
## 64 30
## 65 22
## 66 30
## 67 30
## 68 24
## 69 30
## 70 30
## 71 30
## 72 30
## 73 25
## 74 25
## 75 30
##
## [[4]]
## HiringAgency
## 1 Healthy Living ChiropracticEden Prairie, MN 55344
## 2 Oak Springs ChiropracticOakdale, MN 55128
## 3 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 4 CLOVR Life SpaApple Valley, MN (Industrial District area)
## 5 Green Lotus Yoga & Healing Center of Apple ValleyApple Valley, MN 55124 (Industrial District area)
## 6 Bella on the BayExcelsior, MN 55331
## 7 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 8 Return to Play Institute, LLCSaint Paul, MN 55108 (Como area)
## 9 Indo-Pak Massage TherapySaint Paul, MN+1 location•Remote work available
## 10 OYESPA LLCInver Grove Heights, MN 55077
## 11 Spa810Roseville, MN 55113
## 12 Elements3.6Roseville, MN 55113+5 locations
## 13 Modern Point AcupunctureMaple Grove, MN 55369
## 14 Lifestyle Chiropractic and WellnessMendota Heights, MN 55120
## 15 Made 2 Move Chiropractic & WellnessHam Lake, MN 55304
## 16 Simply Massage & SpaRosemount, MN 55068
## 17 YWCA St. PaulSaint Paul, MN 55102 (West 7th area)
## 18 Ackerman Acupuncture & MassageBlaine, MN 55449
## 19 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 20 Sanctuary SalonspaExcelsior, MN 55331
## 21 Bloomington Wellness Center5.0Bloomington, MN 55437
## 22 Clearwater ChiropracticSavage, MN 55378
## 23 Clearwater ChiropracticSavage, MN 55378
## 24 Massage Envy3.2Roseville, MN 55113+9 locations
## 25 Canadian Pacific3.1Saint Paul, MN
## 26 Spalon Montage, IncWoodbury, MN 55125+2 locations
## 27 Phenix Salon Suites EaganEagan, MN 55121
## 28 Flamingo4.2Minneapolis, MN 55402 (Downtown West area)
## 29 The Woodhouse Day Spa3.3Woodbury, MN 55125
## 30 Nielson Family Chiropractic, LLCSaint Louis Park, MN 55416 (Wolfe Park area)
## 31 Dockter - Lutz ChiropracticCircle Pines, MN 55014
## 32 The Brost ClinicWayzata, MN 55391
## 33 Innate Health ChiropracticDeephaven, MN 55391
## 34 HealthWise Family ChiropracticSaint Anthony, MN 55421
## 35 Boulevard ChiropracticSaint Louis Park, MN
## 36 StretchLab - Woodbury MN3.8Woodbury, MN+3 locations
## 37 Optimize Physical TherapyBlaine, MN 55449
## 38 Minnesota Massage OutreachBrooklyn Center, MN 55444
## 39 StretchLab - Woodbury MN3.8Woodbury, MN
## 40 Balancing Touch MassageSavage, MN 55378
## 41 Parlour 9 Salon & SpaLakeville, MN 55044
## 42 Aspire ChiropracticWoodbury, MN 55125
## 43 Exceptional ChiropracticHam Lake, MN
## 44 Life Time3.6Edina, MN 55433 (Southdale area)
## 45 Indo-Pak Massage TherapyMinneapolis, MN+2 locations
## 46 Harel Chiropractic, Massage & AcupunctureHudson, WI 54016
## 47 StretchLab Minnesota3.8Minneapolis, MN+2 locations
## 48 Massage Envy3.2Stillwater, MN 55082
## 49 Spavia Day Spa3.3Maple Grove, MN 55369
## 50 Harel Chiropractic, Massage & AcupunctureHudson, WI 54016
## 51 JCPenney3.7Burnsville, MN 55306+1 location
## 52 Just For Me The Spa3.8Stillwater, MN 55082
## 53 The Woodhouse Day Spa3.3Maple Grove, MN 55369
## 54 Tree of Life Therapeutic MassageMinneapolis, MN 55447
## 55 Massage Envy3.2Saint Paul, MN 55116 (Highland area)+4 locations
## 56 Elements3.6Saint Louis Park, MN 55416
## 57 StretchLab - Woodbury MN3.8Woodbury, MN
## 58 Massage Envy3.2Saint Paul, MN 55116 (Highland area)+4 locations
## 59 StretchLab - Woodbury MN3.8Woodbury, MN
## 60 Harel Chiropractic & MassageHudson, WI
## 61 StretchLab - Woodbury MN3.8Woodbury, MN
## 62 StretchLab - Woodbury MN3.8Woodbury, MN
## 63 Turning Leaf ChiropracticLakeville, MN 55044
## 64 Massage Envy3.2Golden Valley, MN 55427
## 65 Q Salon and SpaAnoka, MN 55303
## 66 Turning Leaf ChiropracticLakeville, MN 55044
## 67 Aurora SpaMinneapolis, MN 55408 (East Calhoun area)
## 68 Soothe3.7Minneapolis, MN
## 69 StretchLab Minnesota3.8Saint Louis Park, MN+1 location
## 70 Massage Envy3.2Eagan, MN 55121
## 71 Enhance Beauty & SpaFridley, MN 55432
## 72 Massage Envy3.2Bloomington, MN 55431
## 73 Massage Envy (NCT Company d.b.a.)3.2Golden Valley, MN 55427
## 74 Massage Envy (NCT Company d.b.a.)3.2Golden Valley, MN 55427
## 75 Massage Envy3.2Plymouth, MN 55447
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 4 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 5 \n$45,000 - $80,000 a year $45000 - $80000 45000 80000
## 20 \n$50,000 - $70,000 a year $50000 - $70000 50000 70000
## 28 \n$25,000 - $80,000 a year $25000 - $80000 25000 80000
## 33 \n$43,000 - $58,000 a year $43000 - $58000 43000 58000
## 36 \n$60,000 a year $60000 60000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 45000 65000 44000 66333.33 25000
## 4 45000 65000 44000 66333.33 25000
## 5 45000 65000 44000 66333.33 25000
## 20 45000 65000 44000 66333.33 25000
## 28 45000 65000 44000 66333.33 25000
## 33 45000 65000 44000 66333.33 25000
## 36 45000 65000 44000 66333.33 25000
## maximumMaxSalary
## 3 80000
## 4 80000
## 5 80000
## 20 80000
## 28 80000
## 33 80000
## 36 80000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$28 - $30 an hour $28 - $30 28.0 30
## 2 \n$25 an hour $25 25.0 NA
## 6 \n$25 - $35 an hour $25 - $35 25.0 35
## 8 \n$16 - $22 an hour $16 - $22 16.0 22
## 9 \n$26 - $40 an hour $26 - $40 26.0 40
## 10 \n$25 - $30 an hour $25 - $30 25.0 30
## 11 \n$30 an hour $30 30.0 NA
## 12 \n$30 - $50 an hour $30 - $50 30.0 50
## 13 \n$25 - $35 an hour $25 - $35 25.0 35
## 14 \n$20 - $27 an hour $20 - $27 20.0 27
## 15 \n$28 - $30 an hour $28 - $30 28.0 30
## 16 \n$18 - $35 an hour $18 - $35 18.0 35
## 17 \n$25 - $45 an hour $25 - $45 25.0 45
## 18 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 19 \n$60 - $65 an hour $60 - $65 60.0 65
## 21 \n$30 an hour $30 30.0 NA
## 22 \n$25 - $35 an hour $25 - $35 25.0 35
## 23 \n$40 an hour $40 40.0 NA
## 24 \n$18 - $20 an hour $18 - $20 18.0 20
## 25 \n$20 an hour $20 20.0 NA
## 26 \n$45 an hour $45 45.0 NA
## 27 \n$32 - $40 an hour $32 - $40 32.0 40
## 29 \n$20 - $30 an hour $20 - $30 20.0 30
## 30 \n$25 - $40 an hour $25 - $40 25.0 40
## 31 \n$45 - $70 an hour $45 - $70 45.0 70
## 32 \n$34 - $38 an hour $34 - $38 34.0 38
## 34 \n$34 - $38 an hour $34 - $38 34.0 38
## 35 \nFrom $15 an hour $15 15.0 NA
## 37 \n$25 - $30 an hour $25 - $30 25.0 30
## 38 \n$15 - $25 an hour ++ $15 - $25 15.0 25
## 39 \n$12 - $13 an hour $12 - $13 12.0 13
## 40 \n$15 - $25 an hour ++ $15 - $25 15.0 25
## 41 \n$34 - $38 an hour ++ $34 - $38 34.0 38
## 42 \n$20 - $45 an hour $20 - $45 20.0 45
## 43 \n$20 - $45 an hour $20 - $45 20.0 45
## 44 \n$18.50 - $21.00 an hour $18.50 - $21.00 18.5 21
## 45 \n$28 - $35 an hour $28 - $35 28.0 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 35 26.25676 36.4 12
## 2 25 35 26.25676 36.4 12
## 6 25 35 26.25676 36.4 12
## 8 25 35 26.25676 36.4 12
## 9 25 35 26.25676 36.4 12
## 10 25 35 26.25676 36.4 12
## 11 25 35 26.25676 36.4 12
## 12 25 35 26.25676 36.4 12
## 13 25 35 26.25676 36.4 12
## 14 25 35 26.25676 36.4 12
## 15 25 35 26.25676 36.4 12
## 16 25 35 26.25676 36.4 12
## 17 25 35 26.25676 36.4 12
## 18 25 35 26.25676 36.4 12
## 19 25 35 26.25676 36.4 12
## 21 25 35 26.25676 36.4 12
## 22 25 35 26.25676 36.4 12
## 23 25 35 26.25676 36.4 12
## 24 25 35 26.25676 36.4 12
## 25 25 35 26.25676 36.4 12
## 26 25 35 26.25676 36.4 12
## 27 25 35 26.25676 36.4 12
## 29 25 35 26.25676 36.4 12
## 30 25 35 26.25676 36.4 12
## 31 25 35 26.25676 36.4 12
## 32 25 35 26.25676 36.4 12
## 34 25 35 26.25676 36.4 12
## 35 25 35 26.25676 36.4 12
## 37 25 35 26.25676 36.4 12
## 38 25 35 26.25676 36.4 12
## 39 25 35 26.25676 36.4 12
## 40 25 35 26.25676 36.4 12
## 41 25 35 26.25676 36.4 12
## 42 25 35 26.25676 36.4 12
## 43 25 35 26.25676 36.4 12
## 44 25 35 26.25676 36.4 12
## 45 25 35 26.25676 36.4 12
## maximumMaxSalary
## 1 70
## 2 70
## 6 70
## 8 70
## 9 70
## 10 70
## 11 70
## 12 70
## 13 70
## 14 70
## 15 70
## 16 70
## 17 70
## 18 70
## 19 70
## 21 70
## 22 70
## 23 70
## 24 70
## 25 70
## 26 70
## 27 70
## 29 70
## 30 70
## 31 70
## 32 70
## 34 70
## 35 70
## 37 70
## 38 70
## 39 70
## 40 70
## 41 70
## 42 70
## 43 70
## 44 70
## 45 70
##
## [[7]]
## city state
## 1 St. Paul MN
## 2 St. Paul MN
## 3 St. Paul MN
## 4 St. Paul MN
## 5 St. Paul MN
## 6 St. Paul MN
## 7 St. Paul MN
## 8 St. Paul MN
## 9 St. Paul MN
## 10 St. Paul MN
## 11 St. Paul MN
## 12 St. Paul MN
## 13 St. Paul MN
## 14 St. Paul MN
## 15 St. Paul MN
## 16 St. Paul MN
## 17 St. Paul MN
## 18 St. Paul MN
## 19 St. Paul MN
## 20 St. Paul MN
## 21 St. Paul MN
## 22 St. Paul MN
## 23 St. Paul MN
## 24 St. Paul MN
## 25 St. Paul MN
## 26 St. Paul MN
## 27 St. Paul MN
## 28 St. Paul MN
## 29 St. Paul MN
## 30 St. Paul MN
## 31 St. Paul MN
## 32 St. Paul MN
## 33 St. Paul MN
## 34 St. Paul MN
## 35 St. Paul MN
## 36 St. Paul MN
## 37 St. Paul MN
## 38 St. Paul MN
## 39 St. Paul MN
## 40 St. Paul MN
## 41 St. Paul MN
## 42 St. Paul MN
## 43 St. Paul MN
## 44 St. Paul MN
## 45 St. Paul MN
## 46 St. Paul MN
## 47 St. Paul MN
## 48 St. Paul MN
## 49 St. Paul MN
## 50 St. Paul MN
## 51 St. Paul MN
## 52 St. Paul MN
## 53 St. Paul MN
## 54 St. Paul MN
## 55 St. Paul MN
## 56 St. Paul MN
## 57 St. Paul MN
## 58 St. Paul MN
## 59 St. Paul MN
## 60 St. Paul MN
## 61 St. Paul MN
## 62 St. Paul MN
## 63 St. Paul MN
## 64 St. Paul MN
## 65 St. Paul MN
## 66 St. Paul MN
## 67 St. Paul MN
## 68 St. Paul MN
## 69 St. Paul MN
## 70 St. Paul MN
## 71 St. Paul MN
## 72 St. Paul MN
## 73 St. Paul MN
## 74 St. Paul MN
## 75 St. Paul MN
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Clinical Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Certified Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist
## 20 Massage Therapist Full Time and Part Time
## 21 Massage Therapist 1 Full Time 1 Part Time (Great Pay & Benef...
## 22 Massage Therapist
## 23 Part-time Massage Therapist
## 24 Massage Therapist
## 25 Leadership Management Trainee - Operations (LMT-O) - System...
## 26 Massage Therapist - Full Time
## 27 Massage Therapist
## 28 Licensed Massage Therapist - Minneapolis-Saint Paul, MN
## 29 Part time Massage Therapist
## 30 Licensed Massage Therapist
## 31 Certified Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist (Part-time)
## 35 Massage Therapist
## 36 Stretch Professional - Flexologist
## 37 Licensed Massage Therapist
## 38 Certified Massage Therapist-Chair Massage
## 39 Fitness Professional Massage Stretch Professional
## 40 Massage Therapist - Independent Contractor
## 41 Esthetician/Massage Therapist, also have spa room rentals av...
## 42 Massage Therapist for Chiropractic office
## 43 Massage Therapist
## 44 Life-Spa Massage Therapist
## 45 Mobile Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapy/Physical Therapy/Yoga/Pilates/Dance/Personal...
## 48 Massage Therapist FT / PT
## 49 Licensed Massage Therapist- FT or PT
## 50 Licensed Massage Therapist
## 51 Salon Massage Therapist
## 52 Certified Massage Therapist
## 53 Massage Therapist Full and Part Time
## 54 Deep tissue massage therapist
## 55 Massage Therapist FT
## 56 Retail Sales Associate / Customer Service Jobs | Elements Ma...
## 57 Fitness Professional Physical Therapy Stretch Professional
## 58 Massage Therapist PT
## 59 Fitness Professional Stretch Professional Flexologist
## 60 Part time or Full time MASSAGE THERAPISTS
## 61 Fitness Professional Yoga Pilates Stretch Professional
## 62 Fitness Professional Personal Training Stretch Professional
## 63 Wellness Massage Therapist
## 64 Massage Therapist PT Make your own hours!
## 65 Massage Therapist
## 66 Wellness Massage Therapist
## 67 Massage Therapist
## 68 Licensed Massage Therapist
## 69 Fitness Professional: Massage Therapy/Physical Therapy/Yoga/...
## 70 Massage Therapist - Full Time - Flex Schedule
## 71 Massage Therapists
## 72 Massage Therapist- FT or PT- FLEX SCHEDULE
## 73 Massage Therapist (Licensed) - LMT @ Massage Envy
## 74 Massage Therapist - LMT (Licensed Massage Therapist) Best Go...
## 75 Total Body Stretch Service Provider - Full Time
## HiringAgency
## 1 Healthy Living ChiropracticEden Prairie, MN 55344
## 2 Oak Springs ChiropracticOakdale, MN 55128
## 3 Elements Massage3.6Saint Louis Park, MN 55416 (Elmwood area)
## 4 CLOVR Life SpaApple Valley, MN (Industrial District area)
## 5 Green Lotus Yoga & Healing Center of Apple ValleyApple Valley, MN 55124 (Industrial District area)
## 6 Bella on the BayExcelsior, MN 55331
## 7 Hand and Stone Massage and Facial Spa3.0Plymouth, MN 55446
## 8 Return to Play Institute, LLCSaint Paul, MN 55108 (Como area)
## 9 Indo-Pak Massage TherapySaint Paul, MN+1 location•Remote work available
## 10 OYESPA LLCInver Grove Heights, MN 55077
## 11 Spa810Roseville, MN 55113
## 12 Elements3.6Roseville, MN 55113+5 locations
## 13 Modern Point AcupunctureMaple Grove, MN 55369
## 14 Lifestyle Chiropractic and WellnessMendota Heights, MN 55120
## 15 Made 2 Move Chiropractic & WellnessHam Lake, MN 55304
## 16 Simply Massage & SpaRosemount, MN 55068
## 17 YWCA St. PaulSaint Paul, MN 55102 (West 7th area)
## 18 Ackerman Acupuncture & MassageBlaine, MN 55449
## 19 Massage Retreat & Spa3.2Maple Grove, MN 55369
## 20 Sanctuary SalonspaExcelsior, MN 55331
## 21 Bloomington Wellness Center5.0Bloomington, MN 55437
## 22 Clearwater ChiropracticSavage, MN 55378
## 23 Clearwater ChiropracticSavage, MN 55378
## 24 Massage Envy3.2Roseville, MN 55113+9 locations
## 25 Canadian Pacific3.1Saint Paul, MN
## 26 Spalon Montage, IncWoodbury, MN 55125+2 locations
## 27 Phenix Salon Suites EaganEagan, MN 55121
## 28 Flamingo4.2Minneapolis, MN 55402 (Downtown West area)
## 29 The Woodhouse Day Spa3.3Woodbury, MN 55125
## 30 Nielson Family Chiropractic, LLCSaint Louis Park, MN 55416 (Wolfe Park area)
## 31 Dockter - Lutz ChiropracticCircle Pines, MN 55014
## 32 The Brost ClinicWayzata, MN 55391
## 33 Innate Health ChiropracticDeephaven, MN 55391
## 34 HealthWise Family ChiropracticSaint Anthony, MN 55421
## 35 Boulevard ChiropracticSaint Louis Park, MN
## 36 StretchLab - Woodbury MN3.8Woodbury, MN+3 locations
## 37 Optimize Physical TherapyBlaine, MN 55449
## 38 Minnesota Massage OutreachBrooklyn Center, MN 55444
## 39 StretchLab - Woodbury MN3.8Woodbury, MN
## 40 Balancing Touch MassageSavage, MN 55378
## 41 Parlour 9 Salon & SpaLakeville, MN 55044
## 42 Aspire ChiropracticWoodbury, MN 55125
## 43 Exceptional ChiropracticHam Lake, MN
## 44 Life Time3.6Edina, MN 55433 (Southdale area)
## 45 Indo-Pak Massage TherapyMinneapolis, MN+2 locations
## 46 Harel Chiropractic, Massage & AcupunctureHudson, WI 54016
## 47 StretchLab Minnesota3.8Minneapolis, MN+2 locations
## 48 Massage Envy3.2Stillwater, MN 55082
## 49 Spavia Day Spa3.3Maple Grove, MN 55369
## 50 Harel Chiropractic, Massage & AcupunctureHudson, WI 54016
## 51 JCPenney3.7Burnsville, MN 55306+1 location
## 52 Just For Me The Spa3.8Stillwater, MN 55082
## 53 The Woodhouse Day Spa3.3Maple Grove, MN 55369
## 54 Tree of Life Therapeutic MassageMinneapolis, MN 55447
## 55 Massage Envy3.2Saint Paul, MN 55116 (Highland area)+4 locations
## 56 Elements3.6Saint Louis Park, MN 55416
## 57 StretchLab - Woodbury MN3.8Woodbury, MN
## 58 Massage Envy3.2Saint Paul, MN 55116 (Highland area)+4 locations
## 59 StretchLab - Woodbury MN3.8Woodbury, MN
## 60 Harel Chiropractic & MassageHudson, WI
## 61 StretchLab - Woodbury MN3.8Woodbury, MN
## 62 StretchLab - Woodbury MN3.8Woodbury, MN
## 63 Turning Leaf ChiropracticLakeville, MN 55044
## 64 Massage Envy3.2Golden Valley, MN 55427
## 65 Q Salon and SpaAnoka, MN 55303
## 66 Turning Leaf ChiropracticLakeville, MN 55044
## 67 Aurora SpaMinneapolis, MN 55408 (East Calhoun area)
## 68 Soothe3.7Minneapolis, MN
## 69 StretchLab Minnesota3.8Saint Louis Park, MN+1 location
## 70 Massage Envy3.2Eagan, MN 55121
## 71 Enhance Beauty & SpaFridley, MN 55432
## 72 Massage Envy3.2Bloomington, MN 55431
## 73 Massage Envy (NCT Company d.b.a.)3.2Golden Valley, MN 55427
## 74 Massage Envy (NCT Company d.b.a.)3.2Golden Valley, MN 55427
## 75 Massage Envy3.2Plymouth, MN 55447
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 12 70 25000 80000
## 2 12 12 70 25000 80000
## 3 30 12 70 25000 80000
## 4 30 12 70 25000 80000
## 5 14 12 70 25000 80000
## 6 7 12 70 25000 80000
## 7 7 12 70 25000 80000
## 8 27 12 70 25000 80000
## 9 5 12 70 25000 80000
## 10 2 12 70 25000 80000
## 11 12 12 70 25000 80000
## 12 30 12 70 25000 80000
## 13 8 12 70 25000 80000
## 14 20 12 70 25000 80000
## 15 7 12 70 25000 80000
## 16 30 12 70 25000 80000
## 17 30 12 70 25000 80000
## 18 22 12 70 25000 80000
## 19 5 12 70 25000 80000
## 20 30 12 70 25000 80000
## 21 6 12 70 25000 80000
## 22 7 12 70 25000 80000
## 23 1 12 70 25000 80000
## 24 30 12 70 25000 80000
## 25 30 12 70 25000 80000
## 26 30 12 70 25000 80000
## 27 25 12 70 25000 80000
## 28 30 12 70 25000 80000
## 29 9 12 70 25000 80000
## 30 7 12 70 25000 80000
## 31 28 12 70 25000 80000
## 32 16 12 70 25000 80000
## 33 22 12 70 25000 80000
## 34 13 12 70 25000 80000
## 35 30 12 70 25000 80000
## 36 6 12 70 25000 80000
## 37 20 12 70 25000 80000
## 38 30 12 70 25000 80000
## 39 14 12 70 25000 80000
## 40 1 12 70 25000 80000
## 41 Just posted 12 70 25000 80000
## 42 15 12 70 25000 80000
## 43 30 12 70 25000 80000
## 44 30 12 70 25000 80000
## 45 30 12 70 25000 80000
## 46 30 12 70 25000 80000
## 47 30 12 70 25000 80000
## 48 6 12 70 25000 80000
## 49 30 12 70 25000 80000
## 50 30 12 70 25000 80000
## 51 30 12 70 25000 80000
## 52 13 12 70 25000 80000
## 53 13 12 70 25000 80000
## 54 11 12 70 25000 80000
## 55 30 12 70 25000 80000
## 56 24 12 70 25000 80000
## 57 19 12 70 25000 80000
## 58 30 12 70 25000 80000
## 59 14 12 70 25000 80000
## 60 30 12 70 25000 80000
## 61 14 12 70 25000 80000
## 62 14 12 70 25000 80000
## 63 30 12 70 25000 80000
## 64 30 12 70 25000 80000
## 65 22 12 70 25000 80000
## 66 30 12 70 25000 80000
## 67 30 12 70 25000 80000
## 68 24 12 70 25000 80000
## 69 30 12 70 25000 80000
## 70 30 12 70 25000 80000
## 71 30 12 70 25000 80000
## 72 30 12 70 25000 80000
## 73 25 12 70 25000 80000
## 74 25 12 70 25000 80000
## 75 30 12 70 25000 80000
getIndeedJobData5pages("massage therapist","Rochester","MN")
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Licensed Massage Therapist - Rochester, MN
## 3 Massage Therapists
## 4 Massage Therapist
## 5 Massage Therapist full time
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist - Rochester, MN
## 8 Massage Therapists
## 9 Massage Therapist
## 10 Massage Therapist full time
## 11 Massage Therapist - Independent Contractor
## 12 Licensed Massage Therapist - Rochester, MN
## 13 Massage Therapists
## 14 Massage Therapist
## 15 Massage Therapist full time
## 16 Massage Therapist
## 17 Massage Therapist - Independent Contractor
## 18 Licensed Massage Therapist - Rochester, MN
## 19 Massage Therapists
## 20 Massage Therapist
## 21 Massage Therapist full time
## 22 Massage Therapist
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist - Rochester, MN
## 25 Massage Therapists
## 26 Massage Therapist
## 27 Massage Therapist full time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$60 - $65 an hour $60 - $65 60 65
## 3 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 4 \n$30 - $35 an hour $30 - $35 30 35
## 5 \n$15 - $25 an hour ++ $15 - $25 15 25
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$60 - $65 an hour $60 - $65 60 65
## 8 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 9 \n$30 - $35 an hour $30 - $35 30 35
## 10 \n$15 - $25 an hour ++ $15 - $25 15 25
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$60 - $65 an hour $60 - $65 60 65
## 13 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 14 \n$30 - $35 an hour $30 - $35 30 35
## 15 \n$15 - $25 an hour ++ $15 - $25 15 25
## 16 \n$25 - $35 an hour $25 - $35 25 35
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$60 - $65 an hour $60 - $65 60 65
## 19 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 20 \n$30 - $35 an hour $30 - $35 30 35
## 21 \n$15 - $25 an hour ++ $15 - $25 15 25
## 22 \n$25 - $35 an hour $25 - $35 25 35
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 24 \n$60 - $65 an hour $60 - $65 60 65
## 25 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 26 \n$30 - $35 an hour $30 - $35 30 35
## 27 \n$15 - $25 an hour ++ $15 - $25 15 25
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 60 60 7880.556 9835 15
## 2 60 60 7880.556 9835 15
## 3 60 60 7880.556 9835 15
## 4 60 60 7880.556 9835 15
## 5 60 60 7880.556 9835 15
## 6 60 60 7880.556 9835 15
## 7 60 60 7880.556 9835 15
## 8 60 60 7880.556 9835 15
## 9 60 60 7880.556 9835 15
## 10 60 60 7880.556 9835 15
## 11 60 60 7880.556 9835 15
## 12 60 60 7880.556 9835 15
## 13 60 60 7880.556 9835 15
## 14 60 60 7880.556 9835 15
## 15 60 60 7880.556 9835 15
## 16 60 60 7880.556 9835 15
## 17 60 60 7880.556 9835 15
## 18 60 60 7880.556 9835 15
## 19 60 60 7880.556 9835 15
## 20 60 60 7880.556 9835 15
## 21 60 60 7880.556 9835 15
## 22 60 60 7880.556 9835 15
## 23 60 60 7880.556 9835 15
## 24 60 60 7880.556 9835 15
## 25 60 60 7880.556 9835 15
## 26 60 60 7880.556 9835 15
## 27 60 60 7880.556 9835 15
## maximumMaxSalary
## 1 51524
## 2 51524
## 3 51524
## 4 51524
## 5 51524
## 6 51524
## 7 51524
## 8 51524
## 9 51524
## 10 51524
## 11 51524
## 12 51524
## 13 51524
## 14 51524
## 15 51524
## 16 51524
## 17 51524
## 18 51524
## 19 51524
## 20 51524
## 21 51524
## 22 51524
## 23 51524
## 24 51524
## 25 51524
## 26 51524
## 27 51524
##
## [[3]]
## date_daysAgo
## 1 5
## 2 30
## 3 30
## 4 30
## 5 30
## 6 5
## 7 30
## 8 30
## 9 30
## 10 30
## 11 5
## 12 30
## 13 30
## 14 30
## 15 30
## 16 30
## 17 5
## 18 30
## 19 30
## 20 30
## 21 30
## 22 30
## 23 5
## 24 30
## 25 30
## 26 30
## 27 30
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyRochester, MN•Remote work available
## 2 Flamingo4.2Rochester, MN 55904
## 3 Healing Touch SpaRochester, MN 55904 (Downtown area)
## 4 White Pebble Spa Co.Stewartville, MN 55976
## 5 Massage Envy3.2Rochester, MN 55904
## 6 Indo-Pak Massage TherapyRochester, MN•Remote work available
## 7 Flamingo4.2Rochester, MN 55904
## 8 Healing Touch SpaRochester, MN 55904 (Downtown area)
## 9 White Pebble Spa Co.Stewartville, MN 55976
## 10 Massage Envy3.2Rochester, MN 55904
## 11 Indo-Pak Massage TherapyRochester, MN•Remote work available
## 12 Flamingo4.2Rochester, MN 55904
## 13 Healing Touch SpaRochester, MN 55904 (Downtown area)
## 14 White Pebble Spa Co.Stewartville, MN 55976
## 15 Massage Envy3.2Rochester, MN 55904
## 16 White Pebble Spa Co.Saint Charles, MN 55972
## 17 Indo-Pak Massage TherapyRochester, MN•Remote work available
## 18 Flamingo4.2Rochester, MN 55904
## 19 Healing Touch SpaRochester, MN 55904 (Downtown area)
## 20 White Pebble Spa Co.Stewartville, MN 55976
## 21 Massage Envy3.2Rochester, MN 55904
## 22 White Pebble Spa Co.Saint Charles, MN 55972
## 23 Indo-Pak Massage TherapyRochester, MN•Remote work available
## 24 Flamingo4.2Rochester, MN 55904
## 25 Healing Touch SpaRochester, MN 55904 (Downtown area)
## 26 White Pebble Spa Co.Stewartville, MN 55976
## 27 Massage Envy3.2Rochester, MN 55904
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 8 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 13 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 19 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## 25 \n$37,440 - $51,524 a year $37440 - $51524 37440 51524
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 37440 51524 37440 51524 37440
## 8 37440 51524 37440 51524 37440
## 13 37440 51524 37440 51524 37440
## 19 37440 51524 37440 51524 37440
## 25 37440 51524 37440 51524 37440
## maximumMaxSalary
## 3 51524
## 8 51524
## 13 51524
## 19 51524
## 25 51524
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$60 - $65 an hour $60 - $65 60 65 30
## 4 \n$30 - $35 an hour $30 - $35 30 35 30
## 5 \n$15 - $25 an hour ++ $15 - $25 15 25 30
## 7 \n$60 - $65 an hour $60 - $65 60 65 30
## 9 \n$30 - $35 an hour $30 - $35 30 35 30
## 10 \n$15 - $25 an hour ++ $15 - $25 15 25 30
## 12 \n$60 - $65 an hour $60 - $65 60 65 30
## 14 \n$30 - $35 an hour $30 - $35 30 35 30
## 15 \n$15 - $25 an hour ++ $15 - $25 15 25 30
## 16 \n$25 - $35 an hour $25 - $35 25 35 30
## 18 \n$60 - $65 an hour $60 - $65 60 65 30
## 20 \n$30 - $35 an hour $30 - $35 30 35 30
## 21 \n$15 - $25 an hour ++ $15 - $25 15 25 30
## 22 \n$25 - $35 an hour $25 - $35 25 35 30
## 24 \n$60 - $65 an hour $60 - $65 60 65 30
## 26 \n$30 - $35 an hour $30 - $35 30 35 30
## 27 \n$15 - $25 an hour ++ $15 - $25 15 25 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 35 33.82353 40.88235 15 65
## 4 35 33.82353 40.88235 15 65
## 5 35 33.82353 40.88235 15 65
## 7 35 33.82353 40.88235 15 65
## 9 35 33.82353 40.88235 15 65
## 10 35 33.82353 40.88235 15 65
## 12 35 33.82353 40.88235 15 65
## 14 35 33.82353 40.88235 15 65
## 15 35 33.82353 40.88235 15 65
## 16 35 33.82353 40.88235 15 65
## 18 35 33.82353 40.88235 15 65
## 20 35 33.82353 40.88235 15 65
## 21 35 33.82353 40.88235 15 65
## 22 35 33.82353 40.88235 15 65
## 24 35 33.82353 40.88235 15 65
## 26 35 33.82353 40.88235 15 65
## 27 35 33.82353 40.88235 15 65
##
## [[7]]
## city state jobTitle
## 1 Rochester MN Massage Therapist - Independent Contractor
## 2 Rochester MN Licensed Massage Therapist - Rochester, MN
## 3 Rochester MN Massage Therapists
## 4 Rochester MN Massage Therapist
## 5 Rochester MN Massage Therapist full time
## 6 Rochester MN Massage Therapist - Independent Contractor
## 7 Rochester MN Licensed Massage Therapist - Rochester, MN
## 8 Rochester MN Massage Therapists
## 9 Rochester MN Massage Therapist
## 10 Rochester MN Massage Therapist full time
## 11 Rochester MN Massage Therapist - Independent Contractor
## 12 Rochester MN Licensed Massage Therapist - Rochester, MN
## 13 Rochester MN Massage Therapists
## 14 Rochester MN Massage Therapist
## 15 Rochester MN Massage Therapist full time
## 16 Rochester MN Massage Therapist
## 17 Rochester MN Massage Therapist - Independent Contractor
## 18 Rochester MN Licensed Massage Therapist - Rochester, MN
## 19 Rochester MN Massage Therapists
## 20 Rochester MN Massage Therapist
## 21 Rochester MN Massage Therapist full time
## 22 Rochester MN Massage Therapist
## 23 Rochester MN Massage Therapist - Independent Contractor
## 24 Rochester MN Licensed Massage Therapist - Rochester, MN
## 25 Rochester MN Massage Therapists
## 26 Rochester MN Massage Therapist
## 27 Rochester MN Massage Therapist full time
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyRochester, MN•Remote work available 5
## 2 Flamingo4.2Rochester, MN 55904 30
## 3 Healing Touch SpaRochester, MN 55904 (Downtown area) 30
## 4 White Pebble Spa Co.Stewartville, MN 55976 30
## 5 Massage Envy3.2Rochester, MN 55904 30
## 6 Indo-Pak Massage TherapyRochester, MN•Remote work available 5
## 7 Flamingo4.2Rochester, MN 55904 30
## 8 Healing Touch SpaRochester, MN 55904 (Downtown area) 30
## 9 White Pebble Spa Co.Stewartville, MN 55976 30
## 10 Massage Envy3.2Rochester, MN 55904 30
## 11 Indo-Pak Massage TherapyRochester, MN•Remote work available 5
## 12 Flamingo4.2Rochester, MN 55904 30
## 13 Healing Touch SpaRochester, MN 55904 (Downtown area) 30
## 14 White Pebble Spa Co.Stewartville, MN 55976 30
## 15 Massage Envy3.2Rochester, MN 55904 30
## 16 White Pebble Spa Co.Saint Charles, MN 55972 30
## 17 Indo-Pak Massage TherapyRochester, MN•Remote work available 5
## 18 Flamingo4.2Rochester, MN 55904 30
## 19 Healing Touch SpaRochester, MN 55904 (Downtown area) 30
## 20 White Pebble Spa Co.Stewartville, MN 55976 30
## 21 Massage Envy3.2Rochester, MN 55904 30
## 22 White Pebble Spa Co.Saint Charles, MN 55972 30
## 23 Indo-Pak Massage TherapyRochester, MN•Remote work available 5
## 24 Flamingo4.2Rochester, MN 55904 30
## 25 Healing Touch SpaRochester, MN 55904 (Downtown area) 30
## 26 White Pebble Spa Co.Stewartville, MN 55976 30
## 27 Massage Envy3.2Rochester, MN 55904 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 15 65 37440 51524
## 2 15 65 37440 51524
## 3 15 65 37440 51524
## 4 15 65 37440 51524
## 5 15 65 37440 51524
## 6 15 65 37440 51524
## 7 15 65 37440 51524
## 8 15 65 37440 51524
## 9 15 65 37440 51524
## 10 15 65 37440 51524
## 11 15 65 37440 51524
## 12 15 65 37440 51524
## 13 15 65 37440 51524
## 14 15 65 37440 51524
## 15 15 65 37440 51524
## 16 15 65 37440 51524
## 17 15 65 37440 51524
## 18 15 65 37440 51524
## 19 15 65 37440 51524
## 20 15 65 37440 51524
## 21 15 65 37440 51524
## 22 15 65 37440 51524
## 23 15 65 37440 51524
## 24 15 65 37440 51524
## 25 15 65 37440 51524
## 26 15 65 37440 51524
## 27 15 65 37440 51524
Mississippi Jackson, Gulfport, Southaven
getIndeedJobData5pages("massage therapist","Jackson","MS")
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Massage Therapist Full-Time
## 3 Massage Therapist Full Time
## 4 Massage Therapist Part-Time
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist Full-Time
## 7 Massage Therapist Full Time
## 8 Massage Therapist Part-Time
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist Full-Time
## 11 Massage Therapist Full Time
## 12 Massage Therapist Part-Time
## 13 Massage Therapist - Independent Contractor
## 14 Massage Therapist Full-Time
## 15 Massage Therapist Full Time
## 16 Massage Therapist Part-Time
## 17 Massage Therapist - Independent Contractor
## 18 Massage Therapist Full-Time
## 19 Massage Therapist Full Time
## 20 Massage Therapist Part-Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5000 8500 5000 8500 5000
## 2 5000 8500 5000 8500 5000
## 3 5000 8500 5000 8500 5000
## 4 5000 8500 5000 8500 5000
## 5 5000 8500 5000 8500 5000
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
##
## [[3]]
## date_daysAgo
## 1 17
## 2 4
## 3 30
## 4 4
## 5 17
## 6 4
## 7 30
## 8 4
## 9 17
## 10 4
## 11 30
## 12 4
## 13 17
## 14 4
## 15 30
## 16 4
## 17 17
## 18 4
## 19 30
## 20 4
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyJackson, MS•Remote work available
## 2 Massage Envy3.2Jackson, MS 39211+1 location
## 3 Massage Envy3.2Jackson, MS 39211+2 locations
## 4 Massage Envy3.2Jackson, MS 39211+1 location
## 5 Indo-Pak Massage TherapyJackson, MS•Remote work available
## 6 Massage Envy3.2Jackson, MS 39211+1 location
## 7 Massage Envy3.2Jackson, MS 39211+2 locations
## 8 Massage Envy3.2Jackson, MS 39211+1 location
## 9 Indo-Pak Massage TherapyJackson, MS•Remote work available
## 10 Massage Envy3.2Jackson, MS 39211+1 location
## 11 Massage Envy3.2Jackson, MS 39211+2 locations
## 12 Massage Envy3.2Jackson, MS 39211+1 location
## 13 Indo-Pak Massage TherapyJackson, MS•Remote work available
## 14 Massage Envy3.2Jackson, MS 39211+1 location
## 15 Massage Envy3.2Jackson, MS 39211+2 locations
## 16 Massage Envy3.2Jackson, MS 39211+1 location
## 17 Indo-Pak Massage TherapyJackson, MS•Remote work available
## 18 Massage Envy3.2Jackson, MS 39211+1 location
## 19 Massage Envy3.2Jackson, MS 39211+2 locations
## 20 Massage Envy3.2Jackson, MS 39211+1 location
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Jackson MS Massage Therapist - Independent Contractor
## 2 Jackson MS Massage Therapist Full-Time
## 3 Jackson MS Massage Therapist Full Time
## 4 Jackson MS Massage Therapist Part-Time
## 5 Jackson MS Massage Therapist - Independent Contractor
## 6 Jackson MS Massage Therapist Full-Time
## 7 Jackson MS Massage Therapist Full Time
## 8 Jackson MS Massage Therapist Part-Time
## 9 Jackson MS Massage Therapist - Independent Contractor
## 10 Jackson MS Massage Therapist Full-Time
## 11 Jackson MS Massage Therapist Full Time
## 12 Jackson MS Massage Therapist Part-Time
## 13 Jackson MS Massage Therapist - Independent Contractor
## 14 Jackson MS Massage Therapist Full-Time
## 15 Jackson MS Massage Therapist Full Time
## 16 Jackson MS Massage Therapist Part-Time
## 17 Jackson MS Massage Therapist - Independent Contractor
## 18 Jackson MS Massage Therapist Full-Time
## 19 Jackson MS Massage Therapist Full Time
## 20 Jackson MS Massage Therapist Part-Time
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyJackson, MS•Remote work available 17
## 2 Massage Envy3.2Jackson, MS 39211+1 location 4
## 3 Massage Envy3.2Jackson, MS 39211+2 locations 30
## 4 Massage Envy3.2Jackson, MS 39211+1 location 4
## 5 Indo-Pak Massage TherapyJackson, MS•Remote work available 17
## 6 Massage Envy3.2Jackson, MS 39211+1 location 4
## 7 Massage Envy3.2Jackson, MS 39211+2 locations 30
## 8 Massage Envy3.2Jackson, MS 39211+1 location 4
## 9 Indo-Pak Massage TherapyJackson, MS•Remote work available 17
## 10 Massage Envy3.2Jackson, MS 39211+1 location 4
## 11 Massage Envy3.2Jackson, MS 39211+2 locations 30
## 12 Massage Envy3.2Jackson, MS 39211+1 location 4
## 13 Indo-Pak Massage TherapyJackson, MS•Remote work available 17
## 14 Massage Envy3.2Jackson, MS 39211+1 location 4
## 15 Massage Envy3.2Jackson, MS 39211+2 locations 30
## 16 Massage Envy3.2Jackson, MS 39211+1 location 4
## 17 Indo-Pak Massage TherapyJackson, MS•Remote work available 17
## 18 Massage Envy3.2Jackson, MS 39211+1 location 4
## 19 Massage Envy3.2Jackson, MS 39211+2 locations 30
## 20 Massage Envy3.2Jackson, MS 39211+1 location 4
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
## 6 NA NA NA NA
## 7 NA NA NA NA
## 8 NA NA NA NA
## 9 NA NA NA NA
## 10 NA NA NA NA
## 11 NA NA NA NA
## 12 NA NA NA NA
## 13 NA NA NA NA
## 14 NA NA NA NA
## 15 NA NA NA NA
## 16 NA NA NA NA
## 17 NA NA NA NA
## 18 NA NA NA NA
## 19 NA NA NA NA
## 20 NA NA NA NA
getIndeedJobData5pages("massage therapist","Gulfport","MS")
## [[1]]
## jobTitle
## 1 Massage Therapist Full-Time
## 2 Massage Therapist Part-Time
## 3 Massage Therapist Full Time
## 4 Massage Therapist Full-Time
## 5 Massage Therapist Part-Time
## 6 Massage Therapist Full Time
## 7 Massage Therapist Full-Time
## 8 Massage Therapist Part-Time
## 9 Massage Therapist Full Time
## 10 Massage Therapist Full-Time
## 11 Massage Therapist Part-Time
## 12 Massage Therapist Full Time
## 13 Massage Therapist Full-Time
## 14 Massage Therapist Part-Time
## 15 Massage Therapist Full Time
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 4
## 2 4
## 3 30
## 4 4
## 5 4
## 6 30
## 7 4
## 8 4
## 9 30
## 10 4
## 11 4
## 12 30
## 13 4
## 14 4
## 15 30
##
## [[4]]
## HiringAgency
## 1 Massage Envy3.2Gulfport, MS 39503+1 location
## 2 Massage Envy3.2Gulfport, MS 39503+1 location
## 3 Massage Envy3.2Gulfport, MS 39503+2 locations
## 4 Massage Envy3.2Gulfport, MS 39503+1 location
## 5 Massage Envy3.2Gulfport, MS 39503+1 location
## 6 Massage Envy3.2Gulfport, MS 39503+2 locations
## 7 Massage Envy3.2Gulfport, MS 39503+1 location
## 8 Massage Envy3.2Gulfport, MS 39503+1 location
## 9 Massage Envy3.2Gulfport, MS 39503+2 locations
## 10 Massage Envy3.2Gulfport, MS 39503+1 location
## 11 Massage Envy3.2Gulfport, MS 39503+1 location
## 12 Massage Envy3.2Gulfport, MS 39503+2 locations
## 13 Massage Envy3.2Gulfport, MS 39503+1 location
## 14 Massage Envy3.2Gulfport, MS 39503+1 location
## 15 Massage Envy3.2Gulfport, MS 39503+2 locations
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Gulfport MS Massage Therapist Full-Time
## 2 Gulfport MS Massage Therapist Part-Time
## 3 Gulfport MS Massage Therapist Full Time
## 4 Gulfport MS Massage Therapist Full-Time
## 5 Gulfport MS Massage Therapist Part-Time
## 6 Gulfport MS Massage Therapist Full Time
## 7 Gulfport MS Massage Therapist Full-Time
## 8 Gulfport MS Massage Therapist Part-Time
## 9 Gulfport MS Massage Therapist Full Time
## 10 Gulfport MS Massage Therapist Full-Time
## 11 Gulfport MS Massage Therapist Part-Time
## 12 Gulfport MS Massage Therapist Full Time
## 13 Gulfport MS Massage Therapist Full-Time
## 14 Gulfport MS Massage Therapist Part-Time
## 15 Gulfport MS Massage Therapist Full Time
## HiringAgency date_daysAgo MinHourlySalary
## 1 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 2 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 3 Massage Envy3.2Gulfport, MS 39503+2 locations 30 NA
## 4 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 5 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 6 Massage Envy3.2Gulfport, MS 39503+2 locations 30 NA
## 7 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 8 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 9 Massage Envy3.2Gulfport, MS 39503+2 locations 30 NA
## 10 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 11 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 12 Massage Envy3.2Gulfport, MS 39503+2 locations 30 NA
## 13 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 14 Massage Envy3.2Gulfport, MS 39503+1 location 4 NA
## 15 Massage Envy3.2Gulfport, MS 39503+2 locations 30 NA
## MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA
## 2 NA NA NA
## 3 NA NA NA
## 4 NA NA NA
## 5 NA NA NA
## 6 NA NA NA
## 7 NA NA NA
## 8 NA NA NA
## 9 NA NA NA
## 10 NA NA NA
## 11 NA NA NA
## 12 NA NA NA
## 13 NA NA NA
## 14 NA NA NA
## 15 NA NA NA
getIndeedJobData5pages("massage therapist","Southaven","MS")
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist **$1,000 Sign-on Bonus
## 3 Licensed Massage Therapist (LMT)
## 4 Salon Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 Stretch Practitioner
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Salon Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Stretch Practitioner
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Salon Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Massage Therapist
## 20 Massage Therapist - Independent Contractor
## 21 Stretch Practitioner
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Salon Massage Therapist
## 25 Licensed Massage Therapist (LMT)
## 26 Massage Therapist
## 27 Licensed Massage Therapist **$1,000 Sign-on Bonus
## 28 Massage Therapist - Independent Contractor
## 29 Stretch Practitioner
## 30 Massage Therapist
## 31 Salon Massage Therapist
## 32 Massage Therapist
## 33 Massage Therapist - Independent Contractor
## 34 Stretch Practitioner
## 35 Massage Therapist
## 36 Licensed Massage Therapist (LMT)
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist **$1,000 Sign-on Bonus
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35 - $78 an hour $35 - $78 35 78
## 2 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 3 \n$35 - $47 an hour $35 - $47 35 47
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$10 - $20 an hour $10 - $20 10 20
## 6 \n$35 - $78 an hour $35 - $78 35 78
## 7 \n$35 - $47 an hour $35 - $47 35 47
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$10 - $20 an hour $10 - $20 10 20
## 10 \n$35 - $78 an hour $35 - $78 35 78
## 11 \n$35 - $47 an hour $35 - $47 35 47
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$10 - $20 an hour $10 - $20 10 20
## 14 \n$35 - $78 an hour $35 - $78 35 78
## 15 \n$35 - $47 an hour $35 - $47 35 47
## 16 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$10 - $20 an hour $10 - $20 10 20
## 19 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 20 \n$10 - $20 an hour $10 - $20 10 20
## 21 \n$35 - $47 an hour $35 - $47 35 47
## 22 \n$35 - $78 an hour $35 - $78 35 78
## 23 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 47 5734.783 8230.978 10
## 2 35 47 5734.783 8230.978 10
## 3 35 47 5734.783 8230.978 10
## 4 35 47 5734.783 8230.978 10
## 5 35 47 5734.783 8230.978 10
## 6 35 47 5734.783 8230.978 10
## 7 35 47 5734.783 8230.978 10
## 8 35 47 5734.783 8230.978 10
## 9 35 47 5734.783 8230.978 10
## 10 35 47 5734.783 8230.978 10
## 11 35 47 5734.783 8230.978 10
## 12 35 47 5734.783 8230.978 10
## 13 35 47 5734.783 8230.978 10
## 14 35 47 5734.783 8230.978 10
## 15 35 47 5734.783 8230.978 10
## 16 35 47 5734.783 8230.978 10
## 17 35 47 5734.783 8230.978 10
## 18 35 47 5734.783 8230.978 10
## 19 35 47 5734.783 8230.978 10
## 20 35 47 5734.783 8230.978 10
## 21 35 47 5734.783 8230.978 10
## 22 35 47 5734.783 8230.978 10
## 23 35 47 5734.783 8230.978 10
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 30
## 3 30
## 4 30
## 5 30
## 6 17
## 7 30
## 8 30
## 9 14
## 10 30
## 11 30
## 12 30
## 13 17
## 14 30
## 15 30
## 16 14
## 17 30
## 18 30
## 19 30
## 20 17
## 21 30
## 22 30
## 23 14
## 24 30
## 25 30
## 26 30
## 27 30
## 28 17
## 29 30
## 30 30
## 31 30
## 32 30
## 33 17
## 34 30
## 35 30
## 36 30
## 37 14
## 38 30
##
## [[4]]
## HiringAgency
## 1 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 2 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 3 Sneed Medispa & WellnessMemphis, TN
## 4 JCPenney3.7Southaven, MS 38671
## 5 Gould's SalonsOlive Branch, MS 38654+1 location
## 6 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 7 Stretch Zone2.7Germantown, TN 38138
## 8 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 9 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 10 JCPenney3.7Southaven, MS 38671
## 11 Sneed Medispa & WellnessMemphis, TN
## 12 Gould's SalonsOlive Branch, MS 38654+1 location
## 13 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 14 Stretch Zone2.7Germantown, TN 38138
## 15 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 16 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 17 JCPenney3.7Southaven, MS 38671
## 18 Sneed Medispa & WellnessMemphis, TN
## 19 Gould's SalonsOlive Branch, MS 38654+1 location
## 20 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 21 Stretch Zone2.7Germantown, TN 38138
## 22 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 23 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 24 JCPenney3.7Southaven, MS 38671
## 25 Sneed Medispa & WellnessMemphis, TN
## 26 Gould's SalonsOlive Branch, MS 38654+1 location
## 27 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 28 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 29 Stretch Zone2.7Germantown, TN 38138
## 30 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 31 JCPenney3.7Southaven, MS 38671
## 32 Gould's SalonsOlive Branch, MS 38654+1 location
## 33 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 34 Stretch Zone2.7Germantown, TN 38138
## 35 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 36 Sneed Medispa & WellnessMemphis, TN
## 37 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 38 Massage Envy3.2Memphis, TN 38104 (Midtown area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 16 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 23 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 35500 62000 35500 62000 35500
## 16 35500 62000 35500 62000 35500
## 23 35500 62000 35500 62000 35500
## maximumMaxSalary
## 2 62000
## 16 62000
## 23 62000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$35 - $78 an hour $35 - $78 35 78 35
## 3 \n$35 - $47 an hour $35 - $47 35 47 35
## 5 \n$10 - $20 an hour $10 - $20 10 20 35
## 6 \n$35 - $78 an hour $35 - $78 35 78 35
## 7 \n$35 - $47 an hour $35 - $47 35 47 35
## 9 \n$10 - $20 an hour $10 - $20 10 20 35
## 10 \n$35 - $78 an hour $35 - $78 35 78 35
## 11 \n$35 - $47 an hour $35 - $47 35 47 35
## 13 \n$10 - $20 an hour $10 - $20 10 20 35
## 14 \n$35 - $78 an hour $35 - $78 35 78 35
## 15 \n$35 - $47 an hour $35 - $47 35 47 35
## 18 \n$10 - $20 an hour $10 - $20 10 20 35
## 20 \n$10 - $20 an hour $10 - $20 10 20 35
## 21 \n$35 - $47 an hour $35 - $47 35 47 35
## 22 \n$35 - $78 an hour $35 - $78 35 78 35
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 47 26.66667 48.33333 10 78
## 3 47 26.66667 48.33333 10 78
## 5 47 26.66667 48.33333 10 78
## 6 47 26.66667 48.33333 10 78
## 7 47 26.66667 48.33333 10 78
## 9 47 26.66667 48.33333 10 78
## 10 47 26.66667 48.33333 10 78
## 11 47 26.66667 48.33333 10 78
## 13 47 26.66667 48.33333 10 78
## 14 47 26.66667 48.33333 10 78
## 15 47 26.66667 48.33333 10 78
## 18 47 26.66667 48.33333 10 78
## 20 47 26.66667 48.33333 10 78
## 21 47 26.66667 48.33333 10 78
## 22 47 26.66667 48.33333 10 78
##
## [[7]]
## city state jobTitle
## 1 Southaven MS Licensed Massage Therapist
## 2 Southaven MS Licensed Massage Therapist **$1,000 Sign-on Bonus
## 3 Southaven MS Licensed Massage Therapist (LMT)
## 4 Southaven MS Salon Massage Therapist
## 5 Southaven MS Massage Therapist
## 6 Southaven MS Massage Therapist - Independent Contractor
## 7 Southaven MS Stretch Practitioner
## 8 Southaven MS Massage Therapist
## 9 Southaven MS Licensed Massage Therapist
## 10 Southaven MS Salon Massage Therapist
## 11 Southaven MS Licensed Massage Therapist (LMT)
## 12 Southaven MS Massage Therapist
## 13 Southaven MS Massage Therapist - Independent Contractor
## 14 Southaven MS Stretch Practitioner
## 15 Southaven MS Massage Therapist
## 16 Southaven MS Licensed Massage Therapist
## 17 Southaven MS Salon Massage Therapist
## 18 Southaven MS Licensed Massage Therapist (LMT)
## 19 Southaven MS Massage Therapist
## 20 Southaven MS Massage Therapist - Independent Contractor
## 21 Southaven MS Stretch Practitioner
## 22 Southaven MS Massage Therapist
## 23 Southaven MS Licensed Massage Therapist
## 24 Southaven MS Salon Massage Therapist
## 25 Southaven MS Licensed Massage Therapist (LMT)
## 26 Southaven MS Massage Therapist
## 27 Southaven MS Licensed Massage Therapist **$1,000 Sign-on Bonus
## 28 Southaven MS Massage Therapist - Independent Contractor
## 29 Southaven MS Stretch Practitioner
## 30 Southaven MS Massage Therapist
## 31 Southaven MS Salon Massage Therapist
## 32 Southaven MS Massage Therapist
## 33 Southaven MS Massage Therapist - Independent Contractor
## 34 Southaven MS Stretch Practitioner
## 35 Southaven MS Massage Therapist
## 36 Southaven MS Licensed Massage Therapist (LMT)
## 37 Southaven MS Licensed Massage Therapist
## 38 Southaven MS Licensed Massage Therapist **$1,000 Sign-on Bonus
## HiringAgency
## 1 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 2 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 3 Sneed Medispa & WellnessMemphis, TN
## 4 JCPenney3.7Southaven, MS 38671
## 5 Gould's SalonsOlive Branch, MS 38654+1 location
## 6 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 7 Stretch Zone2.7Germantown, TN 38138
## 8 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 9 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 10 JCPenney3.7Southaven, MS 38671
## 11 Sneed Medispa & WellnessMemphis, TN
## 12 Gould's SalonsOlive Branch, MS 38654+1 location
## 13 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 14 Stretch Zone2.7Germantown, TN 38138
## 15 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 16 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 17 JCPenney3.7Southaven, MS 38671
## 18 Sneed Medispa & WellnessMemphis, TN
## 19 Gould's SalonsOlive Branch, MS 38654+1 location
## 20 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 21 Stretch Zone2.7Germantown, TN 38138
## 22 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 23 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 24 JCPenney3.7Southaven, MS 38671
## 25 Sneed Medispa & WellnessMemphis, TN
## 26 Gould's SalonsOlive Branch, MS 38654+1 location
## 27 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 28 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 29 Stretch Zone2.7Germantown, TN 38138
## 30 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 31 JCPenney3.7Southaven, MS 38671
## 32 Gould's SalonsOlive Branch, MS 38654+1 location
## 33 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 34 Stretch Zone2.7Germantown, TN 38138
## 35 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 36 Sneed Medispa & WellnessMemphis, TN
## 37 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 38 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 14 10 78 35500 62000
## 2 30 10 78 35500 62000
## 3 30 10 78 35500 62000
## 4 30 10 78 35500 62000
## 5 30 10 78 35500 62000
## 6 17 10 78 35500 62000
## 7 30 10 78 35500 62000
## 8 30 10 78 35500 62000
## 9 14 10 78 35500 62000
## 10 30 10 78 35500 62000
## 11 30 10 78 35500 62000
## 12 30 10 78 35500 62000
## 13 17 10 78 35500 62000
## 14 30 10 78 35500 62000
## 15 30 10 78 35500 62000
## 16 14 10 78 35500 62000
## 17 30 10 78 35500 62000
## 18 30 10 78 35500 62000
## 19 30 10 78 35500 62000
## 20 17 10 78 35500 62000
## 21 30 10 78 35500 62000
## 22 30 10 78 35500 62000
## 23 14 10 78 35500 62000
## 24 30 10 78 35500 62000
## 25 30 10 78 35500 62000
## 26 30 10 78 35500 62000
## 27 30 10 78 35500 62000
## 28 17 10 78 35500 62000
## 29 30 10 78 35500 62000
## 30 30 10 78 35500 62000
## 31 30 10 78 35500 62000
## 32 30 10 78 35500 62000
## 33 17 10 78 35500 62000
## 34 30 10 78 35500 62000
## 35 30 10 78 35500 62000
## 36 30 10 78 35500 62000
## 37 14 10 78 35500 62000
## 38 30 10 78 35500 62000
Missouri Kansas City, St. Louis, Springfield
getIndeedJobData5pages("massage therapist","Kansas City","MO")
## [[1]]
## jobTitle
## 1 Massage Therapist Guaranteed Pay and Hiring Bonus
## 2 Massage Therapist - Signing Bonus
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist ($1,500 Sign on Bonus)
## 6 Licensed Massage Therapist - Passionate Healer
## 7 Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 18 Massage Therapist - Signing Bonus
## 19 Massage Therapist ($1,500 Sign on Bonus)
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist (LMT)
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Professional Massage Therapist
## 25 Massage Therapist Guaranteed Pay and Hiring Bonus
## 26 LifeSpa-Massage Therapist
## 27 Life Spa Massage Therapist
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 LEAD Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist with Hiring Bonus
## 34 Massage Therapist Guaranteed Pay and Hiring Bonus
## 35 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 36 Massage Therapist
## 37 Licensed Massage Therapist with Hiring Bonus
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist (LMT)
## 40 Massage Therapist - Signing Bonus
## 41 Massage Therapist ($1,500 Sign on Bonus)
## 42 Licensed Massage Therapist
## 43 Full Time Massage Therapist (No MBLEx required)
## 44 Dual Licensed Therapist - Massage and Skincare
## 45 Hair, Skin, Nails and Massage Professional
## 46 Massage Therapist Guaranteed Pay and Hiring Bonus
## 47 Massage Therapist Guaranteed Pay and Hiring Bonus
## 48 LifeSpa-Massage Therapist
## 49 Life Spa Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 LEAD Massage Therapist
## 54 Full Time Massage Therapist (No MBLEx required)
## 55 Dual Licensed Therapist - Massage and Skincare
## 56 Hair, Skin, Nails and Massage Professional
## 57 Massage Therapist
## 58 Licensed Massage Therapist with Hiring Bonus
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist (LMT)
## 61 Licensed Massage Therapist
## 62 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 63 Massage Therapist - Signing Bonus
## 64 Massage Therapist ($1,500 Sign on Bonus)
## 65 Massage Therapist Guaranteed Pay and Hiring Bonus
## 66 Massage Therapist Guaranteed Pay and Hiring Bonus
## 67 LifeSpa-Massage Therapist
## 68 Life Spa Massage Therapist
## 69 Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage Therapist
## 72 LEAD Massage Therapist
## 73 Full Time Massage Therapist (No MBLEx required)
## 74 Dual Licensed Therapist - Massage and Skincare
## 75 Hair, Skin, Nails and Massage Professional
## 76 Massage Therapist
## 77 Licensed Massage Therapist with Hiring Bonus
## 78 Licensed Massage Therapist
## 79 Licensed Massage Therapist (LMT)
## 80 Licensed Massage Therapist
## 81 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 82 Massage Therapist - Signing Bonus
## 83 Massage Therapist ($1,500 Sign on Bonus)
## 84 Massage Therapist Guaranteed Pay and Hiring Bonus
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30 - $45 an hour $30 - $45 30 45
## 2 \n$20 - $35 an hour $20 - $35 20 35
## 3 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 4 \n$30 - $50 an hour $30 - $50 30 50
## 5 \n$30 - $45 an hour $30 - $45 30 45
## 6 \n$35 - $50 an hour $35 - $50 35 50
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$40,000 - $52,000 a year ++ $40000 - $52000 40000 52000
## 9 \n$30 - $45 an hour $30 - $45 30 45
## 10 \n$25 - $30 an hour $25 - $30 25 30
## 11 \n$25 - $50 an hour ++ $25 - $50 25 50
## 12 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 13 \n$30 - $45 an hour $30 - $45 30 45
## 14 \n$30 - $50 an hour $30 - $50 30 50
## 15 \n$20 - $35 an hour $20 - $35 20 35
## 16 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 17 \n$26 - $40 an hour $26 - $40 26 40
## 18 \n$35 - $50 an hour $35 - $50 35 50
## 19 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 21 \n$35 - $50 an hour $35 - $50 35 50
## 22 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 23 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 24 \n$30 - $45 an hour $30 - $45 30 45
## 25 \n$30 - $50 an hour $30 - $50 30 50
## 26 \n$20 - $35 an hour $20 - $35 20 35
## 27 \n$35 - $50 an hour $35 - $50 35 50
## 28 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 29 \n$20 - $35 an hour $20 - $35 20 35
## 30 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 31 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 32 \n$30 - $45 an hour $30 - $45 30 45
## 33 \n$30 - $50 an hour $30 - $50 30 50
## 34 \n$35 - $50 an hour $35 - $50 35 50
## 35 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 36 \n$20 - $35 an hour $20 - $35 20 35
## 37 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 38 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 39 \n$30 - $45 an hour $30 - $45 30 45
## 40 \n$30 - $50 an hour $30 - $50 30 50
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 32.5 50 16092.77 18110.26 20
## 2 32.5 50 16092.77 18110.26 20
## 3 32.5 50 16092.77 18110.26 20
## 4 32.5 50 16092.77 18110.26 20
## 5 32.5 50 16092.77 18110.26 20
## 6 32.5 50 16092.77 18110.26 20
## 7 32.5 50 16092.77 18110.26 20
## 8 32.5 50 16092.77 18110.26 20
## 9 32.5 50 16092.77 18110.26 20
## 10 32.5 50 16092.77 18110.26 20
## 11 32.5 50 16092.77 18110.26 20
## 12 32.5 50 16092.77 18110.26 20
## 13 32.5 50 16092.77 18110.26 20
## 14 32.5 50 16092.77 18110.26 20
## 15 32.5 50 16092.77 18110.26 20
## 16 32.5 50 16092.77 18110.26 20
## 17 32.5 50 16092.77 18110.26 20
## 18 32.5 50 16092.77 18110.26 20
## 19 32.5 50 16092.77 18110.26 20
## 20 32.5 50 16092.77 18110.26 20
## 21 32.5 50 16092.77 18110.26 20
## 22 32.5 50 16092.77 18110.26 20
## 23 32.5 50 16092.77 18110.26 20
## 24 32.5 50 16092.77 18110.26 20
## 25 32.5 50 16092.77 18110.26 20
## 26 32.5 50 16092.77 18110.26 20
## 27 32.5 50 16092.77 18110.26 20
## 28 32.5 50 16092.77 18110.26 20
## 29 32.5 50 16092.77 18110.26 20
## 30 32.5 50 16092.77 18110.26 20
## 31 32.5 50 16092.77 18110.26 20
## 32 32.5 50 16092.77 18110.26 20
## 33 32.5 50 16092.77 18110.26 20
## 34 32.5 50 16092.77 18110.26 20
## 35 32.5 50 16092.77 18110.26 20
## 36 32.5 50 16092.77 18110.26 20
## 37 32.5 50 16092.77 18110.26 20
## 38 32.5 50 16092.77 18110.26 20
## 39 32.5 50 16092.77 18110.26 20
## 40 32.5 50 16092.77 18110.26 20
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
## 31 60000
## 32 60000
## 33 60000
## 34 60000
## 35 60000
## 36 60000
## 37 60000
## 38 60000
## 39 60000
## 40 60000
##
## [[3]]
## date_daysAgo
## 1 4
## 2 30
## 3 2
## 4 30
## 5 11
## 6 2
## 7 30
## 8 30
## 9 30
## 10 17
## 11 Today
## 12 1
## 13 8
## 14 30
## 15 12
## 16 30
## 17 22
## 18 30
## 19 11
## 20 2
## 21 30
## 22 6
## 23 18
## 24 30
## 25 30
## 26 30
## 27 30
## 28 30
## 29 30
## 30 28
## 31 30
## 32 30
## 33 14
## 34 4
## 35 22
## 36 30
## 37 14
## 38 30
## 39 30
## 40 30
## 41 11
## 42 2
## 43 21
## 44 30
## 45 30
## 46 4
## 47 30
## 48 30
## 49 30
## 50 30
## 51 30
## 52 28
## 53 30
## 54 21
## 55 30
## 56 30
## 57 30
## 58 14
## 59 2
## 60 30
## 61 30
## 62 22
## 63 30
## 64 11
## 65 4
## 66 30
## 67 30
## 68 30
## 69 30
## 70 30
## 71 28
## 72 30
## 73 21
## 74 30
## 75 30
## 76 30
## 77 14
## 78 2
## 79 30
## 80 30
## 81 22
## 82 30
## 83 11
## 84 4
##
## [[4]]
## HiringAgency
## 1 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 2 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 3 The Spring in Winter LLCOverland Park, KS 66212
## 4 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 5 Massage Heights3.1Kansas City, MO 64157
## 6 Ramsey InsightKansas City, MO
## 7 Zen Massage3.5Lee's Summit, MO 64063
## 8 Raintree Medical and Chiropractic CenterLees Summit, MO
## 9 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 10 Indo-Pak Massage TherapyKansas City, MO•Remote work available
## 11 Massage Heights - Ward Parkway3.1Kansas City, MO 64114+2 locations
## 12 Ramsey InsightLeawood, KS
## 13 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 14 Hampton ChiropracticBelton, MO 64012
## 15 Massage Heights3.1Kansas City, MO 64158+2 locations
## 16 Raintree Medical and Chiropractic CenterLees Summit, MO
## 17 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 18 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 19 Massage Heights3.1Kansas City, MO 64157
## 20 The Spring in Winter LLCOverland Park, KS 66212
## 21 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 22 Alliance Physical Therapy Partners4.6Shawnee, KS 66226
## 23 Chateau AvalonKansas City, KS 66111
## 24 Ultimate Escape Day Spa4.0Overland Park, KS 66221
## 25 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 26 Life Time3.6Overland Park, KS 66223
## 27 Life Time3.6Lenexa, KS 66219
## 28 Massage Envy3.2Leawood, KS 66209+3 locations
## 29 Natural Way ChiropracticOverland Park, KS 66212
## 30 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 31 Massage Heights3.1Overland Park, KS 66210
## 32 Zen Massage3.5Lee's Summit, MO 64063
## 33 Massage Heights Overland Park3.1Overland Park, KS 66210
## 34 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 35 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 36 Zen Massage3.5Lee's Summit, MO 64063
## 37 Massage Heights Overland Park3.1Overland Park, KS 66210
## 38 Raintree Medical and Chiropractic CenterLees Summit, MO
## 39 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 40 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 41 Massage Heights3.1Kansas City, MO 64157
## 42 The Spring in Winter LLCOverland Park, KS 66212
## 43 Massage Envy3.2Lenexa, KS 66215
## 44 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 45 Par Exsalonce3.6Overland Park, KS 66214
## 46 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 47 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 48 Life Time3.6Overland Park, KS 66223
## 49 Life Time3.6Lenexa, KS 66219
## 50 Massage Envy3.2Leawood, KS 66209+3 locations
## 51 Natural Way ChiropracticOverland Park, KS 66212
## 52 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 53 Massage Heights3.1Overland Park, KS 66210
## 54 Massage Envy3.2Lenexa, KS 66215
## 55 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 56 Par Exsalonce3.6Overland Park, KS 66214
## 57 Zen Massage3.5Lee's Summit, MO 64063
## 58 Massage Heights Overland Park3.1Overland Park, KS 66210
## 59 The Spring in Winter LLCOverland Park, KS 66212
## 60 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 61 Raintree Medical and Chiropractic CenterLees Summit, MO
## 62 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 63 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 64 Massage Heights3.1Kansas City, MO 64157
## 65 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 66 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 67 Life Time3.6Overland Park, KS 66223
## 68 Life Time3.6Lenexa, KS 66219
## 69 Massage Envy3.2Leawood, KS 66209+3 locations
## 70 Natural Way ChiropracticOverland Park, KS 66212
## 71 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 72 Massage Heights3.1Overland Park, KS 66210
## 73 Massage Envy3.2Lenexa, KS 66215
## 74 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 75 Par Exsalonce3.6Overland Park, KS 66214
## 76 Zen Massage3.5Lee's Summit, MO 64063
## 77 Massage Heights Overland Park3.1Overland Park, KS 66210
## 78 The Spring in Winter LLCOverland Park, KS 66212
## 79 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 80 Raintree Medical and Chiropractic CenterLees Summit, MO
## 81 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 82 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 83 Massage Heights3.1Kansas City, MO 64157
## 84 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 8 \n$40,000 - $52,000 a year ++ $40000 - $52000 40000 52000
## 12 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 16 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 19 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 22 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 23 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 28 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 30 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 31 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 35 \n$42,000 - $50,000 a year $42000 - $50000 42000 50000
## 37 \n$50,000 - $60,000 a year $50000 - $60000 50000 60000
## 38 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 45000 60000 45571.43 56571.43 40000
## 8 45000 60000 45571.43 56571.43 40000
## 12 45000 60000 45571.43 56571.43 40000
## 16 45000 60000 45571.43 56571.43 40000
## 19 45000 60000 45571.43 56571.43 40000
## 20 45000 60000 45571.43 56571.43 40000
## 22 45000 60000 45571.43 56571.43 40000
## 23 45000 60000 45571.43 56571.43 40000
## 28 45000 60000 45571.43 56571.43 40000
## 30 45000 60000 45571.43 56571.43 40000
## 31 45000 60000 45571.43 56571.43 40000
## 35 45000 60000 45571.43 56571.43 40000
## 37 45000 60000 45571.43 56571.43 40000
## 38 45000 60000 45571.43 56571.43 40000
## maximumMaxSalary
## 3 60000
## 8 60000
## 12 60000
## 16 60000
## 19 60000
## 20 60000
## 22 60000
## 23 60000
## 28 60000
## 30 60000
## 31 60000
## 35 60000
## 37 60000
## 38 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 - $45 an hour $30 - $45 30 45 30
## 2 \n$20 - $35 an hour $20 - $35 20 35 30
## 4 \n$30 - $50 an hour $30 - $50 30 50 30
## 5 \n$30 - $45 an hour $30 - $45 30 45 30
## 6 \n$35 - $50 an hour $35 - $50 35 50 30
## 9 \n$30 - $45 an hour $30 - $45 30 45 30
## 10 \n$25 - $30 an hour $25 - $30 25 30 30
## 11 \n$25 - $50 an hour ++ $25 - $50 25 50 30
## 13 \n$30 - $45 an hour $30 - $45 30 45 30
## 14 \n$30 - $50 an hour $30 - $50 30 50 30
## 15 \n$20 - $35 an hour $20 - $35 20 35 30
## 17 \n$26 - $40 an hour $26 - $40 26 40 30
## 18 \n$35 - $50 an hour $35 - $50 35 50 30
## 21 \n$35 - $50 an hour $35 - $50 35 50 30
## 24 \n$30 - $45 an hour $30 - $45 30 45 30
## 25 \n$30 - $50 an hour $30 - $50 30 50 30
## 26 \n$20 - $35 an hour $20 - $35 20 35 30
## 27 \n$35 - $50 an hour $35 - $50 35 50 30
## 29 \n$20 - $35 an hour $20 - $35 20 35 30
## 32 \n$30 - $45 an hour $30 - $45 30 45 30
## 33 \n$30 - $50 an hour $30 - $50 30 50 30
## 34 \n$35 - $50 an hour $35 - $50 35 50 30
## 36 \n$20 - $35 an hour $20 - $35 20 35 30
## 39 \n$30 - $45 an hour $30 - $45 30 45 30
## 40 \n$30 - $50 an hour $30 - $50 30 50 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 28.44 44.4 20 50
## 2 45 28.44 44.4 20 50
## 4 45 28.44 44.4 20 50
## 5 45 28.44 44.4 20 50
## 6 45 28.44 44.4 20 50
## 9 45 28.44 44.4 20 50
## 10 45 28.44 44.4 20 50
## 11 45 28.44 44.4 20 50
## 13 45 28.44 44.4 20 50
## 14 45 28.44 44.4 20 50
## 15 45 28.44 44.4 20 50
## 17 45 28.44 44.4 20 50
## 18 45 28.44 44.4 20 50
## 21 45 28.44 44.4 20 50
## 24 45 28.44 44.4 20 50
## 25 45 28.44 44.4 20 50
## 26 45 28.44 44.4 20 50
## 27 45 28.44 44.4 20 50
## 29 45 28.44 44.4 20 50
## 32 45 28.44 44.4 20 50
## 33 45 28.44 44.4 20 50
## 34 45 28.44 44.4 20 50
## 36 45 28.44 44.4 20 50
## 39 45 28.44 44.4 20 50
## 40 45 28.44 44.4 20 50
##
## [[7]]
## city state
## 1 Kansas City MO
## 2 Kansas City MO
## 3 Kansas City MO
## 4 Kansas City MO
## 5 Kansas City MO
## 6 Kansas City MO
## 7 Kansas City MO
## 8 Kansas City MO
## 9 Kansas City MO
## 10 Kansas City MO
## 11 Kansas City MO
## 12 Kansas City MO
## 13 Kansas City MO
## 14 Kansas City MO
## 15 Kansas City MO
## 16 Kansas City MO
## 17 Kansas City MO
## 18 Kansas City MO
## 19 Kansas City MO
## 20 Kansas City MO
## 21 Kansas City MO
## 22 Kansas City MO
## 23 Kansas City MO
## 24 Kansas City MO
## 25 Kansas City MO
## 26 Kansas City MO
## 27 Kansas City MO
## 28 Kansas City MO
## 29 Kansas City MO
## 30 Kansas City MO
## 31 Kansas City MO
## 32 Kansas City MO
## 33 Kansas City MO
## 34 Kansas City MO
## 35 Kansas City MO
## 36 Kansas City MO
## 37 Kansas City MO
## 38 Kansas City MO
## 39 Kansas City MO
## 40 Kansas City MO
## 41 Kansas City MO
## 42 Kansas City MO
## 43 Kansas City MO
## 44 Kansas City MO
## 45 Kansas City MO
## 46 Kansas City MO
## 47 Kansas City MO
## 48 Kansas City MO
## 49 Kansas City MO
## 50 Kansas City MO
## 51 Kansas City MO
## 52 Kansas City MO
## 53 Kansas City MO
## 54 Kansas City MO
## 55 Kansas City MO
## 56 Kansas City MO
## 57 Kansas City MO
## 58 Kansas City MO
## 59 Kansas City MO
## 60 Kansas City MO
## 61 Kansas City MO
## 62 Kansas City MO
## 63 Kansas City MO
## 64 Kansas City MO
## 65 Kansas City MO
## 66 Kansas City MO
## 67 Kansas City MO
## 68 Kansas City MO
## 69 Kansas City MO
## 70 Kansas City MO
## 71 Kansas City MO
## 72 Kansas City MO
## 73 Kansas City MO
## 74 Kansas City MO
## 75 Kansas City MO
## 76 Kansas City MO
## 77 Kansas City MO
## 78 Kansas City MO
## 79 Kansas City MO
## 80 Kansas City MO
## 81 Kansas City MO
## 82 Kansas City MO
## 83 Kansas City MO
## 84 Kansas City MO
## jobTitle
## 1 Massage Therapist Guaranteed Pay and Hiring Bonus
## 2 Massage Therapist - Signing Bonus
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist ($1,500 Sign on Bonus)
## 6 Licensed Massage Therapist - Passionate Healer
## 7 Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 18 Massage Therapist - Signing Bonus
## 19 Massage Therapist ($1,500 Sign on Bonus)
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist (LMT)
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Professional Massage Therapist
## 25 Massage Therapist Guaranteed Pay and Hiring Bonus
## 26 LifeSpa-Massage Therapist
## 27 Life Spa Massage Therapist
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 LEAD Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist with Hiring Bonus
## 34 Massage Therapist Guaranteed Pay and Hiring Bonus
## 35 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 36 Massage Therapist
## 37 Licensed Massage Therapist with Hiring Bonus
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist (LMT)
## 40 Massage Therapist - Signing Bonus
## 41 Massage Therapist ($1,500 Sign on Bonus)
## 42 Licensed Massage Therapist
## 43 Full Time Massage Therapist (No MBLEx required)
## 44 Dual Licensed Therapist - Massage and Skincare
## 45 Hair, Skin, Nails and Massage Professional
## 46 Massage Therapist Guaranteed Pay and Hiring Bonus
## 47 Massage Therapist Guaranteed Pay and Hiring Bonus
## 48 LifeSpa-Massage Therapist
## 49 Life Spa Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 LEAD Massage Therapist
## 54 Full Time Massage Therapist (No MBLEx required)
## 55 Dual Licensed Therapist - Massage and Skincare
## 56 Hair, Skin, Nails and Massage Professional
## 57 Massage Therapist
## 58 Licensed Massage Therapist with Hiring Bonus
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist (LMT)
## 61 Licensed Massage Therapist
## 62 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 63 Massage Therapist - Signing Bonus
## 64 Massage Therapist ($1,500 Sign on Bonus)
## 65 Massage Therapist Guaranteed Pay and Hiring Bonus
## 66 Massage Therapist Guaranteed Pay and Hiring Bonus
## 67 LifeSpa-Massage Therapist
## 68 Life Spa Massage Therapist
## 69 Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage Therapist
## 72 LEAD Massage Therapist
## 73 Full Time Massage Therapist (No MBLEx required)
## 74 Dual Licensed Therapist - Massage and Skincare
## 75 Hair, Skin, Nails and Massage Professional
## 76 Massage Therapist
## 77 Licensed Massage Therapist with Hiring Bonus
## 78 Licensed Massage Therapist
## 79 Licensed Massage Therapist (LMT)
## 80 Licensed Massage Therapist
## 81 Hiring 2+ Full Time Massage Therapists - No MBLEx required i...
## 82 Massage Therapist - Signing Bonus
## 83 Massage Therapist ($1,500 Sign on Bonus)
## 84 Massage Therapist Guaranteed Pay and Hiring Bonus
## HiringAgency
## 1 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 2 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 3 The Spring in Winter LLCOverland Park, KS 66212
## 4 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 5 Massage Heights3.1Kansas City, MO 64157
## 6 Ramsey InsightKansas City, MO
## 7 Zen Massage3.5Lee's Summit, MO 64063
## 8 Raintree Medical and Chiropractic CenterLees Summit, MO
## 9 WTS International3.3Kansas City, MO 64108 (Crown Center area)
## 10 Indo-Pak Massage TherapyKansas City, MO•Remote work available
## 11 Massage Heights - Ward Parkway3.1Kansas City, MO 64114+2 locations
## 12 Ramsey InsightLeawood, KS
## 13 Ki Chi Healing Arts CenterLees Summit, MO 64063
## 14 Hampton ChiropracticBelton, MO 64012
## 15 Massage Heights3.1Kansas City, MO 64158+2 locations
## 16 Raintree Medical and Chiropractic CenterLees Summit, MO
## 17 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 18 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 19 Massage Heights3.1Kansas City, MO 64157
## 20 The Spring in Winter LLCOverland Park, KS 66212
## 21 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 22 Alliance Physical Therapy Partners4.6Shawnee, KS 66226
## 23 Chateau AvalonKansas City, KS 66111
## 24 Ultimate Escape Day Spa4.0Overland Park, KS 66221
## 25 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 26 Life Time3.6Overland Park, KS 66223
## 27 Life Time3.6Lenexa, KS 66219
## 28 Massage Envy3.2Leawood, KS 66209+3 locations
## 29 Natural Way ChiropracticOverland Park, KS 66212
## 30 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 31 Massage Heights3.1Overland Park, KS 66210
## 32 Zen Massage3.5Lee's Summit, MO 64063
## 33 Massage Heights Overland Park3.1Overland Park, KS 66210
## 34 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 35 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 36 Zen Massage3.5Lee's Summit, MO 64063
## 37 Massage Heights Overland Park3.1Overland Park, KS 66210
## 38 Raintree Medical and Chiropractic CenterLees Summit, MO
## 39 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 40 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 41 Massage Heights3.1Kansas City, MO 64157
## 42 The Spring in Winter LLCOverland Park, KS 66212
## 43 Massage Envy3.2Lenexa, KS 66215
## 44 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 45 Par Exsalonce3.6Overland Park, KS 66214
## 46 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 47 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 48 Life Time3.6Overland Park, KS 66223
## 49 Life Time3.6Lenexa, KS 66219
## 50 Massage Envy3.2Leawood, KS 66209+3 locations
## 51 Natural Way ChiropracticOverland Park, KS 66212
## 52 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 53 Massage Heights3.1Overland Park, KS 66210
## 54 Massage Envy3.2Lenexa, KS 66215
## 55 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 56 Par Exsalonce3.6Overland Park, KS 66214
## 57 Zen Massage3.5Lee's Summit, MO 64063
## 58 Massage Heights Overland Park3.1Overland Park, KS 66210
## 59 The Spring in Winter LLCOverland Park, KS 66212
## 60 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 61 Raintree Medical and Chiropractic CenterLees Summit, MO
## 62 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 63 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 64 Massage Heights3.1Kansas City, MO 64157
## 65 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## 66 Massage Heights3.1Independence, MO 64057 (Blackburn area)+1 location
## 67 Life Time3.6Overland Park, KS 66223
## 68 Life Time3.6Lenexa, KS 66219
## 69 Massage Envy3.2Leawood, KS 66209+3 locations
## 70 Natural Way ChiropracticOverland Park, KS 66212
## 71 Genesis Health Clubs2.9Overland Park, KS 66211+1 location
## 72 Massage Heights3.1Overland Park, KS 66210
## 73 Massage Envy3.2Lenexa, KS 66215
## 74 Massage Heights3.1Kansas City, MO 64114 (Western Hills area)
## 75 Par Exsalonce3.6Overland Park, KS 66214
## 76 Zen Massage3.5Lee's Summit, MO 64063
## 77 Massage Heights Overland Park3.1Overland Park, KS 66210
## 78 The Spring in Winter LLCOverland Park, KS 66212
## 79 Hand and Stone Massage and Facial Spa Kansas CityLiberty, MO 64068
## 80 Raintree Medical and Chiropractic CenterLees Summit, MO
## 81 Massage Envy Lenexa/ShawneeLenexa, KS 66215
## 82 Massage Envy-Lee's SummitLee's Summit, MO 64081
## 83 Massage Heights3.1Kansas City, MO 64157
## 84 Massage Heights - Independence/Summit Fair3.1Lee's Summit, MO
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 4 20 50 40000 60000
## 2 30 20 50 40000 60000
## 3 2 20 50 40000 60000
## 4 30 20 50 40000 60000
## 5 11 20 50 40000 60000
## 6 2 20 50 40000 60000
## 7 30 20 50 40000 60000
## 8 30 20 50 40000 60000
## 9 30 20 50 40000 60000
## 10 17 20 50 40000 60000
## 11 Today 20 50 40000 60000
## 12 1 20 50 40000 60000
## 13 8 20 50 40000 60000
## 14 30 20 50 40000 60000
## 15 12 20 50 40000 60000
## 16 30 20 50 40000 60000
## 17 22 20 50 40000 60000
## 18 30 20 50 40000 60000
## 19 11 20 50 40000 60000
## 20 2 20 50 40000 60000
## 21 30 20 50 40000 60000
## 22 6 20 50 40000 60000
## 23 18 20 50 40000 60000
## 24 30 20 50 40000 60000
## 25 30 20 50 40000 60000
## 26 30 20 50 40000 60000
## 27 30 20 50 40000 60000
## 28 30 20 50 40000 60000
## 29 30 20 50 40000 60000
## 30 28 20 50 40000 60000
## 31 30 20 50 40000 60000
## 32 30 20 50 40000 60000
## 33 14 20 50 40000 60000
## 34 4 20 50 40000 60000
## 35 22 20 50 40000 60000
## 36 30 20 50 40000 60000
## 37 14 20 50 40000 60000
## 38 30 20 50 40000 60000
## 39 30 20 50 40000 60000
## 40 30 20 50 40000 60000
## 41 11 20 50 40000 60000
## 42 2 20 50 40000 60000
## 43 21 20 50 40000 60000
## 44 30 20 50 40000 60000
## 45 30 20 50 40000 60000
## 46 4 20 50 40000 60000
## 47 30 20 50 40000 60000
## 48 30 20 50 40000 60000
## 49 30 20 50 40000 60000
## 50 30 20 50 40000 60000
## 51 30 20 50 40000 60000
## 52 28 20 50 40000 60000
## 53 30 20 50 40000 60000
## 54 21 20 50 40000 60000
## 55 30 20 50 40000 60000
## 56 30 20 50 40000 60000
## 57 30 20 50 40000 60000
## 58 14 20 50 40000 60000
## 59 2 20 50 40000 60000
## 60 30 20 50 40000 60000
## 61 30 20 50 40000 60000
## 62 22 20 50 40000 60000
## 63 30 20 50 40000 60000
## 64 11 20 50 40000 60000
## 65 4 20 50 40000 60000
## 66 30 20 50 40000 60000
## 67 30 20 50 40000 60000
## 68 30 20 50 40000 60000
## 69 30 20 50 40000 60000
## 70 30 20 50 40000 60000
## 71 28 20 50 40000 60000
## 72 30 20 50 40000 60000
## 73 21 20 50 40000 60000
## 74 30 20 50 40000 60000
## 75 30 20 50 40000 60000
## 76 30 20 50 40000 60000
## 77 14 20 50 40000 60000
## 78 2 20 50 40000 60000
## 79 30 20 50 40000 60000
## 80 30 20 50 40000 60000
## 81 22 20 50 40000 60000
## 82 30 20 50 40000 60000
## 83 11 20 50 40000 60000
## 84 4 20 50 40000 60000
getIndeedJobData5pages("massage therapist","St. Louis","MO")
## Warning in getIndeedJobData5pages("massage therapist", "St. Louis", "MO"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "St. Louis", "MO"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "St. Louis", "MO"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist !!!Health Care Plan Available!!!
## 5 Licensed Massage Therapist - All Locations - $1200 Signing B...
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Mobile Massage Therapist
## 15 Massage Therapist (LMT) - part-time
## 16 Massage Therapist (Full Time)
## 17 Massage Therapist
## 18 Liscensed Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist - Signing Bonus!
## 22 Licensed Massage Therapist (LMT)
## 23 Licensed Massage Therapist (LMT)
## 24 Massage Therapist
## 25 Liscensed Massage Therapist
## 26 Licensed Massage Therapist - All Locations - $1200 Signing B...
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist !!!Health Care Plan Available!!!
## 31 Licensed Massage Therapist (LMT) - Part or Full Time
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Mobile Massage Therapist
## 35 Massage Therapist (LMT) - part-time
## 36 Massage Therapist (Full Time)
## 37 Massage Therapist Massage Envy Sunset Hills
## 38 Licensed Massage Therapist (LMT) - Part or Full Time
## 39 Massage Therapist
## 40 Massage Therapist - Creve Coeur
## 41 Massage Therapist
## 42 Massage Therapy
## 43 LifeSpa-Massage Therapist
## 44 Dual Massage Therapist & Esthetician
## 45 Massage Therapist - Flexible Hours
## 46 Licensed Massage Therapist
## 47 Massage Therapist Massage Envy Sunset Hills
## 48 Massage Therapist - Creve Coeur
## 49 Massage Therapist
## 50 Massage Therapy
## 51 LifeSpa-Massage Therapist
## 52 Dual Massage Therapist & Esthetician
## 53 Massage Therapist
## 54 Massage Therapist - Flexible Hours
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist - Signing Bonus!
## 58 Liscensed Massage Therapist
## 59 Licensed Massage Therapist - All Locations - $1200 Signing B...
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist (LMT)
## 62 Massage Therapist
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist
## 67 Mobile Massage Therapist
## 68 Massage Therapist (LMT) - part-time
## 69 Massage Therapist (Full Time)
## 70 Licensed Massage Therapist (LMT) - Part or Full Time
## 71 Massage Therapist
## 72 Massage Therapist Massage Envy Sunset Hills
## 73 Massage Therapist - Creve Coeur
## 74 Massage Therapist
## 75 Massage Therapy
## 76 LifeSpa-Massage Therapist
## 77 Dual Massage Therapist & Esthetician
## 78 Massage Therapist - Flexible Hours
## 79 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25,000 - $64,000 a year $25000 - $64000 25000 64000.0
## 2 \n$25 - $34 an hour $25 - $34 25 34.0
## 3 \n$20 - $25 an hour $20 - $25 20 25.0
## 4 \n$20.00 - $22.50 an hour $20.00 - $22.50 20 22.5
## 5 \n$28 - $40 an hour $28 - $40 28 40.0
## 6 \n$27 - $40 an hour $27 - $40 27 40.0
## 7 \n$25 - $27 an hour $25 - $27 25 27.0
## 8 \n$62,000 a year $62000 62000 NA
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000.0
## 10 \n$20 - $25 an hour $20 - $25 20 25.0
## 11 \n$31,247 - $45,590 a year $31247 - $45590 31247 45590.0
## 12 \n$45 - $70 an hour $45 - $70 45 70.0
## 13 \n$30,247 - $45,000 a year $30247 - $45000 30247 45000.0
## 14 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000.0
## 15 \n$35 an hour ++ $35 35 NA
## 16 \n$28 - $40 an hour $28 - $40 28 40.0
## 17 \n$20,000 - $50,000 a year $20000 - $50000 20000 50000.0
## 18 \n$25 - $34 an hour $25 - $34 25 34.0
## 19 \n$35 an hour ++ $35 35 NA
## 20 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000.0
## 21 \n$20 - $25 an hour $20 - $25 20 25.0
## 22 \n$20 an hour $20 20 NA
## 23 \n$25,000 - $64,000 a year $25000 - $64000 25000 64000.0
## 24 \n$20.00 - $22.50 an hour $20.00 - $22.50 20 22.5
## 25 \n$20 - $25 an hour $20 - $25 20 25.0
## 26 \n$31,247 - $45,590 a year $31247 - $45590 31247 45590.0
## 27 \n$45 - $70 an hour $45 - $70 45 70.0
## 28 \n$31,247 - $45,000 a year $31247 - $45000 31247 45000.0
## 29 \n$20 an hour $20 20 NA
## 30 \n$18 - $22 an hour $18 - $22 18 22.0
## 31 \n$20 an hour $20 20 NA
## 32 \n$28 - $40 an hour $28 - $40 28 40.0
## 33 \n$20,000 - $50,000 a year $20000 - $50000 20000 50000.0
## 34 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000.0
## 35 \n$20 - $25 an hour $20 - $25 20 25.0
## 36 \n$35 an hour ++ $35 35 NA
## 37 \n$25 - $34 an hour $25 - $34 25 34.0
## 38 \n$25,000 - $64,000 a year $25000 - $64000 25000 64000.0
## 39 \n$20 - $25 an hour $20 - $25 20 25.0
## 40 \n$31,247 - $45,590 a year $31247 - $45590 31247 45590.0
## 41 \n$45 - $70 an hour $45 - $70 45 70.0
## 42 \n$31,247 - $45,000 a year $31247 - $45000 31247 45000.0
## 43 \n$20 an hour $20 20 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 40 11585.84 16162.53 18
## 2 35 40 11585.84 16162.53 18
## 3 35 40 11585.84 16162.53 18
## 4 35 40 11585.84 16162.53 18
## 5 35 40 11585.84 16162.53 18
## 6 35 40 11585.84 16162.53 18
## 7 35 40 11585.84 16162.53 18
## 8 35 40 11585.84 16162.53 18
## 9 35 40 11585.84 16162.53 18
## 10 35 40 11585.84 16162.53 18
## 11 35 40 11585.84 16162.53 18
## 12 35 40 11585.84 16162.53 18
## 13 35 40 11585.84 16162.53 18
## 14 35 40 11585.84 16162.53 18
## 15 35 40 11585.84 16162.53 18
## 16 35 40 11585.84 16162.53 18
## 17 35 40 11585.84 16162.53 18
## 18 35 40 11585.84 16162.53 18
## 19 35 40 11585.84 16162.53 18
## 20 35 40 11585.84 16162.53 18
## 21 35 40 11585.84 16162.53 18
## 22 35 40 11585.84 16162.53 18
## 23 35 40 11585.84 16162.53 18
## 24 35 40 11585.84 16162.53 18
## 25 35 40 11585.84 16162.53 18
## 26 35 40 11585.84 16162.53 18
## 27 35 40 11585.84 16162.53 18
## 28 35 40 11585.84 16162.53 18
## 29 35 40 11585.84 16162.53 18
## 30 35 40 11585.84 16162.53 18
## 31 35 40 11585.84 16162.53 18
## 32 35 40 11585.84 16162.53 18
## 33 35 40 11585.84 16162.53 18
## 34 35 40 11585.84 16162.53 18
## 35 35 40 11585.84 16162.53 18
## 36 35 40 11585.84 16162.53 18
## 37 35 40 11585.84 16162.53 18
## 38 35 40 11585.84 16162.53 18
## 39 35 40 11585.84 16162.53 18
## 40 35 40 11585.84 16162.53 18
## 41 35 40 11585.84 16162.53 18
## 42 35 40 11585.84 16162.53 18
## 43 35 40 11585.84 16162.53 18
## maximumMaxSalary
## 1 64000
## 2 64000
## 3 64000
## 4 64000
## 5 64000
## 6 64000
## 7 64000
## 8 64000
## 9 64000
## 10 64000
## 11 64000
## 12 64000
## 13 64000
## 14 64000
## 15 64000
## 16 64000
## 17 64000
## 18 64000
## 19 64000
## 20 64000
## 21 64000
## 22 64000
## 23 64000
## 24 64000
## 25 64000
## 26 64000
## 27 64000
## 28 64000
## 29 64000
## 30 64000
## 31 64000
## 32 64000
## 33 64000
## 34 64000
## 35 64000
## 36 64000
## 37 64000
## 38 64000
## 39 64000
## 40 64000
## 41 64000
## 42 64000
## 43 64000
##
## [[3]]
## date_daysAgo
## 1 10
## 2 30
## 3 5
## 4 30
## 5 21
## 6 30
## 7 30
## 8 5
## 9 30
## 10 10
## 11 25
## 12 30
## 13 6
## 14 25
## 15 30
## 16 30
## 17 6
## 18 15
## 19 30
## 20 30
## 21 30
## 22 30
## 23 30
## 24 30
## 25 15
## 26 21
## 27 5
## 28 30
## 29 10
## 30 30
## 31 30
## 32 30
## 33 6
## 34 25
## 35 30
## 36 30
## 37 4
## 38 30
## 39 6
## 40 30
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 4
## 48 30
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 15
## 59 21
## 60 5
## 61 30
## 62 30
## 63 30
## 64 10
## 65 30
## 66 6
## 67 25
## 68 30
## 69 30
## 70 30
## 71 6
## 72 4
## 73 30
## 74 30
## 75 30
## 76 30
## 77 30
## 78 30
## 79 30
##
## [[4]]
## HiringAgency
## 1 ELEMENTS MASSAGE3.6Chesterfield, MO 63017
## 2 NutriFormance- Fitness, Therapy and PerformanceFrontenac, MO 63131
## 3 Above & Beyond Wellness SpaFenton, MO 63026
## 4 Massage Envy Manchester3.2Manchester, MO 63011
## 5 The Face & The Body Day Spa2.6St. Louis, MO
## 6 Massage Envy - Chesterfield and/or WildwoodChesterfield, MO
## 7 Stonewater Spa, Salon, & BoutiqueSt. Louis, MO 63131
## 8 STL Downtown SpaSt. Louis, MO 63103
## 9 NutriFormance, LLCFrontenac, MO 63131
## 10 Elements3.6Chesterfield, MO 63017+2 locations
## 11 Indo-Pak Massage TherapySt. Louis, MO•Remote work available
## 12 Midwest Physicians GroupSt. Louis, MO
## 13 MassageLuXe FenotnFenton, MO 63026
## 14 Indo-Pak Massage TherapySt. Louis, MO
## 15 PALM Health4.0St. Louis, MO 63124
## 16 Life Time3.6Frontenac, MO 63131
## 17 MassageLuXe South County3.0St. Louis, MO 63123
## 18 Elements Massage St Peters Missouri3.6Saint Peters, MO 63304
## 19 MassageLuxeSt. Louis, MO
## 20 Massage Envy - Chesterfield and/or WildwoodChesterfield, MO
## 21 MassageLuXe - Fairview Heights3.0Fairview Heights, IL 62208
## 22 Stonewater Spa, Salon, & BoutiqueSt. Louis, MO 63131
## 23 NutriFormance- Fitness, Therapy and PerformanceFrontenac, MO 63131
## 24 MassageLuxeSt. Louis, MO
## 25 Elements Massage St Peters Missouri3.6Saint Peters, MO 63304
## 26 The Face & The Body Day Spa2.6St. Louis, MO
## 27 Above & Beyond Wellness SpaFenton, MO 63026
## 28 Massage Envy3.2Manchester, MO 63011
## 29 ELEMENTS MASSAGE3.6Chesterfield, MO 63017
## 30 Massage Envy Manchester3.2Manchester, MO 63011
## 31 Shipley ChiropracticGranite City, IL 62040
## 32 Midwest Physicians GroupSt. Louis, MO
## 33 MassageLuXe FenotnFenton, MO 63026
## 34 Indo-Pak Massage TherapySt. Louis, MO
## 35 PALM Health4.0St. Louis, MO 63124
## 36 Life Time3.6Frontenac, MO 63131
## 37 Massage Envy3.2Sunset Hills, MO+9 locations
## 38 Shipley ChiropracticGranite City, IL 62040
## 39 MassageLuXe ManchesterManchester, MO 63011
## 40 St. Louis Jewish Community Center4.5St. Louis, MO
## 41 Jewish Community Center St. LouisCreve Coeur, MO
## 42 NutriFormance4.6St. Louis, MO 63131
## 43 Life Time3.6Chesterfield, MO
## 44 PALM Health4.0St. Louis, MO 63124
## 45 Massage Envy3.2Clayton, MO 63105
## 46 Massage Envy3.2Manchester, MO 63011
## 47 Massage Envy3.2Sunset Hills, MO+9 locations
## 48 St. Louis Jewish Community Center4.5St. Louis, MO
## 49 Jewish Community Center St. LouisCreve Coeur, MO
## 50 NutriFormance4.6St. Louis, MO 63131
## 51 Life Time3.6Chesterfield, MO
## 52 PALM Health4.0St. Louis, MO 63124
## 53 Elements Massage3.6Richmond Heights, MO 63117
## 54 Massage Envy3.2Clayton, MO 63105
## 55 Massage Envy3.2Manchester, MO 63011
## 56 Massage Envy - Chesterfield and/or WildwoodChesterfield, MO
## 57 MassageLuXe - Fairview Heights3.0Fairview Heights, IL 62208
## 58 Elements Massage St Peters Missouri3.6Saint Peters, MO 63304
## 59 The Face & The Body Day Spa2.6St. Louis, MO
## 60 Above & Beyond Wellness SpaFenton, MO 63026
## 61 Stonewater Spa, Salon, & BoutiqueSt. Louis, MO 63131
## 62 MassageLuxeSt. Louis, MO
## 63 NutriFormance- Fitness, Therapy and PerformanceFrontenac, MO 63131
## 64 ELEMENTS MASSAGE3.6Chesterfield, MO 63017
## 65 Midwest Physicians GroupSt. Louis, MO
## 66 MassageLuXe FenotnFenton, MO 63026
## 67 Indo-Pak Massage TherapySt. Louis, MO
## 68 PALM Health4.0St. Louis, MO 63124
## 69 Life Time3.6Frontenac, MO 63131
## 70 Shipley ChiropracticGranite City, IL 62040
## 71 MassageLuXe ManchesterManchester, MO 63011
## 72 Massage Envy3.2Sunset Hills, MO+9 locations
## 73 St. Louis Jewish Community Center4.5St. Louis, MO
## 74 Jewish Community Center St. LouisCreve Coeur, MO
## 75 NutriFormance4.6St. Louis, MO 63131
## 76 Life Time3.6Chesterfield, MO
## 77 PALM Health4.0St. Louis, MO 63124
## 78 Massage Envy3.2Clayton, MO 63105
## 79 Massage Envy3.2Manchester, MO 63011
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$25,000 - $64,000 a year $25000 - $64000 25000 64000
## 8 \n$62,000 a year $62000 62000 NA
## 11 \n$31,247 - $45,590 a year $31247 - $45590 31247 45590
## 13 \n$30,247 - $45,000 a year $30247 - $45000 30247 45000
## 14 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 17 \n$20,000 - $50,000 a year $20000 - $50000 20000 50000
## 20 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 23 \n$25,000 - $64,000 a year $25000 - $64000 25000 64000
## 26 \n$31,247 - $45,590 a year $31247 - $45590 31247 45590
## 28 \n$31,247 - $45,000 a year $31247 - $45000 31247 45000
## 33 \n$20,000 - $50,000 a year $20000 - $50000 20000 50000
## 34 \n$43,000 - $62,000 a year $43000 - $62000 43000 62000
## 38 \n$25,000 - $64,000 a year $25000 - $64000 25000 64000
## 40 \n$31,247 - $45,590 a year $31247 - $45590 31247 45590
## 42 \n$31,247 - $45,000 a year $31247 - $45000 31247 45000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 31247 50000 32832.13 53555 20000
## 8 31247 50000 32832.13 53555 20000
## 11 31247 50000 32832.13 53555 20000
## 13 31247 50000 32832.13 53555 20000
## 14 31247 50000 32832.13 53555 20000
## 17 31247 50000 32832.13 53555 20000
## 20 31247 50000 32832.13 53555 20000
## 23 31247 50000 32832.13 53555 20000
## 26 31247 50000 32832.13 53555 20000
## 28 31247 50000 32832.13 53555 20000
## 33 31247 50000 32832.13 53555 20000
## 34 31247 50000 32832.13 53555 20000
## 38 31247 50000 32832.13 53555 20000
## 40 31247 50000 32832.13 53555 20000
## 42 31247 50000 32832.13 53555 20000
## maximumMaxSalary
## 1 64000
## 8 64000
## 11 64000
## 13 64000
## 14 64000
## 17 64000
## 20 64000
## 23 64000
## 26 64000
## 28 64000
## 33 64000
## 34 64000
## 38 64000
## 40 64000
## 42 64000
##
## [[6]]
## Salary salary minSalary maxSalary
## 2 \n$25 - $34 an hour $25 - $34 25 34.0
## 3 \n$20 - $25 an hour $20 - $25 20 25.0
## 4 \n$20.00 - $22.50 an hour $20.00 - $22.50 20 22.5
## 5 \n$28 - $40 an hour $28 - $40 28 40.0
## 6 \n$27 - $40 an hour $27 - $40 27 40.0
## 7 \n$25 - $27 an hour $25 - $27 25 27.0
## 10 \n$20 - $25 an hour $20 - $25 20 25.0
## 12 \n$45 - $70 an hour $45 - $70 45 70.0
## 15 \n$35 an hour ++ $35 35 NA
## 16 \n$28 - $40 an hour $28 - $40 28 40.0
## 18 \n$25 - $34 an hour $25 - $34 25 34.0
## 19 \n$35 an hour ++ $35 35 NA
## 21 \n$20 - $25 an hour $20 - $25 20 25.0
## 22 \n$20 an hour $20 20 NA
## 24 \n$20.00 - $22.50 an hour $20.00 - $22.50 20 22.5
## 25 \n$20 - $25 an hour $20 - $25 20 25.0
## 27 \n$45 - $70 an hour $45 - $70 45 70.0
## 29 \n$20 an hour $20 20 NA
## 30 \n$18 - $22 an hour $18 - $22 18 22.0
## 31 \n$20 an hour $20 20 NA
## 32 \n$28 - $40 an hour $28 - $40 28 40.0
## 35 \n$20 - $25 an hour $20 - $25 20 25.0
## 36 \n$35 an hour ++ $35 35 NA
## 37 \n$25 - $34 an hour $25 - $34 25 34.0
## 39 \n$20 - $25 an hour $20 - $25 20 25.0
## 41 \n$45 - $70 an hour $45 - $70 45 70.0
## 43 \n$20 an hour $20 20 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 25 30.5 26.25926 35.8 18
## 3 25 30.5 26.25926 35.8 18
## 4 25 30.5 26.25926 35.8 18
## 5 25 30.5 26.25926 35.8 18
## 6 25 30.5 26.25926 35.8 18
## 7 25 30.5 26.25926 35.8 18
## 10 25 30.5 26.25926 35.8 18
## 12 25 30.5 26.25926 35.8 18
## 15 25 30.5 26.25926 35.8 18
## 16 25 30.5 26.25926 35.8 18
## 18 25 30.5 26.25926 35.8 18
## 19 25 30.5 26.25926 35.8 18
## 21 25 30.5 26.25926 35.8 18
## 22 25 30.5 26.25926 35.8 18
## 24 25 30.5 26.25926 35.8 18
## 25 25 30.5 26.25926 35.8 18
## 27 25 30.5 26.25926 35.8 18
## 29 25 30.5 26.25926 35.8 18
## 30 25 30.5 26.25926 35.8 18
## 31 25 30.5 26.25926 35.8 18
## 32 25 30.5 26.25926 35.8 18
## 35 25 30.5 26.25926 35.8 18
## 36 25 30.5 26.25926 35.8 18
## 37 25 30.5 26.25926 35.8 18
## 39 25 30.5 26.25926 35.8 18
## 41 25 30.5 26.25926 35.8 18
## 43 25 30.5 26.25926 35.8 18
## maximumMaxSalary
## 2 70
## 3 70
## 4 70
## 5 70
## 6 70
## 7 70
## 10 70
## 12 70
## 15 70
## 16 70
## 18 70
## 19 70
## 21 70
## 22 70
## 24 70
## 25 70
## 27 70
## 29 70
## 30 70
## 31 70
## 32 70
## 35 70
## 36 70
## 37 70
## 39 70
## 41 70
## 43 70
##
## [[7]]
## city state
## 1 St. Louis MO
## 2 St. Louis MO
## 3 St. Louis MO
## 4 St. Louis MO
## 5 St. Louis MO
## 6 St. Louis MO
## 7 St. Louis MO
## 8 St. Louis MO
## 9 St. Louis MO
## 10 St. Louis MO
## 11 St. Louis MO
## 12 St. Louis MO
## 13 St. Louis MO
## 14 St. Louis MO
## 15 St. Louis MO
## 16 St. Louis MO
## 17 St. Louis MO
## 18 St. Louis MO
## 19 St. Louis MO
## 20 St. Louis MO
## 21 St. Louis MO
## 22 St. Louis MO
## 23 St. Louis MO
## 24 St. Louis MO
## 25 St. Louis MO
## 26 St. Louis MO
## 27 St. Louis MO
## 28 St. Louis MO
## 29 St. Louis MO
## 30 St. Louis MO
## 31 St. Louis MO
## 32 St. Louis MO
## 33 St. Louis MO
## 34 St. Louis MO
## 35 St. Louis MO
## 36 St. Louis MO
## 37 St. Louis MO
## 38 St. Louis MO
## 39 St. Louis MO
## 40 St. Louis MO
## 41 St. Louis MO
## 42 St. Louis MO
## 43 St. Louis MO
## 44 St. Louis MO
## 45 St. Louis MO
## 46 St. Louis MO
## 47 St. Louis MO
## 48 St. Louis MO
## 49 St. Louis MO
## 50 St. Louis MO
## 51 St. Louis MO
## 52 St. Louis MO
## 53 St. Louis MO
## 54 St. Louis MO
## 55 St. Louis MO
## 56 St. Louis MO
## 57 St. Louis MO
## 58 St. Louis MO
## 59 St. Louis MO
## 60 St. Louis MO
## 61 St. Louis MO
## 62 St. Louis MO
## 63 St. Louis MO
## 64 St. Louis MO
## 65 St. Louis MO
## 66 St. Louis MO
## 67 St. Louis MO
## 68 St. Louis MO
## 69 St. Louis MO
## 70 St. Louis MO
## 71 St. Louis MO
## 72 St. Louis MO
## 73 St. Louis MO
## 74 St. Louis MO
## 75 St. Louis MO
## 76 St. Louis MO
## 77 St. Louis MO
## 78 St. Louis MO
## 79 St. Louis MO
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist !!!Health Care Plan Available!!!
## 5 Licensed Massage Therapist - All Locations - $1200 Signing B...
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Mobile Massage Therapist
## 15 Massage Therapist (LMT) - part-time
## 16 Massage Therapist (Full Time)
## 17 Massage Therapist
## 18 Liscensed Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist - Signing Bonus!
## 22 Licensed Massage Therapist (LMT)
## 23 Licensed Massage Therapist (LMT)
## 24 Massage Therapist
## 25 Liscensed Massage Therapist
## 26 Licensed Massage Therapist - All Locations - $1200 Signing B...
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapist !!!Health Care Plan Available!!!
## 31 Licensed Massage Therapist (LMT) - Part or Full Time
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Mobile Massage Therapist
## 35 Massage Therapist (LMT) - part-time
## 36 Massage Therapist (Full Time)
## 37 Massage Therapist Massage Envy Sunset Hills
## 38 Licensed Massage Therapist (LMT) - Part or Full Time
## 39 Massage Therapist
## 40 Massage Therapist - Creve Coeur
## 41 Massage Therapist
## 42 Massage Therapy
## 43 LifeSpa-Massage Therapist
## 44 Dual Massage Therapist & Esthetician
## 45 Massage Therapist - Flexible Hours
## 46 Licensed Massage Therapist
## 47 Massage Therapist Massage Envy Sunset Hills
## 48 Massage Therapist - Creve Coeur
## 49 Massage Therapist
## 50 Massage Therapy
## 51 LifeSpa-Massage Therapist
## 52 Dual Massage Therapist & Esthetician
## 53 Massage Therapist
## 54 Massage Therapist - Flexible Hours
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist - Signing Bonus!
## 58 Liscensed Massage Therapist
## 59 Licensed Massage Therapist - All Locations - $1200 Signing B...
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist (LMT)
## 62 Massage Therapist
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist
## 67 Mobile Massage Therapist
## 68 Massage Therapist (LMT) - part-time
## 69 Massage Therapist (Full Time)
## 70 Licensed Massage Therapist (LMT) - Part or Full Time
## 71 Massage Therapist
## 72 Massage Therapist Massage Envy Sunset Hills
## 73 Massage Therapist - Creve Coeur
## 74 Massage Therapist
## 75 Massage Therapy
## 76 LifeSpa-Massage Therapist
## 77 Dual Massage Therapist & Esthetician
## 78 Massage Therapist - Flexible Hours
## 79 Licensed Massage Therapist
## HiringAgency
## 1 ELEMENTS MASSAGE3.6Chesterfield, MO 63017
## 2 NutriFormance- Fitness, Therapy and PerformanceFrontenac, MO 63131
## 3 Above & Beyond Wellness SpaFenton, MO 63026
## 4 Massage Envy Manchester3.2Manchester, MO 63011
## 5 The Face & The Body Day Spa2.6St. Louis, MO
## 6 Massage Envy - Chesterfield and/or WildwoodChesterfield, MO
## 7 Stonewater Spa, Salon, & BoutiqueSt. Louis, MO 63131
## 8 STL Downtown SpaSt. Louis, MO 63103
## 9 NutriFormance, LLCFrontenac, MO 63131
## 10 Elements3.6Chesterfield, MO 63017+2 locations
## 11 Indo-Pak Massage TherapySt. Louis, MO•Remote work available
## 12 Midwest Physicians GroupSt. Louis, MO
## 13 MassageLuXe FenotnFenton, MO 63026
## 14 Indo-Pak Massage TherapySt. Louis, MO
## 15 PALM Health4.0St. Louis, MO 63124
## 16 Life Time3.6Frontenac, MO 63131
## 17 MassageLuXe South County3.0St. Louis, MO 63123
## 18 Elements Massage St Peters Missouri3.6Saint Peters, MO 63304
## 19 MassageLuxeSt. Louis, MO
## 20 Massage Envy - Chesterfield and/or WildwoodChesterfield, MO
## 21 MassageLuXe - Fairview Heights3.0Fairview Heights, IL 62208
## 22 Stonewater Spa, Salon, & BoutiqueSt. Louis, MO 63131
## 23 NutriFormance- Fitness, Therapy and PerformanceFrontenac, MO 63131
## 24 MassageLuxeSt. Louis, MO
## 25 Elements Massage St Peters Missouri3.6Saint Peters, MO 63304
## 26 The Face & The Body Day Spa2.6St. Louis, MO
## 27 Above & Beyond Wellness SpaFenton, MO 63026
## 28 Massage Envy3.2Manchester, MO 63011
## 29 ELEMENTS MASSAGE3.6Chesterfield, MO 63017
## 30 Massage Envy Manchester3.2Manchester, MO 63011
## 31 Shipley ChiropracticGranite City, IL 62040
## 32 Midwest Physicians GroupSt. Louis, MO
## 33 MassageLuXe FenotnFenton, MO 63026
## 34 Indo-Pak Massage TherapySt. Louis, MO
## 35 PALM Health4.0St. Louis, MO 63124
## 36 Life Time3.6Frontenac, MO 63131
## 37 Massage Envy3.2Sunset Hills, MO+9 locations
## 38 Shipley ChiropracticGranite City, IL 62040
## 39 MassageLuXe ManchesterManchester, MO 63011
## 40 St. Louis Jewish Community Center4.5St. Louis, MO
## 41 Jewish Community Center St. LouisCreve Coeur, MO
## 42 NutriFormance4.6St. Louis, MO 63131
## 43 Life Time3.6Chesterfield, MO
## 44 PALM Health4.0St. Louis, MO 63124
## 45 Massage Envy3.2Clayton, MO 63105
## 46 Massage Envy3.2Manchester, MO 63011
## 47 Massage Envy3.2Sunset Hills, MO+9 locations
## 48 St. Louis Jewish Community Center4.5St. Louis, MO
## 49 Jewish Community Center St. LouisCreve Coeur, MO
## 50 NutriFormance4.6St. Louis, MO 63131
## 51 Life Time3.6Chesterfield, MO
## 52 PALM Health4.0St. Louis, MO 63124
## 53 Elements Massage3.6Richmond Heights, MO 63117
## 54 Massage Envy3.2Clayton, MO 63105
## 55 Massage Envy3.2Manchester, MO 63011
## 56 Massage Envy - Chesterfield and/or WildwoodChesterfield, MO
## 57 MassageLuXe - Fairview Heights3.0Fairview Heights, IL 62208
## 58 Elements Massage St Peters Missouri3.6Saint Peters, MO 63304
## 59 The Face & The Body Day Spa2.6St. Louis, MO
## 60 Above & Beyond Wellness SpaFenton, MO 63026
## 61 Stonewater Spa, Salon, & BoutiqueSt. Louis, MO 63131
## 62 MassageLuxeSt. Louis, MO
## 63 NutriFormance- Fitness, Therapy and PerformanceFrontenac, MO 63131
## 64 ELEMENTS MASSAGE3.6Chesterfield, MO 63017
## 65 Midwest Physicians GroupSt. Louis, MO
## 66 MassageLuXe FenotnFenton, MO 63026
## 67 Indo-Pak Massage TherapySt. Louis, MO
## 68 PALM Health4.0St. Louis, MO 63124
## 69 Life Time3.6Frontenac, MO 63131
## 70 Shipley ChiropracticGranite City, IL 62040
## 71 MassageLuXe ManchesterManchester, MO 63011
## 72 Massage Envy3.2Sunset Hills, MO+9 locations
## 73 St. Louis Jewish Community Center4.5St. Louis, MO
## 74 Jewish Community Center St. LouisCreve Coeur, MO
## 75 NutriFormance4.6St. Louis, MO 63131
## 76 Life Time3.6Chesterfield, MO
## 77 PALM Health4.0St. Louis, MO 63124
## 78 Massage Envy3.2Clayton, MO 63105
## 79 Massage Envy3.2Manchester, MO 63011
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 10 18 70 20000 64000
## 2 30 18 70 20000 64000
## 3 5 18 70 20000 64000
## 4 30 18 70 20000 64000
## 5 21 18 70 20000 64000
## 6 30 18 70 20000 64000
## 7 30 18 70 20000 64000
## 8 5 18 70 20000 64000
## 9 30 18 70 20000 64000
## 10 10 18 70 20000 64000
## 11 25 18 70 20000 64000
## 12 30 18 70 20000 64000
## 13 6 18 70 20000 64000
## 14 25 18 70 20000 64000
## 15 30 18 70 20000 64000
## 16 30 18 70 20000 64000
## 17 6 18 70 20000 64000
## 18 15 18 70 20000 64000
## 19 30 18 70 20000 64000
## 20 30 18 70 20000 64000
## 21 30 18 70 20000 64000
## 22 30 18 70 20000 64000
## 23 30 18 70 20000 64000
## 24 30 18 70 20000 64000
## 25 15 18 70 20000 64000
## 26 21 18 70 20000 64000
## 27 5 18 70 20000 64000
## 28 30 18 70 20000 64000
## 29 10 18 70 20000 64000
## 30 30 18 70 20000 64000
## 31 30 18 70 20000 64000
## 32 30 18 70 20000 64000
## 33 6 18 70 20000 64000
## 34 25 18 70 20000 64000
## 35 30 18 70 20000 64000
## 36 30 18 70 20000 64000
## 37 4 18 70 20000 64000
## 38 30 18 70 20000 64000
## 39 6 18 70 20000 64000
## 40 30 18 70 20000 64000
## 41 30 18 70 20000 64000
## 42 30 18 70 20000 64000
## 43 30 18 70 20000 64000
## 44 30 18 70 20000 64000
## 45 30 18 70 20000 64000
## 46 30 18 70 20000 64000
## 47 4 18 70 20000 64000
## 48 30 18 70 20000 64000
## 49 30 18 70 20000 64000
## 50 30 18 70 20000 64000
## 51 30 18 70 20000 64000
## 52 30 18 70 20000 64000
## 53 30 18 70 20000 64000
## 54 30 18 70 20000 64000
## 55 30 18 70 20000 64000
## 56 30 18 70 20000 64000
## 57 30 18 70 20000 64000
## 58 15 18 70 20000 64000
## 59 21 18 70 20000 64000
## 60 5 18 70 20000 64000
## 61 30 18 70 20000 64000
## 62 30 18 70 20000 64000
## 63 30 18 70 20000 64000
## 64 10 18 70 20000 64000
## 65 30 18 70 20000 64000
## 66 6 18 70 20000 64000
## 67 25 18 70 20000 64000
## 68 30 18 70 20000 64000
## 69 30 18 70 20000 64000
## 70 30 18 70 20000 64000
## 71 6 18 70 20000 64000
## 72 4 18 70 20000 64000
## 73 30 18 70 20000 64000
## 74 30 18 70 20000 64000
## 75 30 18 70 20000 64000
## 76 30 18 70 20000 64000
## 77 30 18 70 20000 64000
## 78 30 18 70 20000 64000
## 79 30 18 70 20000 64000
getIndeedJobData5pages("massage therapist","Springfield","MO")
## Warning in getIndeedJobData5pages("massage therapist", "Springfield", "MO"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Springfield", "MO"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapy Program Manager
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapy Program Manager
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 Massage Therapy Program Manager
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapy Program Manager
## 22 Massage Therapist
## 23 Massage Therapist
## 24 Massage Therapist
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist (LMT)
## 27 Massage Therapy Program Manager
## 28 Massage Therapist
## 29 Massage Therapist
## 30 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$13 - $15 an hour $13 - $15 13 15 13
## 2 \n$13 - $23 an hour $13 - $23 13 23 13
## 3 \n$17 an hour $17 17 NA 13
## 4 \n$13 - $15 an hour $13 - $15 13 15 13
## 5 \n$13 - $23 an hour $13 - $23 13 23 13
## 6 \n$17 an hour $17 17 NA 13
## 7 \n$13 - $15 an hour $13 - $15 13 15 13
## 8 \n$13 - $23 an hour $13 - $23 13 23 13
## 9 \n$17 an hour $17 17 NA 13
## 10 \n$13 - $23 an hour $13 - $23 13 23 13
## 11 \n$17 an hour $17 17 NA 13
## 12 \n$13 - $15 an hour $13 - $15 13 15 13
## 13 \n$13 - $23 an hour $13 - $23 13 23 13
## 14 \n$17 an hour $17 17 NA 13
## 15 \n$13 - $15 an hour $13 - $15 13 15 13
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 15 14.33333 16.2 13 23
## 2 15 14.33333 16.2 13 23
## 3 15 14.33333 16.2 13 23
## 4 15 14.33333 16.2 13 23
## 5 15 14.33333 16.2 13 23
## 6 15 14.33333 16.2 13 23
## 7 15 14.33333 16.2 13 23
## 8 15 14.33333 16.2 13 23
## 9 15 14.33333 16.2 13 23
## 10 15 14.33333 16.2 13 23
## 11 15 14.33333 16.2 13 23
## 12 15 14.33333 16.2 13 23
## 13 15 14.33333 16.2 13 23
## 14 15 14.33333 16.2 13 23
## 15 15 14.33333 16.2 13 23
##
## [[3]]
## date_daysAgo
## 1 1
## 2 20
## 3 30
## 4 29
## 5 30
## 6 25
## 7 1
## 8 20
## 9 30
## 10 29
## 11 30
## 12 25
## 13 1
## 14 20
## 15 30
## 16 29
## 17 30
## 18 25
## 19 20
## 20 30
## 21 29
## 22 30
## 23 25
## 24 1
## 25 20
## 26 30
## 27 29
## 28 30
## 29 25
## 30 1
##
## [[4]]
## HiringAgency
## 1 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 2 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 3 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 4 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 5 Massage Envy3.2Springfield, MO 65807
## 6 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 7 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 8 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 9 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 10 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 11 Massage Envy3.2Springfield, MO 65807
## 12 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 13 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 14 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 15 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 16 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 17 Massage Envy3.2Springfield, MO 65807
## 18 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 19 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 20 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 21 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 22 Massage Envy3.2Springfield, MO 65807
## 23 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 24 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 25 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 26 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 27 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 28 Massage Envy3.2Springfield, MO 65807
## 29 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 30 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$13 - $15 an hour $13 - $15 13 15 13
## 2 \n$13 - $23 an hour $13 - $23 13 23 13
## 3 \n$17 an hour $17 17 NA 13
## 4 \n$13 - $15 an hour $13 - $15 13 15 13
## 5 \n$13 - $23 an hour $13 - $23 13 23 13
## 6 \n$17 an hour $17 17 NA 13
## 7 \n$13 - $15 an hour $13 - $15 13 15 13
## 8 \n$13 - $23 an hour $13 - $23 13 23 13
## 9 \n$17 an hour $17 17 NA 13
## 10 \n$13 - $23 an hour $13 - $23 13 23 13
## 11 \n$17 an hour $17 17 NA 13
## 12 \n$13 - $15 an hour $13 - $15 13 15 13
## 13 \n$13 - $23 an hour $13 - $23 13 23 13
## 14 \n$17 an hour $17 17 NA 13
## 15 \n$13 - $15 an hour $13 - $15 13 15 13
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 19 14.33333 19 13 23
## 2 19 14.33333 19 13 23
## 3 19 14.33333 19 13 23
## 4 19 14.33333 19 13 23
## 5 19 14.33333 19 13 23
## 6 19 14.33333 19 13 23
## 7 19 14.33333 19 13 23
## 8 19 14.33333 19 13 23
## 9 19 14.33333 19 13 23
## 10 19 14.33333 19 13 23
## 11 19 14.33333 19 13 23
## 12 19 14.33333 19 13 23
## 13 19 14.33333 19 13 23
## 14 19 14.33333 19 13 23
## 15 19 14.33333 19 13 23
##
## [[7]]
## city state jobTitle
## 1 Springfield MO Massage Therapist
## 2 Springfield MO Licensed Massage Therapist
## 3 Springfield MO Licensed Massage Therapist (LMT)
## 4 Springfield MO Massage Therapy Program Manager
## 5 Springfield MO Massage Therapist
## 6 Springfield MO Massage Therapist
## 7 Springfield MO Massage Therapist
## 8 Springfield MO Licensed Massage Therapist
## 9 Springfield MO Licensed Massage Therapist (LMT)
## 10 Springfield MO Massage Therapy Program Manager
## 11 Springfield MO Massage Therapist
## 12 Springfield MO Massage Therapist
## 13 Springfield MO Massage Therapist
## 14 Springfield MO Licensed Massage Therapist
## 15 Springfield MO Licensed Massage Therapist (LMT)
## 16 Springfield MO Massage Therapy Program Manager
## 17 Springfield MO Massage Therapist
## 18 Springfield MO Massage Therapist
## 19 Springfield MO Licensed Massage Therapist
## 20 Springfield MO Licensed Massage Therapist (LMT)
## 21 Springfield MO Massage Therapy Program Manager
## 22 Springfield MO Massage Therapist
## 23 Springfield MO Massage Therapist
## 24 Springfield MO Massage Therapist
## 25 Springfield MO Licensed Massage Therapist
## 26 Springfield MO Licensed Massage Therapist (LMT)
## 27 Springfield MO Massage Therapy Program Manager
## 28 Springfield MO Massage Therapist
## 29 Springfield MO Massage Therapist
## 30 Springfield MO Massage Therapist
## HiringAgency
## 1 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 2 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 3 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 4 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 5 Massage Envy3.2Springfield, MO 65807
## 6 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 7 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 8 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 9 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 10 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 11 Massage Envy3.2Springfield, MO 65807
## 12 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 13 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 14 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 15 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 16 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 17 Massage Envy3.2Springfield, MO 65807
## 18 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 19 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 20 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 21 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 22 Massage Envy3.2Springfield, MO 65807
## 23 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 24 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## 25 Grove Spa3.3Springfield, MO 65804 (Meador Park area)
## 26 Nu Essence SpaSpringfield, MO 65804 (Southside area)
## 27 WellSpring School of Allied Health2.7Springfield, MO 65803 (Midtown area)
## 28 Massage Envy3.2Springfield, MO 65807
## 29 Acacia SpaSpringfield, MO 65804 (Sequiota area)
## 30 Wellness Concepts Clinic, LLCSpringfield, MO 65804 (Bradford Park area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 1 13 23 NA NA
## 2 20 13 23 NA NA
## 3 30 13 23 NA NA
## 4 29 13 23 NA NA
## 5 30 13 23 NA NA
## 6 25 13 23 NA NA
## 7 1 13 23 NA NA
## 8 20 13 23 NA NA
## 9 30 13 23 NA NA
## 10 29 13 23 NA NA
## 11 30 13 23 NA NA
## 12 25 13 23 NA NA
## 13 1 13 23 NA NA
## 14 20 13 23 NA NA
## 15 30 13 23 NA NA
## 16 29 13 23 NA NA
## 17 30 13 23 NA NA
## 18 25 13 23 NA NA
## 19 20 13 23 NA NA
## 20 30 13 23 NA NA
## 21 29 13 23 NA NA
## 22 30 13 23 NA NA
## 23 25 13 23 NA NA
## 24 1 13 23 NA NA
## 25 20 13 23 NA NA
## 26 30 13 23 NA NA
## 27 29 13 23 NA NA
## 28 30 13 23 NA NA
## 29 25 13 23 NA NA
## 30 1 13 23 NA NA
Montana Billings, Missoula, Great Falls
getIndeedJobData5pages('massage therapist', 'Billings','MT')
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Massage Therapist
## 3 Massage Therapist - Independent Contractor
## 4 Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5000 8500 5000 8500 5000
## 2 5000 8500 5000 8500 5000
## 3 5000 8500 5000 8500 5000
## 4 5000 8500 5000 8500 5000
## 5 5000 8500 5000 8500 5000
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
##
## [[3]]
## date_daysAgo
## 1 17
## 2 30
## 3 17
## 4 30
## 5 17
## 6 30
## 7 17
## 8 30
## 9 17
## 10 30
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyBillings, MT•Remote work available
## 2 Massage Envy3.2Billings, MT 59102
## 3 Indo-Pak Massage TherapyBillings, MT•Remote work available
## 4 Massage Envy3.2Billings, MT 59102
## 5 Indo-Pak Massage TherapyBillings, MT•Remote work available
## 6 Massage Envy3.2Billings, MT 59102
## 7 Indo-Pak Massage TherapyBillings, MT•Remote work available
## 8 Massage Envy3.2Billings, MT 59102
## 9 Indo-Pak Massage TherapyBillings, MT•Remote work available
## 10 Massage Envy3.2Billings, MT 59102
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Billings MT Massage Therapist - Independent Contractor
## 2 Billings MT Massage Therapist
## 3 Billings MT Massage Therapist - Independent Contractor
## 4 Billings MT Massage Therapist
## 5 Billings MT Massage Therapist - Independent Contractor
## 6 Billings MT Massage Therapist
## 7 Billings MT Massage Therapist - Independent Contractor
## 8 Billings MT Massage Therapist
## 9 Billings MT Massage Therapist - Independent Contractor
## 10 Billings MT Massage Therapist
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyBillings, MT•Remote work available 17
## 2 Massage Envy3.2Billings, MT 59102 30
## 3 Indo-Pak Massage TherapyBillings, MT•Remote work available 17
## 4 Massage Envy3.2Billings, MT 59102 30
## 5 Indo-Pak Massage TherapyBillings, MT•Remote work available 17
## 6 Massage Envy3.2Billings, MT 59102 30
## 7 Indo-Pak Massage TherapyBillings, MT•Remote work available 17
## 8 Massage Envy3.2Billings, MT 59102 30
## 9 Indo-Pak Massage TherapyBillings, MT•Remote work available 17
## 10 Massage Envy3.2Billings, MT 59102 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
## 6 NA NA NA NA
## 7 NA NA NA NA
## 8 NA NA NA NA
## 9 NA NA NA NA
## 10 NA NA NA NA
getIndeedJobData5pages('massage therapist', 'Missoula','MT')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist Missoula, MT
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist Missoula, MT
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist Missoula, MT
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist Missoula, MT
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist Missoula, MT
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 6
## 2 30
## 3 11
## 4 6
## 5 30
## 6 11
## 7 6
## 8 30
## 9 11
## 10 6
## 11 30
## 12 11
## 13 6
## 14 30
## 15 11
##
## [[4]]
## HiringAgency
## 1 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 2 The Resort at Paws Up3.3Greenough, MT 59823
## 3 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 4 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 5 The Resort at Paws Up3.3Greenough, MT 59823
## 6 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 7 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 8 The Resort at Paws Up3.3Greenough, MT 59823
## 9 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 10 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 11 The Resort at Paws Up3.3Greenough, MT 59823
## 12 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 13 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 14 The Resort at Paws Up3.3Greenough, MT 59823
## 15 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Missoula MT Licensed Massage Therapist
## 2 Missoula MT Massage Therapist
## 3 Missoula MT Massage Therapist Missoula, MT
## 4 Missoula MT Licensed Massage Therapist
## 5 Missoula MT Massage Therapist
## 6 Missoula MT Massage Therapist Missoula, MT
## 7 Missoula MT Licensed Massage Therapist
## 8 Missoula MT Massage Therapist
## 9 Missoula MT Massage Therapist Missoula, MT
## 10 Missoula MT Licensed Massage Therapist
## 11 Missoula MT Massage Therapist
## 12 Missoula MT Massage Therapist Missoula, MT
## 13 Missoula MT Licensed Massage Therapist
## 14 Missoula MT Massage Therapist
## 15 Missoula MT Massage Therapist Missoula, MT
## HiringAgency
## 1 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 2 The Resort at Paws Up3.3Greenough, MT 59823
## 3 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 4 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 5 The Resort at Paws Up3.3Greenough, MT 59823
## 6 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 7 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 8 The Resort at Paws Up3.3Greenough, MT 59823
## 9 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 10 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 11 The Resort at Paws Up3.3Greenough, MT 59823
## 12 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## 13 The Women's Club Health and Fitness CenterMissoula, MT 59801 (Rose Park area)
## 14 The Resort at Paws Up3.3Greenough, MT 59823
## 15 Massage Envy3.2Missoula, MT 59803 (Farviews & Pattee Canyon area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 6 NA NA NA NA
## 2 30 NA NA NA NA
## 3 11 NA NA NA NA
## 4 6 NA NA NA NA
## 5 30 NA NA NA NA
## 6 11 NA NA NA NA
## 7 6 NA NA NA NA
## 8 30 NA NA NA NA
## 9 11 NA NA NA NA
## 10 6 NA NA NA NA
## 11 30 NA NA NA NA
## 12 11 NA NA NA NA
## 13 6 NA NA NA NA
## 14 30 NA NA NA NA
## 15 11 NA NA NA NA
getIndeedJobData5pages('massage therapist', 'Great Falls','MT')
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Massage Therapist - Independent Contractor
## 3 Massage Therapist - Independent Contractor
## 4 Massage Therapist - Independent Contractor
## 5 Massage Therapist - Independent Contractor
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5000 8500 5000 8500 5000
## 2 5000 8500 5000 8500 5000
## 3 5000 8500 5000 8500 5000
## 4 5000 8500 5000 8500 5000
## 5 5000 8500 5000 8500 5000
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
##
## [[3]]
## date_daysAgo
## 1 17
## 2 17
## 3 17
## 4 17
## 5 17
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available
## 2 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available
## 3 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available
## 4 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available
## 5 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Great Falls MT Massage Therapist - Independent Contractor
## 2 Great Falls MT Massage Therapist - Independent Contractor
## 3 Great Falls MT Massage Therapist - Independent Contractor
## 4 Great Falls MT Massage Therapist - Independent Contractor
## 5 Great Falls MT Massage Therapist - Independent Contractor
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available 17
## 2 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available 17
## 3 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available 17
## 4 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available 17
## 5 Indo-Pak Massage TherapyGreat Falls, MT•Remote work available 17
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
Nebraska Omaha, Lincoln, Bellevue
getIndeedJobData5pages('massage therapist', 'Omaha','NE')
## Warning in getIndeedJobData5pages("massage therapist", "Omaha", "NE"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Omaha", "NE"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 LMT Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Nebraska State Licensed Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Life Spa-Massage Therapist
## 13 Licensed Massage Therapist (LMT)
## 14 Licensed Massage Therapist
## 15 Mobile Massage Therapist
## 16 Licensed Massage Therapist
## 17 Massage Therapist - Independent Contractor
## 18 Life Spa-Massage Therapist
## 19 Licensed Massage Therapist (LMT)
## 20 Mobile Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist very part time
## 27 LMT Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist - Independent Contractor
## 30 Life Spa-Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Mobile Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist very part time
## 39 LMT Licensed Massage Therapist
## 40 Massage Therapist - Independent Contractor
## 41 Life Spa-Massage Therapist
## 42 Licensed Massage Therapist (LMT)
## 43 Mobile Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Massage Therapist very part time
## 50 LMT Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist (LMT)
## 53 Licensed Massage Therapist (LMT)
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Nebraska State Licensed Massage Therapist
## 57 Massage Therapist - Independent Contractor
## 58 Life Spa-Massage Therapist
## 59 Licensed Massage Therapist (LMT)
## 60 Mobile Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Massage Therapist very part time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$24 - $42 an hour $24 - $42 24 42
## 2 \n$30 an hour $30 30 NA
## 3 \n$25 - $30 an hour $25 - $30 25 30
## 4 \n$30 an hour $30 30 NA
## 5 \n$30 an hour $30 30 NA
## 6 \n$30 an hour $30 30 NA
## 7 \n$30 an hour $30 30 NA
## 8 \n$30 an hour $30 30 NA
## 9 \n$30 an hour $30 30 NA
## 10 \n$30 an hour $30 30 NA
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$45 - $70 an hour $45 - $70 45 70
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$45 - $70 an hour $45 - $70 45 70
## 15 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 16 \n$18 an hour $18 18 NA
## 17 \n$24 - $42 an hour $24 - $42 24 42
## 18 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 19 \n$45 - $70 an hour $45 - $70 45 70
## 20 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 21 \n$18 an hour $18 18 NA
## 22 \n$24 - $42 an hour $24 - $42 24 42
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 24 \n$45 - $70 an hour $45 - $70 45 70
## 25 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 26 \n$18 an hour $18 18 NA
## 27 \n$24 - $42 an hour $24 - $42 24 42
## 28 \n$30 an hour $30 30 NA
## 29 \n$30 an hour $30 30 NA
## 30 \n$30 an hour $30 30 NA
## 31 \n$30 an hour $30 30 NA
## 32 \n$30 an hour $30 30 NA
## 33 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 34 \n$45 - $70 an hour $45 - $70 45 70
## 35 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 36 \n$18 an hour $18 18 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 45 1161.333 2224.655 18
## 2 30 45 1161.333 2224.655 18
## 3 30 45 1161.333 2224.655 18
## 4 30 45 1161.333 2224.655 18
## 5 30 45 1161.333 2224.655 18
## 6 30 45 1161.333 2224.655 18
## 7 30 45 1161.333 2224.655 18
## 8 30 45 1161.333 2224.655 18
## 9 30 45 1161.333 2224.655 18
## 10 30 45 1161.333 2224.655 18
## 11 30 45 1161.333 2224.655 18
## 12 30 45 1161.333 2224.655 18
## 13 30 45 1161.333 2224.655 18
## 14 30 45 1161.333 2224.655 18
## 15 30 45 1161.333 2224.655 18
## 16 30 45 1161.333 2224.655 18
## 17 30 45 1161.333 2224.655 18
## 18 30 45 1161.333 2224.655 18
## 19 30 45 1161.333 2224.655 18
## 20 30 45 1161.333 2224.655 18
## 21 30 45 1161.333 2224.655 18
## 22 30 45 1161.333 2224.655 18
## 23 30 45 1161.333 2224.655 18
## 24 30 45 1161.333 2224.655 18
## 25 30 45 1161.333 2224.655 18
## 26 30 45 1161.333 2224.655 18
## 27 30 45 1161.333 2224.655 18
## 28 30 45 1161.333 2224.655 18
## 29 30 45 1161.333 2224.655 18
## 30 30 45 1161.333 2224.655 18
## 31 30 45 1161.333 2224.655 18
## 32 30 45 1161.333 2224.655 18
## 33 30 45 1161.333 2224.655 18
## 34 30 45 1161.333 2224.655 18
## 35 30 45 1161.333 2224.655 18
## 36 30 45 1161.333 2224.655 18
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
## 34 12000
## 35 12000
## 36 12000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 4
## 3 4
## 4 4
## 5 3
## 6 3
## 7 3
## 8 3
## 9 3
## 10 4
## 11 5
## 12 30
## 13 27
## 14 7
## 15 30
## 16 7
## 17 5
## 18 30
## 19 27
## 20 30
## 21 30
## 22 30
## 23 30
## 24 30
## 25 30
## 26 24
## 27 14
## 28 7
## 29 5
## 30 30
## 31 27
## 32 30
## 33 30
## 34 30
## 35 30
## 36 30
## 37 30
## 38 24
## 39 14
## 40 5
## 41 30
## 42 27
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 30
## 49 24
## 50 14
## 51 7
## 52 3
## 53 3
## 54 3
## 55 3
## 56 4
## 57 5
## 58 30
## 59 27
## 60 30
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
## 66 24
##
## [[4]]
## HiringAgency
## 1 Faces, Inc.Omaha, NE 68124
## 2 Chinese Professional MassageOmaha, NE 68127
## 3 Kung Fu SpaOmaha, NE 68144
## 4 Mt Fuji Wellness SpaOmaha, NE 68130
## 5 Holiday MassageOmaha, NE 68144
## 6 Sunrise MassageOmaha, NE 68127
## 7 Amazing MassageOmaha, NE 68135
## 8 Green World Thai massageOmaha, NE 68137
## 9 Asian MassageOmaha, NE 68114
## 10 Sala Thai MassageOmaha, NE 68116
## 11 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 12 Life Time3.6Omaha, NE 68130
## 13 The Rehab GuruOmaha, NE 68154•Remote work available
## 14 Hand and Stone Spa3.0Omaha, NE 68197
## 15 Indo-Pak Massage TherapyOmaha, NE
## 16 Hand and Stone Spa3.0Omaha, NE 68197
## 17 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 18 Life Time3.6Omaha, NE 68130
## 19 The Rehab GuruOmaha, NE 68154•Remote work available
## 20 Indo-Pak Massage TherapyOmaha, NE
## 21 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 22 Green World Thai SpaOmaha, NE 68137
## 23 Massage Envy3.2Omaha, NE 68124+2 locations
## 24 Hand and Stone3.0Omaha, NE 68114
## 25 Massage Heights3.1Omaha, NE 68106
## 26 Massage Envy3.2Bellevue, NE 68123
## 27 Faces, Inc.Omaha, NE 68124
## 28 Hand and Stone Spa3.0Omaha, NE 68197
## 29 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 30 Life Time3.6Omaha, NE 68130
## 31 The Rehab GuruOmaha, NE 68154•Remote work available
## 32 Indo-Pak Massage TherapyOmaha, NE
## 33 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 34 Green World Thai SpaOmaha, NE 68137
## 35 Massage Envy3.2Omaha, NE 68124+2 locations
## 36 Hand and Stone3.0Omaha, NE 68114
## 37 Massage Heights3.1Omaha, NE 68106
## 38 Massage Envy3.2Bellevue, NE 68123
## 39 Faces, Inc.Omaha, NE 68124
## 40 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 41 Life Time3.6Omaha, NE 68130
## 42 The Rehab GuruOmaha, NE 68154•Remote work available
## 43 Indo-Pak Massage TherapyOmaha, NE
## 44 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 45 Green World Thai SpaOmaha, NE 68137
## 46 Massage Envy3.2Omaha, NE 68124+2 locations
## 47 Hand and Stone3.0Omaha, NE 68114
## 48 Massage Heights3.1Omaha, NE 68106
## 49 Massage Envy3.2Bellevue, NE 68123
## 50 Faces, Inc.Omaha, NE 68124
## 51 Hand and Stone Spa3.0Omaha, NE 68197
## 52 Sunrise MassageOmaha, NE 68127
## 53 Amazing MassageOmaha, NE 68135
## 54 Green World Thai massageOmaha, NE 68137
## 55 Asian MassageOmaha, NE 68114
## 56 Sala Thai MassageOmaha, NE 68116
## 57 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 58 Life Time3.6Omaha, NE 68130
## 59 The Rehab GuruOmaha, NE 68154•Remote work available
## 60 Indo-Pak Massage TherapyOmaha, NE
## 61 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 62 Green World Thai SpaOmaha, NE 68137
## 63 Massage Envy3.2Omaha, NE 68124+2 locations
## 64 Hand and Stone3.0Omaha, NE 68114
## 65 Massage Heights3.1Omaha, NE 68106
## 66 Massage Envy3.2Bellevue, NE 68123
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$24 - $42 an hour $24 - $42 24 42 30
## 2 \n$30 an hour $30 30 NA 30
## 3 \n$25 - $30 an hour $25 - $30 25 30 30
## 4 \n$30 an hour $30 30 NA 30
## 5 \n$30 an hour $30 30 NA 30
## 6 \n$30 an hour $30 30 NA 30
## 7 \n$30 an hour $30 30 NA 30
## 8 \n$30 an hour $30 30 NA 30
## 9 \n$30 an hour $30 30 NA 30
## 10 \n$30 an hour $30 30 NA 30
## 12 \n$45 - $70 an hour $45 - $70 45 70 30
## 14 \n$45 - $70 an hour $45 - $70 45 70 30
## 16 \n$18 an hour $18 18 NA 30
## 17 \n$24 - $42 an hour $24 - $42 24 42 30
## 19 \n$45 - $70 an hour $45 - $70 45 70 30
## 21 \n$18 an hour $18 18 NA 30
## 22 \n$24 - $42 an hour $24 - $42 24 42 30
## 24 \n$45 - $70 an hour $45 - $70 45 70 30
## 26 \n$18 an hour $18 18 NA 30
## 27 \n$24 - $42 an hour $24 - $42 24 42 30
## 28 \n$30 an hour $30 30 NA 30
## 29 \n$30 an hour $30 30 NA 30
## 30 \n$30 an hour $30 30 NA 30
## 31 \n$30 an hour $30 30 NA 30
## 32 \n$30 an hour $30 30 NA 30
## 34 \n$45 - $70 an hour $45 - $70 45 70 30
## 36 \n$18 an hour $18 18 NA 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 56 29.92593 54.8 18 70
## 2 56 29.92593 54.8 18 70
## 3 56 29.92593 54.8 18 70
## 4 56 29.92593 54.8 18 70
## 5 56 29.92593 54.8 18 70
## 6 56 29.92593 54.8 18 70
## 7 56 29.92593 54.8 18 70
## 8 56 29.92593 54.8 18 70
## 9 56 29.92593 54.8 18 70
## 10 56 29.92593 54.8 18 70
## 12 56 29.92593 54.8 18 70
## 14 56 29.92593 54.8 18 70
## 16 56 29.92593 54.8 18 70
## 17 56 29.92593 54.8 18 70
## 19 56 29.92593 54.8 18 70
## 21 56 29.92593 54.8 18 70
## 22 56 29.92593 54.8 18 70
## 24 56 29.92593 54.8 18 70
## 26 56 29.92593 54.8 18 70
## 27 56 29.92593 54.8 18 70
## 28 56 29.92593 54.8 18 70
## 29 56 29.92593 54.8 18 70
## 30 56 29.92593 54.8 18 70
## 31 56 29.92593 54.8 18 70
## 32 56 29.92593 54.8 18 70
## 34 56 29.92593 54.8 18 70
## 36 56 29.92593 54.8 18 70
##
## [[7]]
## city state jobTitle
## 1 Omaha NE LMT Licensed Massage Therapist
## 2 Omaha NE Licensed Massage Therapist
## 3 Omaha NE Licensed Massage Therapist
## 4 Omaha NE Licensed Massage Therapist (LMT)
## 5 Omaha NE Licensed Massage Therapist
## 6 Omaha NE Licensed Massage Therapist (LMT)
## 7 Omaha NE Licensed Massage Therapist (LMT)
## 8 Omaha NE Licensed Massage Therapist
## 9 Omaha NE Licensed Massage Therapist
## 10 Omaha NE Nebraska State Licensed Massage Therapist
## 11 Omaha NE Massage Therapist - Independent Contractor
## 12 Omaha NE Life Spa-Massage Therapist
## 13 Omaha NE Licensed Massage Therapist (LMT)
## 14 Omaha NE Licensed Massage Therapist
## 15 Omaha NE Mobile Massage Therapist
## 16 Omaha NE Licensed Massage Therapist
## 17 Omaha NE Massage Therapist - Independent Contractor
## 18 Omaha NE Life Spa-Massage Therapist
## 19 Omaha NE Licensed Massage Therapist (LMT)
## 20 Omaha NE Mobile Massage Therapist
## 21 Omaha NE Licensed Massage Therapist
## 22 Omaha NE Licensed Massage Therapist
## 23 Omaha NE Massage Therapist
## 24 Omaha NE Licensed Massage Therapist
## 25 Omaha NE Licensed Massage Therapist
## 26 Omaha NE Massage Therapist very part time
## 27 Omaha NE LMT Licensed Massage Therapist
## 28 Omaha NE Licensed Massage Therapist
## 29 Omaha NE Massage Therapist - Independent Contractor
## 30 Omaha NE Life Spa-Massage Therapist
## 31 Omaha NE Licensed Massage Therapist (LMT)
## 32 Omaha NE Mobile Massage Therapist
## 33 Omaha NE Licensed Massage Therapist
## 34 Omaha NE Licensed Massage Therapist
## 35 Omaha NE Massage Therapist
## 36 Omaha NE Licensed Massage Therapist
## 37 Omaha NE Licensed Massage Therapist
## 38 Omaha NE Massage Therapist very part time
## 39 Omaha NE LMT Licensed Massage Therapist
## 40 Omaha NE Massage Therapist - Independent Contractor
## 41 Omaha NE Life Spa-Massage Therapist
## 42 Omaha NE Licensed Massage Therapist (LMT)
## 43 Omaha NE Mobile Massage Therapist
## 44 Omaha NE Licensed Massage Therapist
## 45 Omaha NE Licensed Massage Therapist
## 46 Omaha NE Massage Therapist
## 47 Omaha NE Licensed Massage Therapist
## 48 Omaha NE Licensed Massage Therapist
## 49 Omaha NE Massage Therapist very part time
## 50 Omaha NE LMT Licensed Massage Therapist
## 51 Omaha NE Licensed Massage Therapist
## 52 Omaha NE Licensed Massage Therapist (LMT)
## 53 Omaha NE Licensed Massage Therapist (LMT)
## 54 Omaha NE Licensed Massage Therapist
## 55 Omaha NE Licensed Massage Therapist
## 56 Omaha NE Nebraska State Licensed Massage Therapist
## 57 Omaha NE Massage Therapist - Independent Contractor
## 58 Omaha NE Life Spa-Massage Therapist
## 59 Omaha NE Licensed Massage Therapist (LMT)
## 60 Omaha NE Mobile Massage Therapist
## 61 Omaha NE Licensed Massage Therapist
## 62 Omaha NE Licensed Massage Therapist
## 63 Omaha NE Massage Therapist
## 64 Omaha NE Licensed Massage Therapist
## 65 Omaha NE Licensed Massage Therapist
## 66 Omaha NE Massage Therapist very part time
## HiringAgency date_daysAgo
## 1 Faces, Inc.Omaha, NE 68124 14
## 2 Chinese Professional MassageOmaha, NE 68127 4
## 3 Kung Fu SpaOmaha, NE 68144 4
## 4 Mt Fuji Wellness SpaOmaha, NE 68130 4
## 5 Holiday MassageOmaha, NE 68144 3
## 6 Sunrise MassageOmaha, NE 68127 3
## 7 Amazing MassageOmaha, NE 68135 3
## 8 Green World Thai massageOmaha, NE 68137 3
## 9 Asian MassageOmaha, NE 68114 3
## 10 Sala Thai MassageOmaha, NE 68116 4
## 11 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 12 Life Time3.6Omaha, NE 68130 30
## 13 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 14 Hand and Stone Spa3.0Omaha, NE 68197 7
## 15 Indo-Pak Massage TherapyOmaha, NE 30
## 16 Hand and Stone Spa3.0Omaha, NE 68197 7
## 17 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 18 Life Time3.6Omaha, NE 68130 30
## 19 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 20 Indo-Pak Massage TherapyOmaha, NE 30
## 21 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 22 Green World Thai SpaOmaha, NE 68137 30
## 23 Massage Envy3.2Omaha, NE 68124+2 locations 30
## 24 Hand and Stone3.0Omaha, NE 68114 30
## 25 Massage Heights3.1Omaha, NE 68106 30
## 26 Massage Envy3.2Bellevue, NE 68123 24
## 27 Faces, Inc.Omaha, NE 68124 14
## 28 Hand and Stone Spa3.0Omaha, NE 68197 7
## 29 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 30 Life Time3.6Omaha, NE 68130 30
## 31 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 32 Indo-Pak Massage TherapyOmaha, NE 30
## 33 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 34 Green World Thai SpaOmaha, NE 68137 30
## 35 Massage Envy3.2Omaha, NE 68124+2 locations 30
## 36 Hand and Stone3.0Omaha, NE 68114 30
## 37 Massage Heights3.1Omaha, NE 68106 30
## 38 Massage Envy3.2Bellevue, NE 68123 24
## 39 Faces, Inc.Omaha, NE 68124 14
## 40 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 41 Life Time3.6Omaha, NE 68130 30
## 42 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 43 Indo-Pak Massage TherapyOmaha, NE 30
## 44 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 45 Green World Thai SpaOmaha, NE 68137 30
## 46 Massage Envy3.2Omaha, NE 68124+2 locations 30
## 47 Hand and Stone3.0Omaha, NE 68114 30
## 48 Massage Heights3.1Omaha, NE 68106 30
## 49 Massage Envy3.2Bellevue, NE 68123 24
## 50 Faces, Inc.Omaha, NE 68124 14
## 51 Hand and Stone Spa3.0Omaha, NE 68197 7
## 52 Sunrise MassageOmaha, NE 68127 3
## 53 Amazing MassageOmaha, NE 68135 3
## 54 Green World Thai massageOmaha, NE 68137 3
## 55 Asian MassageOmaha, NE 68114 3
## 56 Sala Thai MassageOmaha, NE 68116 4
## 57 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 58 Life Time3.6Omaha, NE 68130 30
## 59 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 60 Indo-Pak Massage TherapyOmaha, NE 30
## 61 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 62 Green World Thai SpaOmaha, NE 68137 30
## 63 Massage Envy3.2Omaha, NE 68124+2 locations 30
## 64 Hand and Stone3.0Omaha, NE 68114 30
## 65 Massage Heights3.1Omaha, NE 68106 30
## 66 Massage Envy3.2Bellevue, NE 68123 24
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 18 70 NA NA
## 2 18 70 NA NA
## 3 18 70 NA NA
## 4 18 70 NA NA
## 5 18 70 NA NA
## 6 18 70 NA NA
## 7 18 70 NA NA
## 8 18 70 NA NA
## 9 18 70 NA NA
## 10 18 70 NA NA
## 11 18 70 NA NA
## 12 18 70 NA NA
## 13 18 70 NA NA
## 14 18 70 NA NA
## 15 18 70 NA NA
## 16 18 70 NA NA
## 17 18 70 NA NA
## 18 18 70 NA NA
## 19 18 70 NA NA
## 20 18 70 NA NA
## 21 18 70 NA NA
## 22 18 70 NA NA
## 23 18 70 NA NA
## 24 18 70 NA NA
## 25 18 70 NA NA
## 26 18 70 NA NA
## 27 18 70 NA NA
## 28 18 70 NA NA
## 29 18 70 NA NA
## 30 18 70 NA NA
## 31 18 70 NA NA
## 32 18 70 NA NA
## 33 18 70 NA NA
## 34 18 70 NA NA
## 35 18 70 NA NA
## 36 18 70 NA NA
## 37 18 70 NA NA
## 38 18 70 NA NA
## 39 18 70 NA NA
## 40 18 70 NA NA
## 41 18 70 NA NA
## 42 18 70 NA NA
## 43 18 70 NA NA
## 44 18 70 NA NA
## 45 18 70 NA NA
## 46 18 70 NA NA
## 47 18 70 NA NA
## 48 18 70 NA NA
## 49 18 70 NA NA
## 50 18 70 NA NA
## 51 18 70 NA NA
## 52 18 70 NA NA
## 53 18 70 NA NA
## 54 18 70 NA NA
## 55 18 70 NA NA
## 56 18 70 NA NA
## 57 18 70 NA NA
## 58 18 70 NA NA
## 59 18 70 NA NA
## 60 18 70 NA NA
## 61 18 70 NA NA
## 62 18 70 NA NA
## 63 18 70 NA NA
## 64 18 70 NA NA
## 65 18 70 NA NA
## 66 18 70 NA NA
getIndeedJobData5pages('massage therapist', 'Lincoln','NE')
## [[1]]
## jobTitle
## 1 Liscensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist - Independent Contractor
## 4 Part-time Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Full Time Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Part-time Licensed Massage Therapist
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Full Time Massage Therapist
## 16 Liscensed Massage Therapist
## 17 Liscensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist - Independent Contractor
## 20 Part-time Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Full Time Massage Therapist
## 25 Liscensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Massage Therapist - Independent Contractor
## 28 Part-time Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Full Time Massage Therapist
## 33 Liscensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Massage Therapist - Independent Contractor
## 36 Part-time Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Full Time Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$30 - $40 an hour $30 - $40 30 40
## 4 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 5 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 6 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$30 - $40 an hour $30 - $40 30 40
## 9 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 10 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 11 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$30 - $40 an hour $30 - $40 30 40
## 14 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 15 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 16 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$30 - $40 an hour $30 - $40 30 40
## 19 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 20 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 21 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 22 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 23 \n$30 - $40 an hour $30 - $40 30 40
## 24 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 25 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 17899 24449.5 17785.8 25296.9 30
## 2 17899 24449.5 17785.8 25296.9 30
## 3 17899 24449.5 17785.8 25296.9 30
## 4 17899 24449.5 17785.8 25296.9 30
## 5 17899 24449.5 17785.8 25296.9 30
## 6 17899 24449.5 17785.8 25296.9 30
## 7 17899 24449.5 17785.8 25296.9 30
## 8 17899 24449.5 17785.8 25296.9 30
## 9 17899 24449.5 17785.8 25296.9 30
## 10 17899 24449.5 17785.8 25296.9 30
## 11 17899 24449.5 17785.8 25296.9 30
## 12 17899 24449.5 17785.8 25296.9 30
## 13 17899 24449.5 17785.8 25296.9 30
## 14 17899 24449.5 17785.8 25296.9 30
## 15 17899 24449.5 17785.8 25296.9 30
## 16 17899 24449.5 17785.8 25296.9 30
## 17 17899 24449.5 17785.8 25296.9 30
## 18 17899 24449.5 17785.8 25296.9 30
## 19 17899 24449.5 17785.8 25296.9 30
## 20 17899 24449.5 17785.8 25296.9 30
## 21 17899 24449.5 17785.8 25296.9 30
## 22 17899 24449.5 17785.8 25296.9 30
## 23 17899 24449.5 17785.8 25296.9 30
## 24 17899 24449.5 17785.8 25296.9 30
## 25 17899 24449.5 17785.8 25296.9 30
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
##
## [[3]]
## date_daysAgo
## 1 5
## 2 10
## 3 17
## 4 5
## 5 6
## 6 6
## 7 27
## 8 30
## 9 10
## 10 17
## 11 5
## 12 6
## 13 6
## 14 27
## 15 30
## 16 5
## 17 5
## 18 10
## 19 17
## 20 5
## 21 6
## 22 6
## 23 27
## 24 30
## 25 5
## 26 10
## 27 17
## 28 5
## 29 6
## 30 6
## 31 27
## 32 30
## 33 5
## 34 10
## 35 17
## 36 5
## 37 6
## 38 6
## 39 27
## 40 30
##
## [[4]]
## HiringAgency
## 1 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 2 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 3 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 4 Empowered HealingLincoln, NE 68504 (University Place area)
## 5 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 6 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 7 Vital Health Massage TherapyLincoln, NE 68526
## 8 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 9 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 10 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 11 Empowered HealingLincoln, NE 68504 (University Place area)
## 12 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 13 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 14 Vital Health Massage TherapyLincoln, NE 68526
## 15 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 16 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 17 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 18 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 19 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 20 Empowered HealingLincoln, NE 68504 (University Place area)
## 21 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 22 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 23 Vital Health Massage TherapyLincoln, NE 68526
## 24 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 25 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 26 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 27 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 28 Empowered HealingLincoln, NE 68504 (University Place area)
## 29 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 30 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 31 Vital Health Massage TherapyLincoln, NE 68526
## 32 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 33 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 34 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 35 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 36 Empowered HealingLincoln, NE 68504 (University Place area)
## 37 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 38 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 39 Vital Health Massage TherapyLincoln, NE 68526
## 40 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 4 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 5 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 6 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 9 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 10 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 11 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 14 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 15 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 16 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 19 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 20 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## 21 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 24 \n$31,000 - $44,000 a year $31000 - $44000 31000 44000
## 25 \n$17,899 - $48,000 a year $17899 - $48000 17899 48000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 31000 48000 27966.33 50666.67 17899
## 4 31000 48000 27966.33 50666.67 17899
## 5 31000 48000 27966.33 50666.67 17899
## 6 31000 48000 27966.33 50666.67 17899
## 9 31000 48000 27966.33 50666.67 17899
## 10 31000 48000 27966.33 50666.67 17899
## 11 31000 48000 27966.33 50666.67 17899
## 14 31000 48000 27966.33 50666.67 17899
## 15 31000 48000 27966.33 50666.67 17899
## 16 31000 48000 27966.33 50666.67 17899
## 19 31000 48000 27966.33 50666.67 17899
## 20 31000 48000 27966.33 50666.67 17899
## 21 31000 48000 27966.33 50666.67 17899
## 24 31000 48000 27966.33 50666.67 17899
## 25 31000 48000 27966.33 50666.67 17899
## maximumMaxSalary
## 1 60000
## 4 60000
## 5 60000
## 6 60000
## 9 60000
## 10 60000
## 11 60000
## 14 60000
## 15 60000
## 16 60000
## 19 60000
## 20 60000
## 21 60000
## 24 60000
## 25 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 3 \n$30 - $40 an hour $30 - $40 30 40 30
## 8 \n$30 - $40 an hour $30 - $40 30 40 30
## 13 \n$30 - $40 an hour $30 - $40 30 40 30
## 18 \n$30 - $40 an hour $30 - $40 30 40 30
## 23 \n$30 - $40 an hour $30 - $40 30 40 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 3 40 30 40 30 40
## 8 40 30 40 30 40
## 13 40 30 40 30 40
## 18 40 30 40 30 40
## 23 40 30 40 30 40
##
## [[7]]
## city state jobTitle
## 1 Lincoln NE Liscensed Massage Therapist
## 2 Lincoln NE Licensed Massage Therapist
## 3 Lincoln NE Massage Therapist - Independent Contractor
## 4 Lincoln NE Part-time Licensed Massage Therapist
## 5 Lincoln NE Licensed Massage Therapist
## 6 Lincoln NE Licensed Massage Therapist
## 7 Lincoln NE Licensed Massage Therapist
## 8 Lincoln NE Full Time Massage Therapist
## 9 Lincoln NE Licensed Massage Therapist
## 10 Lincoln NE Massage Therapist - Independent Contractor
## 11 Lincoln NE Part-time Licensed Massage Therapist
## 12 Lincoln NE Licensed Massage Therapist
## 13 Lincoln NE Licensed Massage Therapist
## 14 Lincoln NE Licensed Massage Therapist
## 15 Lincoln NE Full Time Massage Therapist
## 16 Lincoln NE Liscensed Massage Therapist
## 17 Lincoln NE Liscensed Massage Therapist
## 18 Lincoln NE Licensed Massage Therapist
## 19 Lincoln NE Massage Therapist - Independent Contractor
## 20 Lincoln NE Part-time Licensed Massage Therapist
## 21 Lincoln NE Licensed Massage Therapist
## 22 Lincoln NE Licensed Massage Therapist
## 23 Lincoln NE Licensed Massage Therapist
## 24 Lincoln NE Full Time Massage Therapist
## 25 Lincoln NE Liscensed Massage Therapist
## 26 Lincoln NE Licensed Massage Therapist
## 27 Lincoln NE Massage Therapist - Independent Contractor
## 28 Lincoln NE Part-time Licensed Massage Therapist
## 29 Lincoln NE Licensed Massage Therapist
## 30 Lincoln NE Licensed Massage Therapist
## 31 Lincoln NE Licensed Massage Therapist
## 32 Lincoln NE Full Time Massage Therapist
## 33 Lincoln NE Liscensed Massage Therapist
## 34 Lincoln NE Licensed Massage Therapist
## 35 Lincoln NE Massage Therapist - Independent Contractor
## 36 Lincoln NE Part-time Licensed Massage Therapist
## 37 Lincoln NE Licensed Massage Therapist
## 38 Lincoln NE Licensed Massage Therapist
## 39 Lincoln NE Licensed Massage Therapist
## 40 Lincoln NE Full Time Massage Therapist
## HiringAgency
## 1 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 2 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 3 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 4 Empowered HealingLincoln, NE 68504 (University Place area)
## 5 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 6 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 7 Vital Health Massage TherapyLincoln, NE 68526
## 8 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 9 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 10 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 11 Empowered HealingLincoln, NE 68504 (University Place area)
## 12 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 13 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 14 Vital Health Massage TherapyLincoln, NE 68526
## 15 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 16 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 17 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 18 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 19 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 20 Empowered HealingLincoln, NE 68504 (University Place area)
## 21 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 22 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 23 Vital Health Massage TherapyLincoln, NE 68526
## 24 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 25 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 26 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 27 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 28 Empowered HealingLincoln, NE 68504 (University Place area)
## 29 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 30 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 31 Vital Health Massage TherapyLincoln, NE 68526
## 32 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 33 Morgan Chiropractic & Acupuncture PCLincoln, NE 68516 (Family Acres area)
## 34 Mind Matters: Mental Health & WellnessLincoln, NE 68501
## 35 Indo-Pak Massage TherapyLincoln, NE•Remote work available
## 36 Empowered HealingLincoln, NE 68504 (University Place area)
## 37 5 Elements Massage and SpaLincoln, NE 68516 (Family Acres area)
## 38 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## 39 Vital Health Massage TherapyLincoln, NE 68526
## 40 Massage Envy3.2Lincoln, NE 68510 (Eastridge area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 5 30 40 17899 60000
## 2 10 30 40 17899 60000
## 3 17 30 40 17899 60000
## 4 5 30 40 17899 60000
## 5 6 30 40 17899 60000
## 6 6 30 40 17899 60000
## 7 27 30 40 17899 60000
## 8 30 30 40 17899 60000
## 9 10 30 40 17899 60000
## 10 17 30 40 17899 60000
## 11 5 30 40 17899 60000
## 12 6 30 40 17899 60000
## 13 6 30 40 17899 60000
## 14 27 30 40 17899 60000
## 15 30 30 40 17899 60000
## 16 5 30 40 17899 60000
## 17 5 30 40 17899 60000
## 18 10 30 40 17899 60000
## 19 17 30 40 17899 60000
## 20 5 30 40 17899 60000
## 21 6 30 40 17899 60000
## 22 6 30 40 17899 60000
## 23 27 30 40 17899 60000
## 24 30 30 40 17899 60000
## 25 5 30 40 17899 60000
## 26 10 30 40 17899 60000
## 27 17 30 40 17899 60000
## 28 5 30 40 17899 60000
## 29 6 30 40 17899 60000
## 30 6 30 40 17899 60000
## 31 27 30 40 17899 60000
## 32 30 30 40 17899 60000
## 33 5 30 40 17899 60000
## 34 10 30 40 17899 60000
## 35 17 30 40 17899 60000
## 36 5 30 40 17899 60000
## 37 6 30 40 17899 60000
## 38 6 30 40 17899 60000
## 39 27 30 40 17899 60000
## 40 30 30 40 17899 60000
getIndeedJobData5pages('massage therapist', 'Bellevue','NE')
## Warning in getIndeedJobData5pages("massage therapist", "Bellevue", "NE"): NAs
## introduced by coercion
## Warning in max(annual$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Bellevue", "NE"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Bellevue", "NE"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 LMT Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist
## 14 Massage Therapist - Independent Contractor
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist (LMT)
## 17 Nebraska State Licensed Massage Therapist
## 18 Life Spa-Massage Therapist
## 19 Licensed Massage Therapist (LMT)
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Mobile Massage Therapist
## 23 Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist very part time
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist - Independent Contractor
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Nebraska State Licensed Massage Therapist
## 33 Life Spa-Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Mobile Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist very part time
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapist - Independent Contractor
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist (LMT)
## 47 Nebraska State Licensed Massage Therapist
## 48 Life Spa-Massage Therapist
## 49 Licensed Massage Therapist (LMT)
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Mobile Massage Therapist
## 53 Massage Therapist
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Massage Therapist very part time
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist - Independent Contractor
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist (LMT)
## 62 Nebraska State Licensed Massage Therapist
## 63 Life Spa-Massage Therapist
## 64 Licensed Massage Therapist (LMT)
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Mobile Massage Therapist
## 68 Massage Therapist
## 69 Licensed Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage Therapist very part time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$24 - $42 an hour $24 - $42 24 42
## 2 \n$30 an hour $30 30 NA
## 3 \n$25 - $30 an hour $25 - $30 25 30
## 4 \n$30 an hour $30 30 NA
## 5 \n$30 an hour $30 30 NA
## 6 \n$30 an hour $30 30 NA
## 7 \n$30 an hour $30 30 NA
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$30 an hour $30 30 NA
## 10 \n$30 an hour $30 30 NA
## 11 \n$30 an hour $30 30 NA
## 12 \n$30 an hour $30 30 NA
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$30 an hour $30 30 NA
## 15 \n$30 an hour $30 30 NA
## 16 \n$30 an hour $30 30 NA
## 17 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 18 \n$45 - $70 an hour $45 - $70 45 70
## 19 \nFrom $50,000 a year $50000 50000 NA
## 20 \n$30 an hour $30 30 NA
## 21 \n$30 an hour $30 30 NA
## 22 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 23 \n$30 an hour $30 30 NA
## 24 \n$30 an hour $30 30 NA
## 25 \n$30 an hour $30 30 NA
## 26 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 27 \n$45 - $70 an hour $45 - $70 45 70
## 28 \nFrom $50,000 a year $50000 50000 NA
## 29 \n$30 an hour $30 30 NA
## 30 \n$30 an hour $30 30 NA
## 31 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 32 \n$30 an hour $30 30 NA
## 33 \n$30 an hour $30 30 NA
## 34 \n$30 an hour $30 30 NA
## 35 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 36 \n$45 - $70 an hour $45 - $70 45 70
## 37 \nFrom $50,000 a year $50000 50000 NA
## 38 \n$30 an hour $30 30 NA
## 39 \n$30 an hour $30 30 NA
## 40 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 41 \n$30 an hour $30 30 NA
## 42 \n$30 an hour $30 30 NA
## 43 \n$30 an hour $30 30 NA
## 44 \n$4,000 - $5,000 a month $4000 - $5000 4000 5000
## 45 \n$45 - $70 an hour $45 - $70 45 70
## 46 \nFrom $50,000 a year $50000 50000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 42 5261.717 5285.098 24
## 2 30 42 5261.717 5285.098 24
## 3 30 42 5261.717 5285.098 24
## 4 30 42 5261.717 5285.098 24
## 5 30 42 5261.717 5285.098 24
## 6 30 42 5261.717 5285.098 24
## 7 30 42 5261.717 5285.098 24
## 8 30 42 5261.717 5285.098 24
## 9 30 42 5261.717 5285.098 24
## 10 30 42 5261.717 5285.098 24
## 11 30 42 5261.717 5285.098 24
## 12 30 42 5261.717 5285.098 24
## 13 30 42 5261.717 5285.098 24
## 14 30 42 5261.717 5285.098 24
## 15 30 42 5261.717 5285.098 24
## 16 30 42 5261.717 5285.098 24
## 17 30 42 5261.717 5285.098 24
## 18 30 42 5261.717 5285.098 24
## 19 30 42 5261.717 5285.098 24
## 20 30 42 5261.717 5285.098 24
## 21 30 42 5261.717 5285.098 24
## 22 30 42 5261.717 5285.098 24
## 23 30 42 5261.717 5285.098 24
## 24 30 42 5261.717 5285.098 24
## 25 30 42 5261.717 5285.098 24
## 26 30 42 5261.717 5285.098 24
## 27 30 42 5261.717 5285.098 24
## 28 30 42 5261.717 5285.098 24
## 29 30 42 5261.717 5285.098 24
## 30 30 42 5261.717 5285.098 24
## 31 30 42 5261.717 5285.098 24
## 32 30 42 5261.717 5285.098 24
## 33 30 42 5261.717 5285.098 24
## 34 30 42 5261.717 5285.098 24
## 35 30 42 5261.717 5285.098 24
## 36 30 42 5261.717 5285.098 24
## 37 30 42 5261.717 5285.098 24
## 38 30 42 5261.717 5285.098 24
## 39 30 42 5261.717 5285.098 24
## 40 30 42 5261.717 5285.098 24
## 41 30 42 5261.717 5285.098 24
## 42 30 42 5261.717 5285.098 24
## 43 30 42 5261.717 5285.098 24
## 44 30 42 5261.717 5285.098 24
## 45 30 42 5261.717 5285.098 24
## 46 30 42 5261.717 5285.098 24
## maximumMaxSalary
## 1 50000
## 2 50000
## 3 50000
## 4 50000
## 5 50000
## 6 50000
## 7 50000
## 8 50000
## 9 50000
## 10 50000
## 11 50000
## 12 50000
## 13 50000
## 14 50000
## 15 50000
## 16 50000
## 17 50000
## 18 50000
## 19 50000
## 20 50000
## 21 50000
## 22 50000
## 23 50000
## 24 50000
## 25 50000
## 26 50000
## 27 50000
## 28 50000
## 29 50000
## 30 50000
## 31 50000
## 32 50000
## 33 50000
## 34 50000
## 35 50000
## 36 50000
## 37 50000
## 38 50000
## 39 50000
## 40 50000
## 41 50000
## 42 50000
## 43 50000
## 44 50000
## 45 50000
## 46 50000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 7
## 3 4
## 4 4
## 5 4
## 6 3
## 7 3
## 8 3
## 9 5
## 10 3
## 11 3
## 12 3
## 13 3
## 14 5
## 15 3
## 16 3
## 17 4
## 18 30
## 19 27
## 20 30
## 21 30
## 22 30
## 23 30
## 24 30
## 25 30
## 26 24
## 27 3
## 28 3
## 29 5
## 30 3
## 31 3
## 32 4
## 33 30
## 34 27
## 35 30
## 36 30
## 37 30
## 38 30
## 39 30
## 40 30
## 41 24
## 42 3
## 43 3
## 44 5
## 45 3
## 46 3
## 47 4
## 48 30
## 49 27
## 50 30
## 51 30
## 52 30
## 53 30
## 54 30
## 55 30
## 56 24
## 57 3
## 58 3
## 59 5
## 60 3
## 61 3
## 62 4
## 63 30
## 64 27
## 65 30
## 66 30
## 67 30
## 68 30
## 69 30
## 70 30
## 71 24
##
## [[4]]
## HiringAgency
## 1 Faces, Inc.Omaha, NE 68124
## 2 Hand and Stone Spa3.0Omaha, NE 68197
## 3 Mt Fuji Wellness SpaOmaha, NE 68130
## 4 Kung Fu SpaOmaha, NE 68144
## 5 Chinese Professional MassageOmaha, NE 68127
## 6 Sunrise MassageOmaha, NE 68127
## 7 Green World Thai massageOmaha, NE 68137
## 8 Holiday MassageOmaha, NE 68144
## 9 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 10 Asian MassageOmaha, NE 68114
## 11 Amazing MassageOmaha, NE 68135
## 12 Green World Thai massageOmaha, NE 68137
## 13 Holiday MassageOmaha, NE 68144
## 14 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 15 Asian MassageOmaha, NE 68114
## 16 Amazing MassageOmaha, NE 68135
## 17 Sala Thai MassageOmaha, NE 68116
## 18 Life Time3.6Omaha, NE 68130
## 19 The Rehab GuruOmaha, NE 68154•Remote work available
## 20 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 21 Green World Thai SpaOmaha, NE 68137
## 22 Indo-Pak Massage TherapyOmaha, NE
## 23 Massage Envy3.2La Vista, NE 68138+2 locations
## 24 Hand and Stone3.0Omaha, NE 68114
## 25 Massage Heights3.1Omaha, NE 68106
## 26 Massage Envy3.2Bellevue, NE 68123
## 27 Green World Thai massageOmaha, NE 68137
## 28 Holiday MassageOmaha, NE 68144
## 29 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 30 Asian MassageOmaha, NE 68114
## 31 Amazing MassageOmaha, NE 68135
## 32 Sala Thai MassageOmaha, NE 68116
## 33 Life Time3.6Omaha, NE 68130
## 34 The Rehab GuruOmaha, NE 68154•Remote work available
## 35 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 36 Green World Thai SpaOmaha, NE 68137
## 37 Indo-Pak Massage TherapyOmaha, NE
## 38 Massage Envy3.2La Vista, NE 68138+2 locations
## 39 Hand and Stone3.0Omaha, NE 68114
## 40 Massage Heights3.1Omaha, NE 68106
## 41 Massage Envy3.2Bellevue, NE 68123
## 42 Green World Thai massageOmaha, NE 68137
## 43 Holiday MassageOmaha, NE 68144
## 44 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 45 Asian MassageOmaha, NE 68114
## 46 Amazing MassageOmaha, NE 68135
## 47 Sala Thai MassageOmaha, NE 68116
## 48 Life Time3.6Omaha, NE 68130
## 49 The Rehab GuruOmaha, NE 68154•Remote work available
## 50 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 51 Green World Thai SpaOmaha, NE 68137
## 52 Indo-Pak Massage TherapyOmaha, NE
## 53 Massage Envy3.2La Vista, NE 68138+2 locations
## 54 Hand and Stone3.0Omaha, NE 68114
## 55 Massage Heights3.1Omaha, NE 68106
## 56 Massage Envy3.2Bellevue, NE 68123
## 57 Green World Thai massageOmaha, NE 68137
## 58 Holiday MassageOmaha, NE 68144
## 59 Indo-Pak Massage TherapyOmaha, NE•Remote work available
## 60 Asian MassageOmaha, NE 68114
## 61 Amazing MassageOmaha, NE 68135
## 62 Sala Thai MassageOmaha, NE 68116
## 63 Life Time3.6Omaha, NE 68130
## 64 The Rehab GuruOmaha, NE 68154•Remote work available
## 65 Synergy Advanced Massage Therapy, LLCRalston, NE 68127
## 66 Green World Thai SpaOmaha, NE 68137
## 67 Indo-Pak Massage TherapyOmaha, NE
## 68 Massage Envy3.2La Vista, NE 68138+2 locations
## 69 Hand and Stone3.0Omaha, NE 68114
## 70 Massage Heights3.1Omaha, NE 68106
## 71 Massage Envy3.2Bellevue, NE 68123
##
## [[5]]
## Salary salary minSalary maxSalary medianMinSalary
## 19 \nFrom $50,000 a year $50000 50000 NA 50000
## 28 \nFrom $50,000 a year $50000 50000 NA 50000
## 37 \nFrom $50,000 a year $50000 50000 NA 50000
## 46 \nFrom $50,000 a year $50000 50000 NA 50000
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 19 NA 50000 NaN 50000 -Inf
## 28 NA 50000 NaN 50000 -Inf
## 37 NA 50000 NaN 50000 -Inf
## 46 NA 50000 NaN 50000 -Inf
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$24 - $42 an hour $24 - $42 24 42 30
## 2 \n$30 an hour $30 30 NA 30
## 3 \n$25 - $30 an hour $25 - $30 25 30 30
## 4 \n$30 an hour $30 30 NA 30
## 5 \n$30 an hour $30 30 NA 30
## 6 \n$30 an hour $30 30 NA 30
## 7 \n$30 an hour $30 30 NA 30
## 9 \n$30 an hour $30 30 NA 30
## 10 \n$30 an hour $30 30 NA 30
## 11 \n$30 an hour $30 30 NA 30
## 12 \n$30 an hour $30 30 NA 30
## 14 \n$30 an hour $30 30 NA 30
## 15 \n$30 an hour $30 30 NA 30
## 16 \n$30 an hour $30 30 NA 30
## 18 \n$45 - $70 an hour $45 - $70 45 70 30
## 20 \n$30 an hour $30 30 NA 30
## 21 \n$30 an hour $30 30 NA 30
## 23 \n$30 an hour $30 30 NA 30
## 24 \n$30 an hour $30 30 NA 30
## 25 \n$30 an hour $30 30 NA 30
## 27 \n$45 - $70 an hour $45 - $70 45 70 30
## 29 \n$30 an hour $30 30 NA 30
## 30 \n$30 an hour $30 30 NA 30
## 32 \n$30 an hour $30 30 NA 30
## 33 \n$30 an hour $30 30 NA 30
## 34 \n$30 an hour $30 30 NA 30
## 36 \n$45 - $70 an hour $45 - $70 45 70 30
## 38 \n$30 an hour $30 30 NA 30
## 39 \n$30 an hour $30 30 NA 30
## 41 \n$30 an hour $30 30 NA 30
## 42 \n$30 an hour $30 30 NA 30
## 43 \n$30 an hour $30 30 NA 30
## 45 \n$45 - $70 an hour $45 - $70 45 70 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 70 31.48485 58.66667 24 70
## 2 70 31.48485 58.66667 24 70
## 3 70 31.48485 58.66667 24 70
## 4 70 31.48485 58.66667 24 70
## 5 70 31.48485 58.66667 24 70
## 6 70 31.48485 58.66667 24 70
## 7 70 31.48485 58.66667 24 70
## 9 70 31.48485 58.66667 24 70
## 10 70 31.48485 58.66667 24 70
## 11 70 31.48485 58.66667 24 70
## 12 70 31.48485 58.66667 24 70
## 14 70 31.48485 58.66667 24 70
## 15 70 31.48485 58.66667 24 70
## 16 70 31.48485 58.66667 24 70
## 18 70 31.48485 58.66667 24 70
## 20 70 31.48485 58.66667 24 70
## 21 70 31.48485 58.66667 24 70
## 23 70 31.48485 58.66667 24 70
## 24 70 31.48485 58.66667 24 70
## 25 70 31.48485 58.66667 24 70
## 27 70 31.48485 58.66667 24 70
## 29 70 31.48485 58.66667 24 70
## 30 70 31.48485 58.66667 24 70
## 32 70 31.48485 58.66667 24 70
## 33 70 31.48485 58.66667 24 70
## 34 70 31.48485 58.66667 24 70
## 36 70 31.48485 58.66667 24 70
## 38 70 31.48485 58.66667 24 70
## 39 70 31.48485 58.66667 24 70
## 41 70 31.48485 58.66667 24 70
## 42 70 31.48485 58.66667 24 70
## 43 70 31.48485 58.66667 24 70
## 45 70 31.48485 58.66667 24 70
##
## [[7]]
## city state jobTitle
## 1 Bellevue NE LMT Licensed Massage Therapist
## 2 Bellevue NE Licensed Massage Therapist
## 3 Bellevue NE Licensed Massage Therapist (LMT)
## 4 Bellevue NE Licensed Massage Therapist
## 5 Bellevue NE Licensed Massage Therapist
## 6 Bellevue NE Licensed Massage Therapist (LMT)
## 7 Bellevue NE Licensed Massage Therapist
## 8 Bellevue NE Licensed Massage Therapist
## 9 Bellevue NE Massage Therapist - Independent Contractor
## 10 Bellevue NE Licensed Massage Therapist
## 11 Bellevue NE Licensed Massage Therapist (LMT)
## 12 Bellevue NE Licensed Massage Therapist
## 13 Bellevue NE Licensed Massage Therapist
## 14 Bellevue NE Massage Therapist - Independent Contractor
## 15 Bellevue NE Licensed Massage Therapist
## 16 Bellevue NE Licensed Massage Therapist (LMT)
## 17 Bellevue NE Nebraska State Licensed Massage Therapist
## 18 Bellevue NE Life Spa-Massage Therapist
## 19 Bellevue NE Licensed Massage Therapist (LMT)
## 20 Bellevue NE Licensed Massage Therapist
## 21 Bellevue NE Licensed Massage Therapist
## 22 Bellevue NE Mobile Massage Therapist
## 23 Bellevue NE Massage Therapist
## 24 Bellevue NE Licensed Massage Therapist
## 25 Bellevue NE Licensed Massage Therapist
## 26 Bellevue NE Massage Therapist very part time
## 27 Bellevue NE Licensed Massage Therapist
## 28 Bellevue NE Licensed Massage Therapist
## 29 Bellevue NE Massage Therapist - Independent Contractor
## 30 Bellevue NE Licensed Massage Therapist
## 31 Bellevue NE Licensed Massage Therapist (LMT)
## 32 Bellevue NE Nebraska State Licensed Massage Therapist
## 33 Bellevue NE Life Spa-Massage Therapist
## 34 Bellevue NE Licensed Massage Therapist (LMT)
## 35 Bellevue NE Licensed Massage Therapist
## 36 Bellevue NE Licensed Massage Therapist
## 37 Bellevue NE Mobile Massage Therapist
## 38 Bellevue NE Massage Therapist
## 39 Bellevue NE Licensed Massage Therapist
## 40 Bellevue NE Licensed Massage Therapist
## 41 Bellevue NE Massage Therapist very part time
## 42 Bellevue NE Licensed Massage Therapist
## 43 Bellevue NE Licensed Massage Therapist
## 44 Bellevue NE Massage Therapist - Independent Contractor
## 45 Bellevue NE Licensed Massage Therapist
## 46 Bellevue NE Licensed Massage Therapist (LMT)
## 47 Bellevue NE Nebraska State Licensed Massage Therapist
## 48 Bellevue NE Life Spa-Massage Therapist
## 49 Bellevue NE Licensed Massage Therapist (LMT)
## 50 Bellevue NE Licensed Massage Therapist
## 51 Bellevue NE Licensed Massage Therapist
## 52 Bellevue NE Mobile Massage Therapist
## 53 Bellevue NE Massage Therapist
## 54 Bellevue NE Licensed Massage Therapist
## 55 Bellevue NE Licensed Massage Therapist
## 56 Bellevue NE Massage Therapist very part time
## 57 Bellevue NE Licensed Massage Therapist
## 58 Bellevue NE Licensed Massage Therapist
## 59 Bellevue NE Massage Therapist - Independent Contractor
## 60 Bellevue NE Licensed Massage Therapist
## 61 Bellevue NE Licensed Massage Therapist (LMT)
## 62 Bellevue NE Nebraska State Licensed Massage Therapist
## 63 Bellevue NE Life Spa-Massage Therapist
## 64 Bellevue NE Licensed Massage Therapist (LMT)
## 65 Bellevue NE Licensed Massage Therapist
## 66 Bellevue NE Licensed Massage Therapist
## 67 Bellevue NE Mobile Massage Therapist
## 68 Bellevue NE Massage Therapist
## 69 Bellevue NE Licensed Massage Therapist
## 70 Bellevue NE Licensed Massage Therapist
## 71 Bellevue NE Massage Therapist very part time
## HiringAgency date_daysAgo
## 1 Faces, Inc.Omaha, NE 68124 14
## 2 Hand and Stone Spa3.0Omaha, NE 68197 7
## 3 Mt Fuji Wellness SpaOmaha, NE 68130 4
## 4 Kung Fu SpaOmaha, NE 68144 4
## 5 Chinese Professional MassageOmaha, NE 68127 4
## 6 Sunrise MassageOmaha, NE 68127 3
## 7 Green World Thai massageOmaha, NE 68137 3
## 8 Holiday MassageOmaha, NE 68144 3
## 9 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 10 Asian MassageOmaha, NE 68114 3
## 11 Amazing MassageOmaha, NE 68135 3
## 12 Green World Thai massageOmaha, NE 68137 3
## 13 Holiday MassageOmaha, NE 68144 3
## 14 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 15 Asian MassageOmaha, NE 68114 3
## 16 Amazing MassageOmaha, NE 68135 3
## 17 Sala Thai MassageOmaha, NE 68116 4
## 18 Life Time3.6Omaha, NE 68130 30
## 19 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 20 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 21 Green World Thai SpaOmaha, NE 68137 30
## 22 Indo-Pak Massage TherapyOmaha, NE 30
## 23 Massage Envy3.2La Vista, NE 68138+2 locations 30
## 24 Hand and Stone3.0Omaha, NE 68114 30
## 25 Massage Heights3.1Omaha, NE 68106 30
## 26 Massage Envy3.2Bellevue, NE 68123 24
## 27 Green World Thai massageOmaha, NE 68137 3
## 28 Holiday MassageOmaha, NE 68144 3
## 29 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 30 Asian MassageOmaha, NE 68114 3
## 31 Amazing MassageOmaha, NE 68135 3
## 32 Sala Thai MassageOmaha, NE 68116 4
## 33 Life Time3.6Omaha, NE 68130 30
## 34 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 35 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 36 Green World Thai SpaOmaha, NE 68137 30
## 37 Indo-Pak Massage TherapyOmaha, NE 30
## 38 Massage Envy3.2La Vista, NE 68138+2 locations 30
## 39 Hand and Stone3.0Omaha, NE 68114 30
## 40 Massage Heights3.1Omaha, NE 68106 30
## 41 Massage Envy3.2Bellevue, NE 68123 24
## 42 Green World Thai massageOmaha, NE 68137 3
## 43 Holiday MassageOmaha, NE 68144 3
## 44 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 45 Asian MassageOmaha, NE 68114 3
## 46 Amazing MassageOmaha, NE 68135 3
## 47 Sala Thai MassageOmaha, NE 68116 4
## 48 Life Time3.6Omaha, NE 68130 30
## 49 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 50 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 51 Green World Thai SpaOmaha, NE 68137 30
## 52 Indo-Pak Massage TherapyOmaha, NE 30
## 53 Massage Envy3.2La Vista, NE 68138+2 locations 30
## 54 Hand and Stone3.0Omaha, NE 68114 30
## 55 Massage Heights3.1Omaha, NE 68106 30
## 56 Massage Envy3.2Bellevue, NE 68123 24
## 57 Green World Thai massageOmaha, NE 68137 3
## 58 Holiday MassageOmaha, NE 68144 3
## 59 Indo-Pak Massage TherapyOmaha, NE•Remote work available 5
## 60 Asian MassageOmaha, NE 68114 3
## 61 Amazing MassageOmaha, NE 68135 3
## 62 Sala Thai MassageOmaha, NE 68116 4
## 63 Life Time3.6Omaha, NE 68130 30
## 64 The Rehab GuruOmaha, NE 68154•Remote work available 27
## 65 Synergy Advanced Massage Therapy, LLCRalston, NE 68127 30
## 66 Green World Thai SpaOmaha, NE 68137 30
## 67 Indo-Pak Massage TherapyOmaha, NE 30
## 68 Massage Envy3.2La Vista, NE 68138+2 locations 30
## 69 Hand and Stone3.0Omaha, NE 68114 30
## 70 Massage Heights3.1Omaha, NE 68106 30
## 71 Massage Envy3.2Bellevue, NE 68123 24
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 24 70 50000 50000
## 2 24 70 50000 50000
## 3 24 70 50000 50000
## 4 24 70 50000 50000
## 5 24 70 50000 50000
## 6 24 70 50000 50000
## 7 24 70 50000 50000
## 8 24 70 50000 50000
## 9 24 70 50000 50000
## 10 24 70 50000 50000
## 11 24 70 50000 50000
## 12 24 70 50000 50000
## 13 24 70 50000 50000
## 14 24 70 50000 50000
## 15 24 70 50000 50000
## 16 24 70 50000 50000
## 17 24 70 50000 50000
## 18 24 70 50000 50000
## 19 24 70 50000 50000
## 20 24 70 50000 50000
## 21 24 70 50000 50000
## 22 24 70 50000 50000
## 23 24 70 50000 50000
## 24 24 70 50000 50000
## 25 24 70 50000 50000
## 26 24 70 50000 50000
## 27 24 70 50000 50000
## 28 24 70 50000 50000
## 29 24 70 50000 50000
## 30 24 70 50000 50000
## 31 24 70 50000 50000
## 32 24 70 50000 50000
## 33 24 70 50000 50000
## 34 24 70 50000 50000
## 35 24 70 50000 50000
## 36 24 70 50000 50000
## 37 24 70 50000 50000
## 38 24 70 50000 50000
## 39 24 70 50000 50000
## 40 24 70 50000 50000
## 41 24 70 50000 50000
## 42 24 70 50000 50000
## 43 24 70 50000 50000
## 44 24 70 50000 50000
## 45 24 70 50000 50000
## 46 24 70 50000 50000
## 47 24 70 50000 50000
## 48 24 70 50000 50000
## 49 24 70 50000 50000
## 50 24 70 50000 50000
## 51 24 70 50000 50000
## 52 24 70 50000 50000
## 53 24 70 50000 50000
## 54 24 70 50000 50000
## 55 24 70 50000 50000
## 56 24 70 50000 50000
## 57 24 70 50000 50000
## 58 24 70 50000 50000
## 59 24 70 50000 50000
## 60 24 70 50000 50000
## 61 24 70 50000 50000
## 62 24 70 50000 50000
## 63 24 70 50000 50000
## 64 24 70 50000 50000
## 65 24 70 50000 50000
## 66 24 70 50000 50000
## 67 24 70 50000 50000
## 68 24 70 50000 50000
## 69 24 70 50000 50000
## 70 24 70 50000 50000
## 71 24 70 50000 50000
Nevada Las Vegas, Henderson, Reno
getIndeedJobData5pages('massage therapist', 'Las Vegas','NV')
## Warning in getIndeedJobData5pages("massage therapist", "Las Vegas", "NV"): NAs
## introduced by coercion
## Warning in max(annual$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Las Vegas", "NV"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist / Full Time
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapists for Elite Mobile Massage Company
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist Start Today Great Team, Holistic...
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist Centennial Hills flexible hours! Medical b...
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist
## 16 Massage Therapist - Join our Team today!
## 17 Licensed Massage Therapist
## 18 Medical Massage Therapist - Female only
## 19 Licensed Massage Therapist
## 20 Massage Therapist Centennial Hills
## 21 Licensed Massage Therapist
## 22 Lead Massage Therapist - Mandara Spa - Las Vegas
## 23 Lead Massage Therapist
## 24 Licensed Massage Therapist Start Today Great Team, Holistic...
## 25 Massage Therapist Centennial Hills flexible hours! Medical b...
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist Centennial Hills
## 30 Licensed Massage Therapist
## 31 Lead Massage Therapist - Mandara Spa - Las Vegas
## 32 Lead Massage Therapist
## 33 Licensed Massage Therapists for Elite Mobile Massage Company
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist / Full Time
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Mobile Massage Therapist
## 39 Massage Therapist
## 40 Massage Therapist Centennial Gateway
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist Centennial Hills flexible hours! Medical b...
## 43 Massage Therapist - Join our Team today!
## 44 Medical Massage Therapist - Female only
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist Centennial Hills
## 48 Licensed Massage Therapist
## 49 Lead Massage Therapist - Mandara Spa - Las Vegas
## 50 Lead Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Mobile Massage Therapist
## 54 Massage Therapist
## 55 Massage Therapist Centennial Gateway
## 56 Licensed Massage Therapist (LMT)
## 57 Massage Therapist Centennial Hills flexible hours! Medical b...
## 58 Massage Therapist - Join our Team today!
## 59 Licensed Massage Therapist
## 60 Medical Massage Therapist - Female only
## 61 Licensed Massage Therapist
## 62 Massage Therapist Centennial Hills
## 63 Licensed Massage Therapist
## 64 Lead Massage Therapist - Mandara Spa - Las Vegas
## 65 Lead Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$4,600 - $5,100 a month $4600 - $5100 4600.00 5100
## 2 \n$23 - $26 an hour $23 - $26 23.00 26
## 3 \n$75 - $130 an hour $75 - $130 75.00 130
## 4 \n$500 - $800 a week $500 - $800 a week 500.00 NA
## 5 \n$17 - $60 an hour $17 - $60 17.00 60
## 6 \n$500 - $1,000 a week $500 - $1000 a week 500.00 NA
## 7 \n$48 - $90 an hour $48 - $90 48.00 90
## 8 \n$18 - $21 an hour $18 - $21 18.00 21
## 9 \n$29.99 - $30.00 an hour $29.99 - $30.00 29.99 30
## 10 \n$39,000 a year $39000 39000.00 NA
## 11 \n$17 - $20 an hour $17 - $20 17.00 20
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 13 \n$15 - $20 an hour $15 - $20 15.00 20
## 14 \n$10 - $20 an hour $10 - $20 10.00 20
## 15 \n$15 - $20 an hour $15 - $20 15.00 20
## 16 \n$500 - $1,000 a week $500 - $1000 a week 500.00 NA
## 17 \n$17 - $20 an hour $17 - $20 17.00 20
## 18 \n$17 - $60 an hour $17 - $60 17.00 60
## 19 \n$23 - $26 an hour $23 - $26 23.00 26
## 20 \n$15 - $20 an hour $15 - $20 15.00 20
## 21 \n$75 - $130 an hour $75 - $130 75.00 130
## 22 \n$500 - $800 a week $500 - $800 a week 500.00 NA
## 23 \n$4,600 - $5,100 a month $4600 - $5100 4600.00 5100
## 24 \n$24 - $30 an hour $24 - $30 24.00 30
## 25 \n$45 - $70 an hour $45 - $70 45.00 70
## 26 \n$15 - $20 an hour $15 - $20 15.00 20
## 27 \n$15 - $20 an hour $15 - $20 15.00 20
## 28 \n$17 - $20 an hour $17 - $20 17.00 20
## 29 \n$10 - $20 an hour $10 - $20 10.00 20
## 30 \n$15 - $20 an hour $15 - $20 15.00 20
## 31 \n$15 - $20 an hour $15 - $20 15.00 20
## 32 \n$45 - $70 an hour $45 - $70 45.00 70
## 33 \n$15 - $20 an hour $15 - $20 15.00 20
## 34 \n$15 - $20 an hour $15 - $20 15.00 20
## 35 \n$17 - $20 an hour $17 - $20 17.00 20
## 36 \n$15 - $20 an hour $15 - $20 15.00 20
## 37 \n$10 - $20 an hour $10 - $20 10.00 20
## 38 \n$15 - $20 an hour $15 - $20 15.00 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 17 20 1471.131 1115.577 10
## 2 17 20 1471.131 1115.577 10
## 3 17 20 1471.131 1115.577 10
## 4 17 20 1471.131 1115.577 10
## 5 17 20 1471.131 1115.577 10
## 6 17 20 1471.131 1115.577 10
## 7 17 20 1471.131 1115.577 10
## 8 17 20 1471.131 1115.577 10
## 9 17 20 1471.131 1115.577 10
## 10 17 20 1471.131 1115.577 10
## 11 17 20 1471.131 1115.577 10
## 12 17 20 1471.131 1115.577 10
## 13 17 20 1471.131 1115.577 10
## 14 17 20 1471.131 1115.577 10
## 15 17 20 1471.131 1115.577 10
## 16 17 20 1471.131 1115.577 10
## 17 17 20 1471.131 1115.577 10
## 18 17 20 1471.131 1115.577 10
## 19 17 20 1471.131 1115.577 10
## 20 17 20 1471.131 1115.577 10
## 21 17 20 1471.131 1115.577 10
## 22 17 20 1471.131 1115.577 10
## 23 17 20 1471.131 1115.577 10
## 24 17 20 1471.131 1115.577 10
## 25 17 20 1471.131 1115.577 10
## 26 17 20 1471.131 1115.577 10
## 27 17 20 1471.131 1115.577 10
## 28 17 20 1471.131 1115.577 10
## 29 17 20 1471.131 1115.577 10
## 30 17 20 1471.131 1115.577 10
## 31 17 20 1471.131 1115.577 10
## 32 17 20 1471.131 1115.577 10
## 33 17 20 1471.131 1115.577 10
## 34 17 20 1471.131 1115.577 10
## 35 17 20 1471.131 1115.577 10
## 36 17 20 1471.131 1115.577 10
## 37 17 20 1471.131 1115.577 10
## 38 17 20 1471.131 1115.577 10
## maximumMaxSalary
## 1 39000
## 2 39000
## 3 39000
## 4 39000
## 5 39000
## 6 39000
## 7 39000
## 8 39000
## 9 39000
## 10 39000
## 11 39000
## 12 39000
## 13 39000
## 14 39000
## 15 39000
## 16 39000
## 17 39000
## 18 39000
## 19 39000
## 20 39000
## 21 39000
## 22 39000
## 23 39000
## 24 39000
## 25 39000
## 26 39000
## 27 39000
## 28 39000
## 29 39000
## 30 39000
## 31 39000
## 32 39000
## 33 39000
## 34 39000
## 35 39000
## 36 39000
## 37 39000
## 38 39000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 7
## 3 9
## 4 30
## 5 24
## 6 30
## 7 30
## 8 7
## 9 30
## 10 Today
## 11 13
## 12 30
## 13 30
## 14 30
## 15 30
## 16 14
## 17 30
## 18 22
## 19 22
## 20 30
## 21 30
## 22 30
## 23 30
## 24 30
## 25 30
## 26 30
## 27 24
## 28 7
## 29 30
## 30 30
## 31 30
## 32 30
## 33 9
## 34 30
## 35 30
## 36 26
## 37 30
## 38 30
## 39 27
## 40 30
## 41 30
## 42 30
## 43 14
## 44 22
## 45 30
## 46 22
## 47 30
## 48 30
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 27
## 55 30
## 56 30
## 57 30
## 58 14
## 59 30
## 60 22
## 61 22
## 62 30
## 63 30
## 64 30
## 65 30
##
## [[4]]
## HiringAgency
## 1 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 2 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 3 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 4 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 5 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 6 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 7 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 8 Glam On CommandLas Vegas, NV
## 9 Close physical therapy3.3Las Vegas, NV 89121
## 10 Massage Heights - South Pointe Plaza3.1Henderson, NV 89052 (Westgate area)
## 11 A Touch of Las Vegas SpaLas Vegas, NV 89103 (Paradise area)
## 12 Elements3.6Las Vegas, NV 89117 (The Lakes area)+1 location
## 13 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 14 Indo-Pak Massage TherapyHenderson, NV+1 location•Remote work available
## 15 Life Time3.6Henderson, NV 89052 (Green Valley Ranch area)
## 16 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 17 Massage Envy Boca ParkLas Vegas, NV 89117
## 18 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 19 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 20 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 21 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 22 One Spa World3.8Las Vegas, NV 89109
## 23 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 24 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 25 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 26 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 27 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 28 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 29 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 30 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 31 One Spa World3.8Las Vegas, NV 89109
## 32 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 33 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 34 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 35 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 36 IMR Massage4.7Las Vegas, NV 89123 (Paradise area)
## 37 Hand and Stone3.0Las Vegas, NV 89183
## 38 Indo-Pak Massage TherapyLas Vegas, NV
## 39 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 40 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 41 Massage Envy Boca ParkLas Vegas, NV 89117
## 42 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 43 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 44 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 45 Massage Envy Boca ParkLas Vegas, NV 89117
## 46 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 47 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 48 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 49 One Spa World3.8Las Vegas, NV 89109
## 50 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 51 WTS International3.3Las Vegas, NV 89109
## 52 Hand and Stone3.0Las Vegas, NV 89183
## 53 Indo-Pak Massage TherapyLas Vegas, NV
## 54 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 55 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 56 Massage Envy Boca ParkLas Vegas, NV 89117
## 57 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 58 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 59 Massage Envy Boca ParkLas Vegas, NV 89117
## 60 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 61 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 62 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 63 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 64 One Spa World3.8Las Vegas, NV 89109
## 65 Massage Envy3.2Henderson, NV 89052 (Westgate area)
##
## [[5]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 10 \n$39,000 a year $39000 39000 NA 39000 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 10 39000 NaN 39000 -Inf
##
## [[6]]
## Salary salary minSalary maxSalary
## 2 \n$23 - $26 an hour $23 - $26 23.00 26
## 3 \n$75 - $130 an hour $75 - $130 75.00 130
## 5 \n$17 - $60 an hour $17 - $60 17.00 60
## 7 \n$48 - $90 an hour $48 - $90 48.00 90
## 8 \n$18 - $21 an hour $18 - $21 18.00 21
## 9 \n$29.99 - $30.00 an hour $29.99 - $30.00 29.99 30
## 11 \n$17 - $20 an hour $17 - $20 17.00 20
## 13 \n$15 - $20 an hour $15 - $20 15.00 20
## 14 \n$10 - $20 an hour $10 - $20 10.00 20
## 15 \n$15 - $20 an hour $15 - $20 15.00 20
## 17 \n$17 - $20 an hour $17 - $20 17.00 20
## 18 \n$17 - $60 an hour $17 - $60 17.00 60
## 19 \n$23 - $26 an hour $23 - $26 23.00 26
## 20 \n$15 - $20 an hour $15 - $20 15.00 20
## 21 \n$75 - $130 an hour $75 - $130 75.00 130
## 24 \n$24 - $30 an hour $24 - $30 24.00 30
## 25 \n$45 - $70 an hour $45 - $70 45.00 70
## 26 \n$15 - $20 an hour $15 - $20 15.00 20
## 27 \n$15 - $20 an hour $15 - $20 15.00 20
## 28 \n$17 - $20 an hour $17 - $20 17.00 20
## 29 \n$10 - $20 an hour $10 - $20 10.00 20
## 30 \n$15 - $20 an hour $15 - $20 15.00 20
## 31 \n$15 - $20 an hour $15 - $20 15.00 20
## 32 \n$45 - $70 an hour $45 - $70 45.00 70
## 33 \n$15 - $20 an hour $15 - $20 15.00 20
## 34 \n$15 - $20 an hour $15 - $20 15.00 20
## 35 \n$17 - $20 an hour $17 - $20 17.00 20
## 36 \n$15 - $20 an hour $15 - $20 15.00 20
## 37 \n$10 - $20 an hour $10 - $20 10.00 20
## 38 \n$15 - $20 an hour $15 - $20 15.00 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 17 20 23.433 36.76667 10
## 3 17 20 23.433 36.76667 10
## 5 17 20 23.433 36.76667 10
## 7 17 20 23.433 36.76667 10
## 8 17 20 23.433 36.76667 10
## 9 17 20 23.433 36.76667 10
## 11 17 20 23.433 36.76667 10
## 13 17 20 23.433 36.76667 10
## 14 17 20 23.433 36.76667 10
## 15 17 20 23.433 36.76667 10
## 17 17 20 23.433 36.76667 10
## 18 17 20 23.433 36.76667 10
## 19 17 20 23.433 36.76667 10
## 20 17 20 23.433 36.76667 10
## 21 17 20 23.433 36.76667 10
## 24 17 20 23.433 36.76667 10
## 25 17 20 23.433 36.76667 10
## 26 17 20 23.433 36.76667 10
## 27 17 20 23.433 36.76667 10
## 28 17 20 23.433 36.76667 10
## 29 17 20 23.433 36.76667 10
## 30 17 20 23.433 36.76667 10
## 31 17 20 23.433 36.76667 10
## 32 17 20 23.433 36.76667 10
## 33 17 20 23.433 36.76667 10
## 34 17 20 23.433 36.76667 10
## 35 17 20 23.433 36.76667 10
## 36 17 20 23.433 36.76667 10
## 37 17 20 23.433 36.76667 10
## 38 17 20 23.433 36.76667 10
## maximumMaxSalary
## 2 130
## 3 130
## 5 130
## 7 130
## 8 130
## 9 130
## 11 130
## 13 130
## 14 130
## 15 130
## 17 130
## 18 130
## 19 130
## 20 130
## 21 130
## 24 130
## 25 130
## 26 130
## 27 130
## 28 130
## 29 130
## 30 130
## 31 130
## 32 130
## 33 130
## 34 130
## 35 130
## 36 130
## 37 130
## 38 130
##
## [[7]]
## city state
## 1 Las Vegas NV
## 2 Las Vegas NV
## 3 Las Vegas NV
## 4 Las Vegas NV
## 5 Las Vegas NV
## 6 Las Vegas NV
## 7 Las Vegas NV
## 8 Las Vegas NV
## 9 Las Vegas NV
## 10 Las Vegas NV
## 11 Las Vegas NV
## 12 Las Vegas NV
## 13 Las Vegas NV
## 14 Las Vegas NV
## 15 Las Vegas NV
## 16 Las Vegas NV
## 17 Las Vegas NV
## 18 Las Vegas NV
## 19 Las Vegas NV
## 20 Las Vegas NV
## 21 Las Vegas NV
## 22 Las Vegas NV
## 23 Las Vegas NV
## 24 Las Vegas NV
## 25 Las Vegas NV
## 26 Las Vegas NV
## 27 Las Vegas NV
## 28 Las Vegas NV
## 29 Las Vegas NV
## 30 Las Vegas NV
## 31 Las Vegas NV
## 32 Las Vegas NV
## 33 Las Vegas NV
## 34 Las Vegas NV
## 35 Las Vegas NV
## 36 Las Vegas NV
## 37 Las Vegas NV
## 38 Las Vegas NV
## 39 Las Vegas NV
## 40 Las Vegas NV
## 41 Las Vegas NV
## 42 Las Vegas NV
## 43 Las Vegas NV
## 44 Las Vegas NV
## 45 Las Vegas NV
## 46 Las Vegas NV
## 47 Las Vegas NV
## 48 Las Vegas NV
## 49 Las Vegas NV
## 50 Las Vegas NV
## 51 Las Vegas NV
## 52 Las Vegas NV
## 53 Las Vegas NV
## 54 Las Vegas NV
## 55 Las Vegas NV
## 56 Las Vegas NV
## 57 Las Vegas NV
## 58 Las Vegas NV
## 59 Las Vegas NV
## 60 Las Vegas NV
## 61 Las Vegas NV
## 62 Las Vegas NV
## 63 Las Vegas NV
## 64 Las Vegas NV
## 65 Las Vegas NV
## jobTitle
## 1 Licensed Massage Therapist / Full Time
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapists for Elite Mobile Massage Company
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist Start Today Great Team, Holistic...
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist Centennial Hills flexible hours! Medical b...
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist
## 16 Massage Therapist - Join our Team today!
## 17 Licensed Massage Therapist
## 18 Medical Massage Therapist - Female only
## 19 Licensed Massage Therapist
## 20 Massage Therapist Centennial Hills
## 21 Licensed Massage Therapist
## 22 Lead Massage Therapist - Mandara Spa - Las Vegas
## 23 Lead Massage Therapist
## 24 Licensed Massage Therapist Start Today Great Team, Holistic...
## 25 Massage Therapist Centennial Hills flexible hours! Medical b...
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Massage Therapist Centennial Hills
## 30 Licensed Massage Therapist
## 31 Lead Massage Therapist - Mandara Spa - Las Vegas
## 32 Lead Massage Therapist
## 33 Licensed Massage Therapists for Elite Mobile Massage Company
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist / Full Time
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Mobile Massage Therapist
## 39 Massage Therapist
## 40 Massage Therapist Centennial Gateway
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist Centennial Hills flexible hours! Medical b...
## 43 Massage Therapist - Join our Team today!
## 44 Medical Massage Therapist - Female only
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist Centennial Hills
## 48 Licensed Massage Therapist
## 49 Lead Massage Therapist - Mandara Spa - Las Vegas
## 50 Lead Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Mobile Massage Therapist
## 54 Massage Therapist
## 55 Massage Therapist Centennial Gateway
## 56 Licensed Massage Therapist (LMT)
## 57 Massage Therapist Centennial Hills flexible hours! Medical b...
## 58 Massage Therapist - Join our Team today!
## 59 Licensed Massage Therapist
## 60 Medical Massage Therapist - Female only
## 61 Licensed Massage Therapist
## 62 Massage Therapist Centennial Hills
## 63 Licensed Massage Therapist
## 64 Lead Massage Therapist - Mandara Spa - Las Vegas
## 65 Lead Massage Therapist
## HiringAgency
## 1 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 2 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 3 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 4 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 5 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 6 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 7 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 8 Glam On CommandLas Vegas, NV
## 9 Close physical therapy3.3Las Vegas, NV 89121
## 10 Massage Heights - South Pointe Plaza3.1Henderson, NV 89052 (Westgate area)
## 11 A Touch of Las Vegas SpaLas Vegas, NV 89103 (Paradise area)
## 12 Elements3.6Las Vegas, NV 89117 (The Lakes area)+1 location
## 13 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 14 Indo-Pak Massage TherapyHenderson, NV+1 location•Remote work available
## 15 Life Time3.6Henderson, NV 89052 (Green Valley Ranch area)
## 16 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 17 Massage Envy Boca ParkLas Vegas, NV 89117
## 18 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 19 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 20 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 21 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 22 One Spa World3.8Las Vegas, NV 89109
## 23 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 24 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 25 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 26 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 27 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 28 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 29 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 30 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 31 One Spa World3.8Las Vegas, NV 89109
## 32 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 33 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 34 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 35 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 36 IMR Massage4.7Las Vegas, NV 89123 (Paradise area)
## 37 Hand and Stone3.0Las Vegas, NV 89183
## 38 Indo-Pak Massage TherapyLas Vegas, NV
## 39 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 40 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 41 Massage Envy Boca ParkLas Vegas, NV 89117
## 42 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 43 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 44 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 45 Massage Envy Boca ParkLas Vegas, NV 89117
## 46 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 47 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 48 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 49 One Spa World3.8Las Vegas, NV 89109
## 50 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 51 WTS International3.3Las Vegas, NV 89109
## 52 Hand and Stone3.0Las Vegas, NV 89183
## 53 Indo-Pak Massage TherapyLas Vegas, NV
## 54 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 55 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 56 Massage Envy Boca ParkLas Vegas, NV 89117
## 57 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 58 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 59 Massage Envy Boca ParkLas Vegas, NV 89117
## 60 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 61 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 62 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 63 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 64 One Spa World3.8Las Vegas, NV 89109
## 65 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 10 130 39000 39000
## 2 7 10 130 39000 39000
## 3 9 10 130 39000 39000
## 4 30 10 130 39000 39000
## 5 24 10 130 39000 39000
## 6 30 10 130 39000 39000
## 7 30 10 130 39000 39000
## 8 7 10 130 39000 39000
## 9 30 10 130 39000 39000
## 10 Today 10 130 39000 39000
## 11 13 10 130 39000 39000
## 12 30 10 130 39000 39000
## 13 30 10 130 39000 39000
## 14 30 10 130 39000 39000
## 15 30 10 130 39000 39000
## 16 14 10 130 39000 39000
## 17 30 10 130 39000 39000
## 18 22 10 130 39000 39000
## 19 22 10 130 39000 39000
## 20 30 10 130 39000 39000
## 21 30 10 130 39000 39000
## 22 30 10 130 39000 39000
## 23 30 10 130 39000 39000
## 24 30 10 130 39000 39000
## 25 30 10 130 39000 39000
## 26 30 10 130 39000 39000
## 27 24 10 130 39000 39000
## 28 7 10 130 39000 39000
## 29 30 10 130 39000 39000
## 30 30 10 130 39000 39000
## 31 30 10 130 39000 39000
## 32 30 10 130 39000 39000
## 33 9 10 130 39000 39000
## 34 30 10 130 39000 39000
## 35 30 10 130 39000 39000
## 36 26 10 130 39000 39000
## 37 30 10 130 39000 39000
## 38 30 10 130 39000 39000
## 39 27 10 130 39000 39000
## 40 30 10 130 39000 39000
## 41 30 10 130 39000 39000
## 42 30 10 130 39000 39000
## 43 14 10 130 39000 39000
## 44 22 10 130 39000 39000
## 45 30 10 130 39000 39000
## 46 22 10 130 39000 39000
## 47 30 10 130 39000 39000
## 48 30 10 130 39000 39000
## 49 30 10 130 39000 39000
## 50 30 10 130 39000 39000
## 51 30 10 130 39000 39000
## 52 30 10 130 39000 39000
## 53 30 10 130 39000 39000
## 54 27 10 130 39000 39000
## 55 30 10 130 39000 39000
## 56 30 10 130 39000 39000
## 57 30 10 130 39000 39000
## 58 14 10 130 39000 39000
## 59 30 10 130 39000 39000
## 60 22 10 130 39000 39000
## 61 22 10 130 39000 39000
## 62 30 10 130 39000 39000
## 63 30 10 130 39000 39000
## 64 30 10 130 39000 39000
## 65 30 10 130 39000 39000
getIndeedJobData5pages('massage therapist', 'HEnderson','NV')
## Warning in getIndeedJobData5pages("massage therapist", "HEnderson", "NV"): NAs
## introduced by coercion
## Warning in max(annual$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "HEnderson", "NV"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist / Full Time
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist Start Today Great Team, Holistic...
## 4 Licensed Massage Therapists for Elite Mobile Massage Company
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Massage Therapist
## 12 Massage Therapist- Full or Part Time (Henderson, NV)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapists for Elite Mobile Massage Company
## 17 Licensed Massage Therapist Start Today Great Team, Holistic...
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist Centennial Gateway
## 26 Mobile Massage Therapist
## 27 Lead Massage Therapist
## 28 Medical Massage Therapist - Female only
## 29 Licensed Massage Therapist (LMT)
## 30 Massage Therapist Centennial Hills flexible hours! Medical b...
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist / Full Time
## 33 Licensed Massage Therapist Start Today Great Team, Holistic...
## 34 Massage Therapist Centennial Hills flexible hours! Medical b...
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapists for Elite Mobile Massage Company
## 37 Licensed Massage Therapist
## 38 Massage Therapist Centennial Hills
## 39 Licensed Massage Therapist
## 40 Massage Therapist - Join our Team today!
## 41 Lead Massage Therapist - Mandara Spa - Las Vegas
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist / Full Time
## 45 Licensed Massage Therapist
## 46 Massage Therapist Centennial Gateway
## 47 Mobile Massage Therapist
## 48 Lead Massage Therapist
## 49 Medical Massage Therapist - Female only
## 50 Licensed Massage Therapist (LMT)
## 51 Massage Therapist Centennial Hills
## 52 Licensed Massage Therapist
## 53 Massage Therapist - Join our Team today!
## 54 Lead Massage Therapist - Mandara Spa - Las Vegas
## 55 Massage Therapist Centennial Hills flexible hours! Medical b...
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapists for Elite Mobile Massage Company
## 59 Licensed Massage Therapist Start Today Great Team, Holistic...
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist / Full Time
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist Centennial Gateway
## 69 Massage Therapist Centennial Hills flexible hours! Medical b...
## 70 Mobile Massage Therapist
## 71 Lead Massage Therapist
## 72 Medical Massage Therapist - Female only
## 73 Licensed Massage Therapist (LMT)
## 74 Massage Therapist Centennial Hills
## 75 Licensed Massage Therapist
## 76 Massage Therapist - Join our Team today!
## 77 Lead Massage Therapist - Mandara Spa - Las Vegas
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$4,600 - $5,100 a month $4600 - $5100 4600.00 5100
## 2 \n$500 - $800 a week $500 - $800 a week 500.00 NA
## 3 \n$500 - $1,000 a week $500 - $1000 a week 500.00 NA
## 4 \n$75 - $130 an hour $75 - $130 75.00 130
## 5 \n$17 - $60 an hour $17 - $60 17.00 60
## 6 \n$18 - $21 an hour $18 - $21 18.00 21
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 8 \n$48 - $90 an hour $48 - $90 48.00 90
## 9 \n$39,000 a year $39000 39000.00 NA
## 10 \n$29.99 - $30.00 an hour $29.99 - $30.00 29.99 30
## 11 \n$23 - $26 an hour $23 - $26 23.00 26
## 12 \n$75 - $130 an hour $75 - $130 75.00 130
## 13 \n$500 - $1,000 a week $500 - $1000 a week 500.00 NA
## 14 \n$23 - $26 an hour $23 - $26 23.00 26
## 15 \n$500 - $800 a week $500 - $800 a week 500.00 NA
## 16 \n$30 - $45 an hour $30 - $45 30.00 45
## 17 \n$15 - $20 an hour $15 - $20 15.00 20
## 18 \n$45 - $70 an hour $45 - $70 45.00 70
## 19 \n$10 - $20 an hour $10 - $20 10.00 20
## 20 \n$15 - $20 an hour $15 - $20 15.00 20
## 21 \n$17 - $20 an hour $17 - $20 17.00 20
## 22 \n$17 - $60 an hour $17 - $60 17.00 60
## 23 \n$4,600 - $5,100 a month $4600 - $5100 4600.00 5100
## 24 \n$500 - $1,000 a week $500 - $1000 a week 500.00 NA
## 25 \n$17 - $20 an hour $17 - $20 17.00 20
## 26 \n$17 - $60 an hour $17 - $60 17.00 60
## 27 \n$75 - $130 an hour $75 - $130 75.00 130
## 28 \n$23 - $26 an hour $23 - $26 23.00 26
## 29 \n$15 - $20 an hour $15 - $20 15.00 20
## 30 \n$15 - $20 an hour $15 - $20 15.00 20
## 31 \n$500 - $800 a week $500 - $800 a week 500.00 NA
## 32 \n$4,600 - $5,100 a month $4600 - $5100 4600.00 5100
## 33 \n$15 - $20 an hour $15 - $20 15.00 20
## 34 \n$45 - $70 an hour $45 - $70 45.00 70
## 35 \n$10 - $20 an hour $10 - $20 10.00 20
## 36 \n$15 - $20 an hour $15 - $20 15.00 20
## 37 \n$15 - $20 an hour $15 - $20 15.00 20
## 38 \n$15 - $20 an hour $15 - $20 15.00 20
## 39 \n$17 - $20 an hour $17 - $20 17.00 20
## 40 \n$17 - $60 an hour $17 - $60 17.00 60
## 41 \n$75 - $130 an hour $75 - $130 75.00 130
## 42 \n$500 - $1,000 a week $500 - $1000 a week 500.00 NA
## 43 \n$23 - $26 an hour $23 - $26 23.00 26
## 44 \n$500 - $800 a week $500 - $800 a week 500.00 NA
## 45 \n$4,600 - $5,100 a month $4600 - $5100 4600.00 5100
## 46 \n$30 - $45 an hour $30 - $45 30.00 45
## 47 \n$15 - $20 an hour $15 - $20 15.00 20
## 48 \n$17 - $20 an hour $17 - $20 17.00 20
## 49 \n$45 - $70 an hour $45 - $70 45.00 70
## 50 \n$10 - $20 an hour $10 - $20 10.00 20
## 51 \n$15 - $20 an hour $15 - $20 15.00 20
## 52 \n$15 - $20 an hour $15 - $20 15.00 20
## 53 \n$15 - $20 an hour $15 - $20 15.00 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 23 26 1272.245 1046.536 10
## 2 23 26 1272.245 1046.536 10
## 3 23 26 1272.245 1046.536 10
## 4 23 26 1272.245 1046.536 10
## 5 23 26 1272.245 1046.536 10
## 6 23 26 1272.245 1046.536 10
## 7 23 26 1272.245 1046.536 10
## 8 23 26 1272.245 1046.536 10
## 9 23 26 1272.245 1046.536 10
## 10 23 26 1272.245 1046.536 10
## 11 23 26 1272.245 1046.536 10
## 12 23 26 1272.245 1046.536 10
## 13 23 26 1272.245 1046.536 10
## 14 23 26 1272.245 1046.536 10
## 15 23 26 1272.245 1046.536 10
## 16 23 26 1272.245 1046.536 10
## 17 23 26 1272.245 1046.536 10
## 18 23 26 1272.245 1046.536 10
## 19 23 26 1272.245 1046.536 10
## 20 23 26 1272.245 1046.536 10
## 21 23 26 1272.245 1046.536 10
## 22 23 26 1272.245 1046.536 10
## 23 23 26 1272.245 1046.536 10
## 24 23 26 1272.245 1046.536 10
## 25 23 26 1272.245 1046.536 10
## 26 23 26 1272.245 1046.536 10
## 27 23 26 1272.245 1046.536 10
## 28 23 26 1272.245 1046.536 10
## 29 23 26 1272.245 1046.536 10
## 30 23 26 1272.245 1046.536 10
## 31 23 26 1272.245 1046.536 10
## 32 23 26 1272.245 1046.536 10
## 33 23 26 1272.245 1046.536 10
## 34 23 26 1272.245 1046.536 10
## 35 23 26 1272.245 1046.536 10
## 36 23 26 1272.245 1046.536 10
## 37 23 26 1272.245 1046.536 10
## 38 23 26 1272.245 1046.536 10
## 39 23 26 1272.245 1046.536 10
## 40 23 26 1272.245 1046.536 10
## 41 23 26 1272.245 1046.536 10
## 42 23 26 1272.245 1046.536 10
## 43 23 26 1272.245 1046.536 10
## 44 23 26 1272.245 1046.536 10
## 45 23 26 1272.245 1046.536 10
## 46 23 26 1272.245 1046.536 10
## 47 23 26 1272.245 1046.536 10
## 48 23 26 1272.245 1046.536 10
## 49 23 26 1272.245 1046.536 10
## 50 23 26 1272.245 1046.536 10
## 51 23 26 1272.245 1046.536 10
## 52 23 26 1272.245 1046.536 10
## 53 23 26 1272.245 1046.536 10
## maximumMaxSalary
## 1 39000
## 2 39000
## 3 39000
## 4 39000
## 5 39000
## 6 39000
## 7 39000
## 8 39000
## 9 39000
## 10 39000
## 11 39000
## 12 39000
## 13 39000
## 14 39000
## 15 39000
## 16 39000
## 17 39000
## 18 39000
## 19 39000
## 20 39000
## 21 39000
## 22 39000
## 23 39000
## 24 39000
## 25 39000
## 26 39000
## 27 39000
## 28 39000
## 29 39000
## 30 39000
## 31 39000
## 32 39000
## 33 39000
## 34 39000
## 35 39000
## 36 39000
## 37 39000
## 38 39000
## 39 39000
## 40 39000
## 41 39000
## 42 39000
## 43 39000
## 44 39000
## 45 39000
## 46 39000
## 47 39000
## 48 39000
## 49 39000
## 50 39000
## 51 39000
## 52 39000
## 53 39000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 30
## 4 9
## 5 30
## 6 30
## 7 Today
## 8 30
## 9 30
## 10 7
## 11 30
## 12 30
## 13 13
## 14 24
## 15 7
## 16 9
## 17 30
## 18 7
## 19 30
## 20 24
## 21 30
## 22 27
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 22
## 29 30
## 30 30
## 31 30
## 32 30
## 33 30
## 34 30
## 35 30
## 36 9
## 37 7
## 38 30
## 39 30
## 40 14
## 41 30
## 42 30
## 43 24
## 44 30
## 45 30
## 46 30
## 47 30
## 48 30
## 49 22
## 50 30
## 51 30
## 52 30
## 53 14
## 54 30
## 55 30
## 56 30
## 57 24
## 58 9
## 59 30
## 60 7
## 61 30
## 62 30
## 63 22
## 64 30
## 65 27
## 66 30
## 67 30
## 68 30
## 69 30
## 70 30
## 71 30
## 72 22
## 73 30
## 74 30
## 75 30
## 76 14
## 77 30
##
## [[4]]
## HiringAgency
## 1 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 2 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 3 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 4 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 5 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 6 Close physical therapy3.3Las Vegas, NV 89121
## 7 Massage Heights - South Pointe Plaza3.1Henderson, NV 89052 (Westgate area)
## 8 Indo-Pak Massage TherapyHenderson, NV+1 location•Remote work available
## 9 Life Time3.6Henderson, NV 89052 (Green Valley Ranch area)
## 10 Glam On CommandLas Vegas, NV
## 11 Elements3.6Henderson, NV 89052 (Westgate area)+1 location
## 12 The NOW, LLCHenderson, NV 89012 (Macdonald Ranch area)
## 13 A Touch of Las Vegas SpaLas Vegas, NV 89103 (Paradise area)
## 14 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 15 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 16 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 17 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 18 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 19 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 20 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 21 Neko Massage StudioLas Vegas, NV 89101 (Downtown area)
## 22 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 23 Hand and Stone3.0Las Vegas, NV 89183
## 24 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 25 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 26 Indo-Pak Massage TherapyLas Vegas, NV
## 27 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 28 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 29 Massage Envy Boca ParkLas Vegas, NV 89117
## 30 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 31 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 32 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 33 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 34 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 35 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 36 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 37 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 38 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 39 Massage Envy Boca ParkLas Vegas, NV 89117
## 40 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 41 One Spa World3.8Las Vegas, NV 89109
## 42 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 43 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 44 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 45 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 46 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 47 Indo-Pak Massage TherapyLas Vegas, NV
## 48 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 49 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 50 Massage Envy Boca ParkLas Vegas, NV 89117
## 51 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 52 Massage Envy Boca ParkLas Vegas, NV 89117
## 53 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 54 One Spa World3.8Las Vegas, NV 89109
## 55 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 56 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 57 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 58 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 59 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 60 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 61 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 62 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 63 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 64 Neko Massage StudioLas Vegas, NV 89101 (Downtown area)
## 65 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 66 Hand and Stone3.0Las Vegas, NV 89183
## 67 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 68 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 69 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 70 Indo-Pak Massage TherapyLas Vegas, NV
## 71 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 72 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 73 Massage Envy Boca ParkLas Vegas, NV 89117
## 74 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 75 Massage Envy Boca ParkLas Vegas, NV 89117
## 76 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 77 One Spa World3.8Las Vegas, NV 89109
##
## [[5]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 9 \n$39,000 a year $39000 39000 NA 39000 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 9 39000 NaN 39000 -Inf
##
## [[6]]
## Salary salary minSalary maxSalary
## 4 \n$75 - $130 an hour $75 - $130 75.00 130
## 5 \n$17 - $60 an hour $17 - $60 17.00 60
## 6 \n$18 - $21 an hour $18 - $21 18.00 21
## 8 \n$48 - $90 an hour $48 - $90 48.00 90
## 10 \n$29.99 - $30.00 an hour $29.99 - $30.00 29.99 30
## 11 \n$23 - $26 an hour $23 - $26 23.00 26
## 12 \n$75 - $130 an hour $75 - $130 75.00 130
## 14 \n$23 - $26 an hour $23 - $26 23.00 26
## 16 \n$30 - $45 an hour $30 - $45 30.00 45
## 17 \n$15 - $20 an hour $15 - $20 15.00 20
## 18 \n$45 - $70 an hour $45 - $70 45.00 70
## 19 \n$10 - $20 an hour $10 - $20 10.00 20
## 20 \n$15 - $20 an hour $15 - $20 15.00 20
## 21 \n$17 - $20 an hour $17 - $20 17.00 20
## 22 \n$17 - $60 an hour $17 - $60 17.00 60
## 25 \n$17 - $20 an hour $17 - $20 17.00 20
## 26 \n$17 - $60 an hour $17 - $60 17.00 60
## 27 \n$75 - $130 an hour $75 - $130 75.00 130
## 28 \n$23 - $26 an hour $23 - $26 23.00 26
## 29 \n$15 - $20 an hour $15 - $20 15.00 20
## 30 \n$15 - $20 an hour $15 - $20 15.00 20
## 33 \n$15 - $20 an hour $15 - $20 15.00 20
## 34 \n$45 - $70 an hour $45 - $70 45.00 70
## 35 \n$10 - $20 an hour $10 - $20 10.00 20
## 36 \n$15 - $20 an hour $15 - $20 15.00 20
## 37 \n$15 - $20 an hour $15 - $20 15.00 20
## 38 \n$15 - $20 an hour $15 - $20 15.00 20
## 39 \n$17 - $20 an hour $17 - $20 17.00 20
## 40 \n$17 - $60 an hour $17 - $60 17.00 60
## 41 \n$75 - $130 an hour $75 - $130 75.00 130
## 43 \n$23 - $26 an hour $23 - $26 23.00 26
## 46 \n$30 - $45 an hour $30 - $45 30.00 45
## 47 \n$15 - $20 an hour $15 - $20 15.00 20
## 48 \n$17 - $20 an hour $17 - $20 17.00 20
## 49 \n$45 - $70 an hour $45 - $70 45.00 70
## 50 \n$10 - $20 an hour $10 - $20 10.00 20
## 51 \n$15 - $20 an hour $15 - $20 15.00 20
## 52 \n$15 - $20 an hour $15 - $20 15.00 20
## 53 \n$15 - $20 an hour $15 - $20 15.00 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 4 17 21 26.38436 43.20513 10
## 5 17 21 26.38436 43.20513 10
## 6 17 21 26.38436 43.20513 10
## 8 17 21 26.38436 43.20513 10
## 10 17 21 26.38436 43.20513 10
## 11 17 21 26.38436 43.20513 10
## 12 17 21 26.38436 43.20513 10
## 14 17 21 26.38436 43.20513 10
## 16 17 21 26.38436 43.20513 10
## 17 17 21 26.38436 43.20513 10
## 18 17 21 26.38436 43.20513 10
## 19 17 21 26.38436 43.20513 10
## 20 17 21 26.38436 43.20513 10
## 21 17 21 26.38436 43.20513 10
## 22 17 21 26.38436 43.20513 10
## 25 17 21 26.38436 43.20513 10
## 26 17 21 26.38436 43.20513 10
## 27 17 21 26.38436 43.20513 10
## 28 17 21 26.38436 43.20513 10
## 29 17 21 26.38436 43.20513 10
## 30 17 21 26.38436 43.20513 10
## 33 17 21 26.38436 43.20513 10
## 34 17 21 26.38436 43.20513 10
## 35 17 21 26.38436 43.20513 10
## 36 17 21 26.38436 43.20513 10
## 37 17 21 26.38436 43.20513 10
## 38 17 21 26.38436 43.20513 10
## 39 17 21 26.38436 43.20513 10
## 40 17 21 26.38436 43.20513 10
## 41 17 21 26.38436 43.20513 10
## 43 17 21 26.38436 43.20513 10
## 46 17 21 26.38436 43.20513 10
## 47 17 21 26.38436 43.20513 10
## 48 17 21 26.38436 43.20513 10
## 49 17 21 26.38436 43.20513 10
## 50 17 21 26.38436 43.20513 10
## 51 17 21 26.38436 43.20513 10
## 52 17 21 26.38436 43.20513 10
## 53 17 21 26.38436 43.20513 10
## maximumMaxSalary
## 4 130
## 5 130
## 6 130
## 8 130
## 10 130
## 11 130
## 12 130
## 14 130
## 16 130
## 17 130
## 18 130
## 19 130
## 20 130
## 21 130
## 22 130
## 25 130
## 26 130
## 27 130
## 28 130
## 29 130
## 30 130
## 33 130
## 34 130
## 35 130
## 36 130
## 37 130
## 38 130
## 39 130
## 40 130
## 41 130
## 43 130
## 46 130
## 47 130
## 48 130
## 49 130
## 50 130
## 51 130
## 52 130
## 53 130
##
## [[7]]
## city state
## 1 HEnderson NV
## 2 HEnderson NV
## 3 HEnderson NV
## 4 HEnderson NV
## 5 HEnderson NV
## 6 HEnderson NV
## 7 HEnderson NV
## 8 HEnderson NV
## 9 HEnderson NV
## 10 HEnderson NV
## 11 HEnderson NV
## 12 HEnderson NV
## 13 HEnderson NV
## 14 HEnderson NV
## 15 HEnderson NV
## 16 HEnderson NV
## 17 HEnderson NV
## 18 HEnderson NV
## 19 HEnderson NV
## 20 HEnderson NV
## 21 HEnderson NV
## 22 HEnderson NV
## 23 HEnderson NV
## 24 HEnderson NV
## 25 HEnderson NV
## 26 HEnderson NV
## 27 HEnderson NV
## 28 HEnderson NV
## 29 HEnderson NV
## 30 HEnderson NV
## 31 HEnderson NV
## 32 HEnderson NV
## 33 HEnderson NV
## 34 HEnderson NV
## 35 HEnderson NV
## 36 HEnderson NV
## 37 HEnderson NV
## 38 HEnderson NV
## 39 HEnderson NV
## 40 HEnderson NV
## 41 HEnderson NV
## 42 HEnderson NV
## 43 HEnderson NV
## 44 HEnderson NV
## 45 HEnderson NV
## 46 HEnderson NV
## 47 HEnderson NV
## 48 HEnderson NV
## 49 HEnderson NV
## 50 HEnderson NV
## 51 HEnderson NV
## 52 HEnderson NV
## 53 HEnderson NV
## 54 HEnderson NV
## 55 HEnderson NV
## 56 HEnderson NV
## 57 HEnderson NV
## 58 HEnderson NV
## 59 HEnderson NV
## 60 HEnderson NV
## 61 HEnderson NV
## 62 HEnderson NV
## 63 HEnderson NV
## 64 HEnderson NV
## 65 HEnderson NV
## 66 HEnderson NV
## 67 HEnderson NV
## 68 HEnderson NV
## 69 HEnderson NV
## 70 HEnderson NV
## 71 HEnderson NV
## 72 HEnderson NV
## 73 HEnderson NV
## 74 HEnderson NV
## 75 HEnderson NV
## 76 HEnderson NV
## 77 HEnderson NV
## jobTitle
## 1 Licensed Massage Therapist / Full Time
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist Start Today Great Team, Holistic...
## 4 Licensed Massage Therapists for Elite Mobile Massage Company
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Massage Therapist
## 12 Massage Therapist- Full or Part Time (Henderson, NV)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapists for Elite Mobile Massage Company
## 17 Licensed Massage Therapist Start Today Great Team, Holistic...
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist Centennial Gateway
## 26 Mobile Massage Therapist
## 27 Lead Massage Therapist
## 28 Medical Massage Therapist - Female only
## 29 Licensed Massage Therapist (LMT)
## 30 Massage Therapist Centennial Hills flexible hours! Medical b...
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist / Full Time
## 33 Licensed Massage Therapist Start Today Great Team, Holistic...
## 34 Massage Therapist Centennial Hills flexible hours! Medical b...
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapists for Elite Mobile Massage Company
## 37 Licensed Massage Therapist
## 38 Massage Therapist Centennial Hills
## 39 Licensed Massage Therapist
## 40 Massage Therapist - Join our Team today!
## 41 Lead Massage Therapist - Mandara Spa - Las Vegas
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist / Full Time
## 45 Licensed Massage Therapist
## 46 Massage Therapist Centennial Gateway
## 47 Mobile Massage Therapist
## 48 Lead Massage Therapist
## 49 Medical Massage Therapist - Female only
## 50 Licensed Massage Therapist (LMT)
## 51 Massage Therapist Centennial Hills
## 52 Licensed Massage Therapist
## 53 Massage Therapist - Join our Team today!
## 54 Lead Massage Therapist - Mandara Spa - Las Vegas
## 55 Massage Therapist Centennial Hills flexible hours! Medical b...
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapists for Elite Mobile Massage Company
## 59 Licensed Massage Therapist Start Today Great Team, Holistic...
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist / Full Time
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist Centennial Gateway
## 69 Massage Therapist Centennial Hills flexible hours! Medical b...
## 70 Mobile Massage Therapist
## 71 Lead Massage Therapist
## 72 Medical Massage Therapist - Female only
## 73 Licensed Massage Therapist (LMT)
## 74 Massage Therapist Centennial Hills
## 75 Licensed Massage Therapist
## 76 Massage Therapist - Join our Team today!
## 77 Lead Massage Therapist - Mandara Spa - Las Vegas
## HiringAgency
## 1 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 2 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 3 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 4 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 5 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 6 Close physical therapy3.3Las Vegas, NV 89121
## 7 Massage Heights - South Pointe Plaza3.1Henderson, NV 89052 (Westgate area)
## 8 Indo-Pak Massage TherapyHenderson, NV+1 location•Remote work available
## 9 Life Time3.6Henderson, NV 89052 (Green Valley Ranch area)
## 10 Glam On CommandLas Vegas, NV
## 11 Elements3.6Henderson, NV 89052 (Westgate area)+1 location
## 12 The NOW, LLCHenderson, NV 89012 (Macdonald Ranch area)
## 13 A Touch of Las Vegas SpaLas Vegas, NV 89103 (Paradise area)
## 14 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 15 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 16 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 17 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 18 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 19 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 20 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 21 Neko Massage StudioLas Vegas, NV 89101 (Downtown area)
## 22 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 23 Hand and Stone3.0Las Vegas, NV 89183
## 24 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 25 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 26 Indo-Pak Massage TherapyLas Vegas, NV
## 27 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 28 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 29 Massage Envy Boca ParkLas Vegas, NV 89117
## 30 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 31 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 32 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 33 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 34 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 35 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 36 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 37 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 38 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 39 Massage Envy Boca ParkLas Vegas, NV 89117
## 40 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 41 One Spa World3.8Las Vegas, NV 89109
## 42 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 43 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 44 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 45 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 46 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 47 Indo-Pak Massage TherapyLas Vegas, NV
## 48 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 49 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 50 Massage Envy Boca ParkLas Vegas, NV 89117
## 51 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 52 Massage Envy Boca ParkLas Vegas, NV 89117
## 53 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 54 One Spa World3.8Las Vegas, NV 89109
## 55 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 56 Elements Salon and Wellness SpaLas Vegas, NV 89149 (Centennial Hills area)
## 57 Soothe3.7Las Vegas, NV 89118 (Spring Valley area)
## 58 Massage Bliss5.0Las Vegas, NV 89102 (Rancho Charleston area)
## 59 A Harmony Nail Spa & SalonLas Vegas, NV 89104 (Winchester area)
## 60 Zen MassageHenderson, NV 89014 (Whitney Ranch area)
## 61 Escape Salon and Spa4.7Henderson, NV 89012 (Green Valley Ranch area)
## 62 The Muscle, Joint and Spine CenterLas Vegas, NV 89147 (Spring Valley area)
## 63 Massage Envy Green Valley3.2Henderson, NV 89074 (Green Valley South area)
## 64 Neko Massage StudioLas Vegas, NV 89101 (Downtown area)
## 65 Mahana Spa at Tahiti Village3.6Las Vegas, NV 89119 (Enterprise area)
## 66 Hand and Stone3.0Las Vegas, NV 89183
## 67 Massage Heights3.1Henderson, NV 89052 (Westgate area)
## 68 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 69 Massage Envy Centennial Hills3.2Las Vegas, NV 89149 (Centennial Hills area)
## 70 Indo-Pak Massage TherapyLas Vegas, NV
## 71 Massage Envy3.2Henderson, NV 89052 (Westgate area)
## 72 Q Wellness & Family ChiropracticLas Vegas, NV 89113 (Spring Valley area)
## 73 Massage Envy Boca ParkLas Vegas, NV 89117
## 74 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 75 Massage Envy Boca ParkLas Vegas, NV 89117
## 76 Massage Envy3.2Las Vegas, NV 89149 (Centennial Hills area)
## 77 One Spa World3.8Las Vegas, NV 89109
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 10 130 39000 39000
## 2 30 10 130 39000 39000
## 3 30 10 130 39000 39000
## 4 9 10 130 39000 39000
## 5 30 10 130 39000 39000
## 6 30 10 130 39000 39000
## 7 Today 10 130 39000 39000
## 8 30 10 130 39000 39000
## 9 30 10 130 39000 39000
## 10 7 10 130 39000 39000
## 11 30 10 130 39000 39000
## 12 30 10 130 39000 39000
## 13 13 10 130 39000 39000
## 14 24 10 130 39000 39000
## 15 7 10 130 39000 39000
## 16 9 10 130 39000 39000
## 17 30 10 130 39000 39000
## 18 7 10 130 39000 39000
## 19 30 10 130 39000 39000
## 20 24 10 130 39000 39000
## 21 30 10 130 39000 39000
## 22 27 10 130 39000 39000
## 23 30 10 130 39000 39000
## 24 30 10 130 39000 39000
## 25 30 10 130 39000 39000
## 26 30 10 130 39000 39000
## 27 30 10 130 39000 39000
## 28 22 10 130 39000 39000
## 29 30 10 130 39000 39000
## 30 30 10 130 39000 39000
## 31 30 10 130 39000 39000
## 32 30 10 130 39000 39000
## 33 30 10 130 39000 39000
## 34 30 10 130 39000 39000
## 35 30 10 130 39000 39000
## 36 9 10 130 39000 39000
## 37 7 10 130 39000 39000
## 38 30 10 130 39000 39000
## 39 30 10 130 39000 39000
## 40 14 10 130 39000 39000
## 41 30 10 130 39000 39000
## 42 30 10 130 39000 39000
## 43 24 10 130 39000 39000
## 44 30 10 130 39000 39000
## 45 30 10 130 39000 39000
## 46 30 10 130 39000 39000
## 47 30 10 130 39000 39000
## 48 30 10 130 39000 39000
## 49 22 10 130 39000 39000
## 50 30 10 130 39000 39000
## 51 30 10 130 39000 39000
## 52 30 10 130 39000 39000
## 53 14 10 130 39000 39000
## 54 30 10 130 39000 39000
## 55 30 10 130 39000 39000
## 56 30 10 130 39000 39000
## 57 24 10 130 39000 39000
## 58 9 10 130 39000 39000
## 59 30 10 130 39000 39000
## 60 7 10 130 39000 39000
## 61 30 10 130 39000 39000
## 62 30 10 130 39000 39000
## 63 22 10 130 39000 39000
## 64 30 10 130 39000 39000
## 65 27 10 130 39000 39000
## 66 30 10 130 39000 39000
## 67 30 10 130 39000 39000
## 68 30 10 130 39000 39000
## 69 30 10 130 39000 39000
## 70 30 10 130 39000 39000
## 71 30 10 130 39000 39000
## 72 22 10 130 39000 39000
## 73 30 10 130 39000 39000
## 74 30 10 130 39000 39000
## 75 30 10 130 39000 39000
## 76 14 10 130 39000 39000
## 77 30 10 130 39000 39000
getIndeedJobData5pages('massage therapist', 'Reno','NV')
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist - Independent Contractor
## 4 Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Licensed Massage Therapist (LMT)
## 13 Licensed Massage Therapists & Aestheticians
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapist
## 21 Massage Therapist (Summer Season)
## 22 Massage Therapist - Independent Contractor
## 23 Licensed Massage Therapist
## 24 Massage Therapist - Independent Contractor
## 25 Massage Therapist
## 26 Massage Therapist - Independent Contractor
## 27 Licensed Massage Therapist (LMT)
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Licensed Massage Therapists & Aestheticians
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist
## 34 Massage Therapist - Independent Contractor
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Licensed Massage Therapist
## 39 Massage Therapist (Summer Season)
## 40 Massage Therapist
## 41 Massage Therapist - Independent Contractor
## 42 Licensed Massage Therapist (LMT)
## 43 Licensed Massage Therapist
## 44 Massage Therapist
## 45 Massage Therapist - Independent Contractor
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapist - Independent Contractor
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist (Summer Season)
## 54 Massage Therapist
## 55 Massage Therapist - Independent Contractor
## 56 Licensed Massage Therapist (LMT)
## 57 Licensed Massage Therapist
## 58 Massage Therapist
## 59 Massage Therapist - Independent Contractor
## 60 Licensed Massage Therapists & Aestheticians
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Massage Therapist - Independent Contractor
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist (Summer Season)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$40,000 - $65,000 a year $40000 - $65000 40000.00 65000
## 2 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 3 \n$50 - $60 an hour $50 - $60 50.00 60
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 5 \n$38,000 - $58,000 a year $38000 - $58000 38000.00 58000
## 6 \n$24 - $38 an hour $24 - $38 24.00 38
## 7 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 8 \n$40,000 - $65,000 a year $40000 - $65000 40000.00 65000
## 9 \n$38,000 - $58,000 a year $38000 - $58000 38000.00 58000
## 10 \n$50 - $60 an hour $50 - $60 50.00 60
## 11 \n$24 - $38 an hour $24 - $38 24.00 38
## 12 \n$40,000 - $65,000 a year $40000 - $65000 40000.00 65000
## 13 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 14 \n$24 - $38 an hour $24 - $38 24.00 38
## 15 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 16 \n$38,000 - $58,000 a year $38000 - $58000 38000.00 58000
## 17 \n$50 - $60 an hour $50 - $60 50.00 60
## 18 \n$40,000 - $65,000 a year $40000 - $65000 40000.00 65000
## 19 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 20 \n$24 - $38 an hour $24 - $38 24.00 38
## 21 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 22 \n$38,000 - $58,000 a year $38000 - $58000 38000.00 58000
## 23 \n$50 - $60 an hour $50 - $60 50.00 60
## 24 \n$40,000 - $65,000 a year $40000 - $65000 40000.00 65000
## 25 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 26 \n$24 - $38 an hour $24 - $38 24.00 38
## 27 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000
## 28 \n$38,000 - $58,000 a year $38000 - $58000 38000.00 58000
## 29 \n$50 - $60 an hour $50 - $60 50.00 60
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 50 60 14153.79 18520 17.98
## 2 50 60 14153.79 18520 17.98
## 3 50 60 14153.79 18520 17.98
## 4 50 60 14153.79 18520 17.98
## 5 50 60 14153.79 18520 17.98
## 6 50 60 14153.79 18520 17.98
## 7 50 60 14153.79 18520 17.98
## 8 50 60 14153.79 18520 17.98
## 9 50 60 14153.79 18520 17.98
## 10 50 60 14153.79 18520 17.98
## 11 50 60 14153.79 18520 17.98
## 12 50 60 14153.79 18520 17.98
## 13 50 60 14153.79 18520 17.98
## 14 50 60 14153.79 18520 17.98
## 15 50 60 14153.79 18520 17.98
## 16 50 60 14153.79 18520 17.98
## 17 50 60 14153.79 18520 17.98
## 18 50 60 14153.79 18520 17.98
## 19 50 60 14153.79 18520 17.98
## 20 50 60 14153.79 18520 17.98
## 21 50 60 14153.79 18520 17.98
## 22 50 60 14153.79 18520 17.98
## 23 50 60 14153.79 18520 17.98
## 24 50 60 14153.79 18520 17.98
## 25 50 60 14153.79 18520 17.98
## 26 50 60 14153.79 18520 17.98
## 27 50 60 14153.79 18520 17.98
## 28 50 60 14153.79 18520 17.98
## 29 50 60 14153.79 18520 17.98
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 28 65000
## 29 65000
##
## [[3]]
## date_daysAgo
## 1 20
## 2 25
## 3 9
## 4 1
## 5 5
## 6 7
## 7 20
## 8 7
## 9 7
## 10 28
## 11 1
## 12 25
## 13 18
## 14 20
## 15 7
## 16 20
## 17 7
## 18 7
## 19 30
## 20 7
## 21 6
## 22 9
## 23 28
## 24 1
## 25 20
## 26 1
## 27 25
## 28 28
## 29 1
## 30 5
## 31 18
## 32 7
## 33 20
## 34 9
## 35 7
## 36 7
## 37 30
## 38 7
## 39 6
## 40 20
## 41 1
## 42 25
## 43 28
## 44 1
## 45 5
## 46 7
## 47 20
## 48 9
## 49 7
## 50 7
## 51 30
## 52 7
## 53 6
## 54 20
## 55 1
## 56 25
## 57 28
## 58 1
## 59 5
## 60 18
## 61 7
## 62 20
## 63 9
## 64 7
## 65 7
## 66 30
## 67 7
## 68 6
##
## [[4]]
## HiringAgency
## 1 The Refuge SpaReno, NV 89501 (Southwest area)
## 2 Ahhh! MassageSparks, NV 89434
## 3 Truckee MassageTruckee, CA 96161
## 4 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 5 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 6 Spavia Day Spa3.3Reno, NV 89511
## 7 The Club at RancharrahReno, NV 89511
## 8 Massage Envy - SO VirginiaReno, NV
## 9 Massage Envy - RidgeviewReno, NV
## 10 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 11 Pathway to SerenityReno, NV 89511 (South Central area)
## 12 Ahhh! MassageSparks, NV 89434
## 13 Tahoe Mountain ClubTruckee, CA 96161
## 14 The Refuge SpaReno, NV 89501 (Southwest area)
## 15 Spavia Day Spa3.3Reno, NV 89511
## 16 The Club at RancharrahReno, NV 89511
## 17 Massage Envy - SO VirginiaReno, NV
## 18 Massage Envy - RidgeviewReno, NV
## 19 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 20 Massage Envy - Sparks GalleriaSparks, NV
## 21 Martis Camp4.3Truckee, CA 96161
## 22 Truckee MassageTruckee, CA 96161
## 23 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 24 Pathway to SerenityReno, NV 89511 (South Central area)
## 25 The Refuge SpaReno, NV 89501 (Southwest area)
## 26 Pathway to SerenityReno, NV 89511 (South Central area)
## 27 Ahhh! MassageSparks, NV 89434
## 28 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 29 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 30 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 31 Tahoe Mountain ClubTruckee, CA 96161
## 32 Spavia Day Spa3.3Reno, NV 89511
## 33 The Club at RancharrahReno, NV 89511
## 34 Truckee MassageTruckee, CA 96161
## 35 Massage Envy - SO VirginiaReno, NV
## 36 Massage Envy - RidgeviewReno, NV
## 37 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 38 Massage Envy - Sparks GalleriaSparks, NV
## 39 Martis Camp4.3Truckee, CA 96161
## 40 The Refuge SpaReno, NV 89501 (Southwest area)
## 41 Pathway to SerenityReno, NV 89511 (South Central area)
## 42 Ahhh! MassageSparks, NV 89434
## 43 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 44 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 45 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 46 Spavia Day Spa3.3Reno, NV 89511
## 47 The Club at RancharrahReno, NV 89511
## 48 Truckee MassageTruckee, CA 96161
## 49 Massage Envy - SO VirginiaReno, NV
## 50 Massage Envy - RidgeviewReno, NV
## 51 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 52 Massage Envy - Sparks GalleriaSparks, NV
## 53 Martis Camp4.3Truckee, CA 96161
## 54 The Refuge SpaReno, NV 89501 (Southwest area)
## 55 Pathway to SerenityReno, NV 89511 (South Central area)
## 56 Ahhh! MassageSparks, NV 89434
## 57 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 58 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 59 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 60 Tahoe Mountain ClubTruckee, CA 96161
## 61 Spavia Day Spa3.3Reno, NV 89511
## 62 The Club at RancharrahReno, NV 89511
## 63 Truckee MassageTruckee, CA 96161
## 64 Massage Envy - SO VirginiaReno, NV
## 65 Massage Envy - RidgeviewReno, NV
## 66 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 67 Massage Envy - Sparks GalleriaSparks, NV
## 68 Martis Camp4.3Truckee, CA 96161
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 5 \n$38,000 - $58,000 a year $38000 - $58000 38000 58000
## 8 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 9 \n$38,000 - $58,000 a year $38000 - $58000 38000 58000
## 12 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 16 \n$38,000 - $58,000 a year $38000 - $58000 38000 58000
## 18 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 22 \n$38,000 - $58,000 a year $38000 - $58000 38000 58000
## 24 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 28 \n$38,000 - $58,000 a year $38000 - $58000 38000 58000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 39000 61500 39000 61500 38000
## 5 39000 61500 39000 61500 38000
## 8 39000 61500 39000 61500 38000
## 9 39000 61500 39000 61500 38000
## 12 39000 61500 39000 61500 38000
## 16 39000 61500 39000 61500 38000
## 18 39000 61500 39000 61500 38000
## 22 39000 61500 39000 61500 38000
## 24 39000 61500 39000 61500 38000
## 28 39000 61500 39000 61500 38000
## maximumMaxSalary
## 1 65000
## 5 65000
## 8 65000
## 9 65000
## 12 65000
## 16 65000
## 18 65000
## 22 65000
## 24 65000
## 28 65000
##
## [[6]]
## Salary salary minSalary maxSalary
## 2 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 3 \n$50 - $60 an hour $50 - $60 50.00 60
## 6 \n$24 - $38 an hour $24 - $38 24.00 38
## 7 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 10 \n$50 - $60 an hour $50 - $60 50.00 60
## 11 \n$24 - $38 an hour $24 - $38 24.00 38
## 13 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 14 \n$24 - $38 an hour $24 - $38 24.00 38
## 17 \n$50 - $60 an hour $50 - $60 50.00 60
## 19 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 20 \n$24 - $38 an hour $24 - $38 24.00 38
## 23 \n$50 - $60 an hour $50 - $60 50.00 60
## 25 \n$17.98 - $42.00 an hour $17.98 - $42.00 17.98 42
## 26 \n$24 - $38 an hour $24 - $38 24.00 38
## 29 \n$50 - $60 an hour $50 - $60 50.00 60
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 24 42 30.66 46.66667 17.98
## 3 24 42 30.66 46.66667 17.98
## 6 24 42 30.66 46.66667 17.98
## 7 24 42 30.66 46.66667 17.98
## 10 24 42 30.66 46.66667 17.98
## 11 24 42 30.66 46.66667 17.98
## 13 24 42 30.66 46.66667 17.98
## 14 24 42 30.66 46.66667 17.98
## 17 24 42 30.66 46.66667 17.98
## 19 24 42 30.66 46.66667 17.98
## 20 24 42 30.66 46.66667 17.98
## 23 24 42 30.66 46.66667 17.98
## 25 24 42 30.66 46.66667 17.98
## 26 24 42 30.66 46.66667 17.98
## 29 24 42 30.66 46.66667 17.98
## maximumMaxSalary
## 2 60
## 3 60
## 6 60
## 7 60
## 10 60
## 11 60
## 13 60
## 14 60
## 17 60
## 19 60
## 20 60
## 23 60
## 25 60
## 26 60
## 29 60
##
## [[7]]
## city state jobTitle
## 1 Reno NV Massage Therapist
## 2 Reno NV Licensed Massage Therapist (LMT)
## 3 Reno NV Massage Therapist - Independent Contractor
## 4 Reno NV Massage Therapist
## 5 Reno NV Massage Therapist - Independent Contractor
## 6 Reno NV Licensed Massage Therapist
## 7 Reno NV Licensed Massage Therapist
## 8 Reno NV Licensed Massage Therapist
## 9 Reno NV Licensed Massage Therapist
## 10 Reno NV Licensed Massage Therapist
## 11 Reno NV Massage Therapist - Independent Contractor
## 12 Reno NV Licensed Massage Therapist (LMT)
## 13 Reno NV Licensed Massage Therapists & Aestheticians
## 14 Reno NV Massage Therapist
## 15 Reno NV Licensed Massage Therapist
## 16 Reno NV Licensed Massage Therapist
## 17 Reno NV Licensed Massage Therapist
## 18 Reno NV Licensed Massage Therapist
## 19 Reno NV Massage Therapist
## 20 Reno NV Licensed Massage Therapist
## 21 Reno NV Massage Therapist (Summer Season)
## 22 Reno NV Massage Therapist - Independent Contractor
## 23 Reno NV Licensed Massage Therapist
## 24 Reno NV Massage Therapist - Independent Contractor
## 25 Reno NV Massage Therapist
## 26 Reno NV Massage Therapist - Independent Contractor
## 27 Reno NV Licensed Massage Therapist (LMT)
## 28 Reno NV Licensed Massage Therapist
## 29 Reno NV Massage Therapist
## 30 Reno NV Massage Therapist - Independent Contractor
## 31 Reno NV Licensed Massage Therapists & Aestheticians
## 32 Reno NV Licensed Massage Therapist
## 33 Reno NV Licensed Massage Therapist
## 34 Reno NV Massage Therapist - Independent Contractor
## 35 Reno NV Licensed Massage Therapist
## 36 Reno NV Licensed Massage Therapist
## 37 Reno NV Massage Therapist
## 38 Reno NV Licensed Massage Therapist
## 39 Reno NV Massage Therapist (Summer Season)
## 40 Reno NV Massage Therapist
## 41 Reno NV Massage Therapist - Independent Contractor
## 42 Reno NV Licensed Massage Therapist (LMT)
## 43 Reno NV Licensed Massage Therapist
## 44 Reno NV Massage Therapist
## 45 Reno NV Massage Therapist - Independent Contractor
## 46 Reno NV Licensed Massage Therapist
## 47 Reno NV Licensed Massage Therapist
## 48 Reno NV Massage Therapist - Independent Contractor
## 49 Reno NV Licensed Massage Therapist
## 50 Reno NV Licensed Massage Therapist
## 51 Reno NV Massage Therapist
## 52 Reno NV Licensed Massage Therapist
## 53 Reno NV Massage Therapist (Summer Season)
## 54 Reno NV Massage Therapist
## 55 Reno NV Massage Therapist - Independent Contractor
## 56 Reno NV Licensed Massage Therapist (LMT)
## 57 Reno NV Licensed Massage Therapist
## 58 Reno NV Massage Therapist
## 59 Reno NV Massage Therapist - Independent Contractor
## 60 Reno NV Licensed Massage Therapists & Aestheticians
## 61 Reno NV Licensed Massage Therapist
## 62 Reno NV Licensed Massage Therapist
## 63 Reno NV Massage Therapist - Independent Contractor
## 64 Reno NV Licensed Massage Therapist
## 65 Reno NV Licensed Massage Therapist
## 66 Reno NV Massage Therapist
## 67 Reno NV Licensed Massage Therapist
## 68 Reno NV Massage Therapist (Summer Season)
## HiringAgency
## 1 The Refuge SpaReno, NV 89501 (Southwest area)
## 2 Ahhh! MassageSparks, NV 89434
## 3 Truckee MassageTruckee, CA 96161
## 4 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 5 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 6 Spavia Day Spa3.3Reno, NV 89511
## 7 The Club at RancharrahReno, NV 89511
## 8 Massage Envy - SO VirginiaReno, NV
## 9 Massage Envy - RidgeviewReno, NV
## 10 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 11 Pathway to SerenityReno, NV 89511 (South Central area)
## 12 Ahhh! MassageSparks, NV 89434
## 13 Tahoe Mountain ClubTruckee, CA 96161
## 14 The Refuge SpaReno, NV 89501 (Southwest area)
## 15 Spavia Day Spa3.3Reno, NV 89511
## 16 The Club at RancharrahReno, NV 89511
## 17 Massage Envy - SO VirginiaReno, NV
## 18 Massage Envy - RidgeviewReno, NV
## 19 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 20 Massage Envy - Sparks GalleriaSparks, NV
## 21 Martis Camp4.3Truckee, CA 96161
## 22 Truckee MassageTruckee, CA 96161
## 23 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 24 Pathway to SerenityReno, NV 89511 (South Central area)
## 25 The Refuge SpaReno, NV 89501 (Southwest area)
## 26 Pathway to SerenityReno, NV 89511 (South Central area)
## 27 Ahhh! MassageSparks, NV 89434
## 28 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 29 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 30 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 31 Tahoe Mountain ClubTruckee, CA 96161
## 32 Spavia Day Spa3.3Reno, NV 89511
## 33 The Club at RancharrahReno, NV 89511
## 34 Truckee MassageTruckee, CA 96161
## 35 Massage Envy - SO VirginiaReno, NV
## 36 Massage Envy - RidgeviewReno, NV
## 37 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 38 Massage Envy - Sparks GalleriaSparks, NV
## 39 Martis Camp4.3Truckee, CA 96161
## 40 The Refuge SpaReno, NV 89501 (Southwest area)
## 41 Pathway to SerenityReno, NV 89511 (South Central area)
## 42 Ahhh! MassageSparks, NV 89434
## 43 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 44 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 45 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 46 Spavia Day Spa3.3Reno, NV 89511
## 47 The Club at RancharrahReno, NV 89511
## 48 Truckee MassageTruckee, CA 96161
## 49 Massage Envy - SO VirginiaReno, NV
## 50 Massage Envy - RidgeviewReno, NV
## 51 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 52 Massage Envy - Sparks GalleriaSparks, NV
## 53 Martis Camp4.3Truckee, CA 96161
## 54 The Refuge SpaReno, NV 89501 (Southwest area)
## 55 Pathway to SerenityReno, NV 89511 (South Central area)
## 56 Ahhh! MassageSparks, NV 89434
## 57 Sports West Athletic Club & SpaReno, NV 89502 (Southwest area)
## 58 Grand Sierra Resort3.2Reno, NV 89595 (East Reno area)
## 59 Indo-Pak Massage TherapyReno, NV+1 location•Remote work available
## 60 Tahoe Mountain ClubTruckee, CA 96161
## 61 Spavia Day Spa3.3Reno, NV 89511
## 62 The Club at RancharrahReno, NV 89511
## 63 Truckee MassageTruckee, CA 96161
## 64 Massage Envy - SO VirginiaReno, NV
## 65 Massage Envy - RidgeviewReno, NV
## 66 Massage Envy3.2Reno, NV 89523 (Northwest area)+1 location
## 67 Massage Envy - Sparks GalleriaSparks, NV
## 68 Martis Camp4.3Truckee, CA 96161
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 20 17.98 60 38000 65000
## 2 25 17.98 60 38000 65000
## 3 9 17.98 60 38000 65000
## 4 1 17.98 60 38000 65000
## 5 5 17.98 60 38000 65000
## 6 7 17.98 60 38000 65000
## 7 20 17.98 60 38000 65000
## 8 7 17.98 60 38000 65000
## 9 7 17.98 60 38000 65000
## 10 28 17.98 60 38000 65000
## 11 1 17.98 60 38000 65000
## 12 25 17.98 60 38000 65000
## 13 18 17.98 60 38000 65000
## 14 20 17.98 60 38000 65000
## 15 7 17.98 60 38000 65000
## 16 20 17.98 60 38000 65000
## 17 7 17.98 60 38000 65000
## 18 7 17.98 60 38000 65000
## 19 30 17.98 60 38000 65000
## 20 7 17.98 60 38000 65000
## 21 6 17.98 60 38000 65000
## 22 9 17.98 60 38000 65000
## 23 28 17.98 60 38000 65000
## 24 1 17.98 60 38000 65000
## 25 20 17.98 60 38000 65000
## 26 1 17.98 60 38000 65000
## 27 25 17.98 60 38000 65000
## 28 28 17.98 60 38000 65000
## 29 1 17.98 60 38000 65000
## 30 5 17.98 60 38000 65000
## 31 18 17.98 60 38000 65000
## 32 7 17.98 60 38000 65000
## 33 20 17.98 60 38000 65000
## 34 9 17.98 60 38000 65000
## 35 7 17.98 60 38000 65000
## 36 7 17.98 60 38000 65000
## 37 30 17.98 60 38000 65000
## 38 7 17.98 60 38000 65000
## 39 6 17.98 60 38000 65000
## 40 20 17.98 60 38000 65000
## 41 1 17.98 60 38000 65000
## 42 25 17.98 60 38000 65000
## 43 28 17.98 60 38000 65000
## 44 1 17.98 60 38000 65000
## 45 5 17.98 60 38000 65000
## 46 7 17.98 60 38000 65000
## 47 20 17.98 60 38000 65000
## 48 9 17.98 60 38000 65000
## 49 7 17.98 60 38000 65000
## 50 7 17.98 60 38000 65000
## 51 30 17.98 60 38000 65000
## 52 7 17.98 60 38000 65000
## 53 6 17.98 60 38000 65000
## 54 20 17.98 60 38000 65000
## 55 1 17.98 60 38000 65000
## 56 25 17.98 60 38000 65000
## 57 28 17.98 60 38000 65000
## 58 1 17.98 60 38000 65000
## 59 5 17.98 60 38000 65000
## 60 18 17.98 60 38000 65000
## 61 7 17.98 60 38000 65000
## 62 20 17.98 60 38000 65000
## 63 9 17.98 60 38000 65000
## 64 7 17.98 60 38000 65000
## 65 7 17.98 60 38000 65000
## 66 30 17.98 60 38000 65000
## 67 7 17.98 60 38000 65000
## 68 6 17.98 60 38000 65000
New Hampshire Manchester, Nashua, Concord
getIndeedJobData5pages('massage therapist', 'Manchester','NH')
## Warning in getIndeedJobData5pages("massage therapist", "Manchester", "NH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Manchester", "NH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Manchester", "NH"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist (LMT)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist - Full Time
## 16 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 17 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 18 Licensed Massage Therapist
## 19 Lead Massage Therapist - Trainer
## 20 Massage Therapist; Night shifts
## 21 Massage Therapist Nights & Weekends
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Massage Therapist - Independent Contractor
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist (LMT)
## 33 Massage Therapist - Full Time
## 34 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 35 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 36 Licensed Massage Therapist
## 37 Lead Massage Therapist - Trainer
## 38 Massage Therapist; Night shifts
## 39 Massage Therapist Nights & Weekends
## 40 Licensed Massage Therapist (LMT)
## 41 Massage Therapist
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist (LMT)
## 44 Massage Therapist - Full Time
## 45 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 46 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 47 Licensed Massage Therapist
## 48 Lead Massage Therapist - Trainer
## 49 Massage Therapist; Night shifts
## 50 Massage Therapist Nights & Weekends
## 51 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 52 Licensed Massage Therapist (LMT)
## 53 Massage Therapist
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist (LMT)
## 56 Massage Therapist - Full Time
## 57 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 58 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 59 Licensed Massage Therapist
## 60 Lead Massage Therapist - Trainer
## 61 Massage Therapist; Night shifts
## 62 Massage Therapist Nights & Weekends
## 63 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $30 an hour $22 - $30 22.0 30
## 2 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 3 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 4 \n$48 an hour $48 48.0 NA
## 5 \nUp to $65,000 a year $65000 65000.0 NA
## 6 \n$47.50 an hour $47.50 47.5 NA
## 7 \n$24 - $38 an hour $24 - $38 24.0 38
## 8 \n$24 - $38 an hour $24 - $38 24.0 38
## 9 \n$18 an hour $18 18.0 NA
## 10 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 11 \n$22 - $30 an hour $22 - $30 22.0 30
## 12 \n$48 an hour $48 48.0 NA
## 13 \nUp to $65,000 a year $65000 65000.0 NA
## 14 \n$47.50 an hour $47.50 47.5 NA
## 15 \n$24 - $38 an hour $24 - $38 24.0 38
## 16 \n$18 an hour $18 18.0 NA
## 17 \n$22 - $30 an hour $22 - $30 22.0 30
## 18 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 19 \n$24 - $38 an hour $24 - $38 24.0 38
## 20 \n$18 an hour $18 18.0 NA
## 21 \n$22 - $30 an hour $22 - $30 22.0 30
## 22 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 23 \n$24 - $38 an hour $24 - $38 24.0 38
## 24 \n$18 an hour $18 18.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 24 38 12727.96 16599.5 18
## 2 24 38 12727.96 16599.5 18
## 3 24 38 12727.96 16599.5 18
## 4 24 38 12727.96 16599.5 18
## 5 24 38 12727.96 16599.5 18
## 6 24 38 12727.96 16599.5 18
## 7 24 38 12727.96 16599.5 18
## 8 24 38 12727.96 16599.5 18
## 9 24 38 12727.96 16599.5 18
## 10 24 38 12727.96 16599.5 18
## 11 24 38 12727.96 16599.5 18
## 12 24 38 12727.96 16599.5 18
## 13 24 38 12727.96 16599.5 18
## 14 24 38 12727.96 16599.5 18
## 15 24 38 12727.96 16599.5 18
## 16 24 38 12727.96 16599.5 18
## 17 24 38 12727.96 16599.5 18
## 18 24 38 12727.96 16599.5 18
## 19 24 38 12727.96 16599.5 18
## 20 24 38 12727.96 16599.5 18
## 21 24 38 12727.96 16599.5 18
## 22 24 38 12727.96 16599.5 18
## 23 24 38 12727.96 16599.5 18
## 24 24 38 12727.96 16599.5 18
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
##
## [[3]]
## date_daysAgo
## 1 15
## 2 27
## 3 Today
## 4 Just posted
## 5 30
## 6 30
## 7 30
## 8 11
## 9 7
## 10 30
## 11 30
## 12 24
## 13 30
## 14 24
## 15 6
## 16 13
## 17 30
## 18 30
## 19 30
## 20 6
## 21 6
## 22 Today
## 23 27
## 24 15
## 25 30
## 26 30
## 27 30
## 28 11
## 29 7
## 30 30
## 31 30
## 32 24
## 33 6
## 34 13
## 35 30
## 36 30
## 37 30
## 38 6
## 39 6
## 40 27
## 41 Today
## 42 30
## 43 24
## 44 6
## 45 13
## 46 30
## 47 30
## 48 30
## 49 6
## 50 6
## 51 15
## 52 27
## 53 Today
## 54 30
## 55 24
## 56 6
## 57 13
## 58 30
## 59 30
## 60 30
## 61 6
## 62 6
## 63 15
##
## [[4]]
## HiringAgency
## 1 Serendipity Day SpaPembroke, NH 03275
## 2 Synergy Acupuncture & WellnessAmherst, NH 03031
## 3 Elements Massage3.6Concord, NH
## 4 Elements Massage3.6Nashua, NH+2 locations
## 5 CasaBella Salon & SpaAmherst, NH 03031
## 6 Elements3.6Nashua, NH 03063+2 locations
## 7 Inner Beauty ConceptsNashua, NH 03064
## 8 Salem Chiropractic CenterWindham, NH 03087
## 9 The Sensory spa PLLCGoffstown, NH 03045
## 10 bleu tangerineHampstead, NH 03841
## 11 Massage Heights3.1Bedford, NH 03110
## 12 Strength and Power MassageConcord, NH 03301
## 13 Massage Heights3.1Bedford, NH 03110
## 14 Strength and Power MassageConcord, NH 03301
## 15 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 16 The Aesthetic LoungeLondonderry, NH 03053
## 17 Massage Heights3.1Bedford, NH 03110
## 18 Hand and Stone3.0Bedford, NH 03110
## 19 Massage Heights3.1Bedford, NH 03110
## 20 Massage Envy3.2Methuen, MA 01844
## 21 Massage Envy3.2Methuen, MA 01844
## 22 Elements Massage3.6Concord, NH
## 23 Synergy Acupuncture & WellnessAmherst, NH 03031
## 24 Serendipity Day SpaPembroke, NH 03275
## 25 CasaBella Salon & SpaAmherst, NH 03031
## 26 Elements3.6Nashua, NH 03063+2 locations
## 27 Inner Beauty ConceptsNashua, NH 03064
## 28 Salem Chiropractic CenterWindham, NH 03087
## 29 The Sensory spa PLLCGoffstown, NH 03045
## 30 bleu tangerineHampstead, NH 03841
## 31 Massage Heights3.1Bedford, NH 03110
## 32 Strength and Power MassageConcord, NH 03301
## 33 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 34 The Aesthetic LoungeLondonderry, NH 03053
## 35 Massage Heights3.1Bedford, NH 03110
## 36 Hand and Stone3.0Bedford, NH 03110
## 37 Massage Heights3.1Bedford, NH 03110
## 38 Massage Envy3.2Methuen, MA 01844
## 39 Massage Envy3.2Methuen, MA 01844
## 40 Synergy Acupuncture & WellnessAmherst, NH 03031
## 41 Elements Massage3.6Concord, NH
## 42 Massage Heights3.1Bedford, NH 03110
## 43 Strength and Power MassageConcord, NH 03301
## 44 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 45 The Aesthetic LoungeLondonderry, NH 03053
## 46 Massage Heights3.1Bedford, NH 03110
## 47 Hand and Stone3.0Bedford, NH 03110
## 48 Massage Heights3.1Bedford, NH 03110
## 49 Massage Envy3.2Methuen, MA 01844
## 50 Massage Envy3.2Methuen, MA 01844
## 51 Serendipity Day SpaPembroke, NH 03275
## 52 Synergy Acupuncture & WellnessAmherst, NH 03031
## 53 Elements Massage3.6Concord, NH
## 54 Massage Heights3.1Bedford, NH 03110
## 55 Strength and Power MassageConcord, NH 03301
## 56 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 57 The Aesthetic LoungeLondonderry, NH 03053
## 58 Massage Heights3.1Bedford, NH 03110
## 59 Hand and Stone3.0Bedford, NH 03110
## 60 Massage Heights3.1Bedford, NH 03110
## 61 Massage Envy3.2Methuen, MA 01844
## 62 Massage Envy3.2Methuen, MA 01844
## 63 Serendipity Day SpaPembroke, NH 03275
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 3 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 5 \nUp to $65,000 a year $65000 65000 NA
## 10 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 13 \nUp to $65,000 a year $65000 65000 NA
## 18 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 22 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 35000 65000 43571.43 65000 35000
## 3 35000 65000 43571.43 65000 35000
## 5 35000 65000 43571.43 65000 35000
## 10 35000 65000 43571.43 65000 35000
## 13 35000 65000 43571.43 65000 35000
## 18 35000 65000 43571.43 65000 35000
## 22 35000 65000 43571.43 65000 35000
## maximumMaxSalary
## 2 65000
## 3 65000
## 5 65000
## 10 65000
## 13 65000
## 18 65000
## 22 65000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$22 - $30 an hour $22 - $30 22.0 30 24
## 4 \n$48 an hour $48 48.0 NA 24
## 6 \n$47.50 an hour $47.50 47.5 NA 24
## 7 \n$24 - $38 an hour $24 - $38 24.0 38 24
## 8 \n$24 - $38 an hour $24 - $38 24.0 38 24
## 9 \n$18 an hour $18 18.0 NA 24
## 11 \n$22 - $30 an hour $22 - $30 22.0 30 24
## 12 \n$48 an hour $48 48.0 NA 24
## 14 \n$47.50 an hour $47.50 47.5 NA 24
## 15 \n$24 - $38 an hour $24 - $38 24.0 38 24
## 16 \n$18 an hour $18 18.0 NA 24
## 17 \n$22 - $30 an hour $22 - $30 22.0 30 24
## 19 \n$24 - $38 an hour $24 - $38 24.0 38 24
## 20 \n$18 an hour $18 18.0 NA 24
## 21 \n$22 - $30 an hour $22 - $30 22.0 30 24
## 23 \n$24 - $38 an hour $24 - $38 24.0 38 24
## 24 \n$18 an hour $18 18.0 NA 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 38 27.70588 34.44444 18 38
## 4 38 27.70588 34.44444 18 38
## 6 38 27.70588 34.44444 18 38
## 7 38 27.70588 34.44444 18 38
## 8 38 27.70588 34.44444 18 38
## 9 38 27.70588 34.44444 18 38
## 11 38 27.70588 34.44444 18 38
## 12 38 27.70588 34.44444 18 38
## 14 38 27.70588 34.44444 18 38
## 15 38 27.70588 34.44444 18 38
## 16 38 27.70588 34.44444 18 38
## 17 38 27.70588 34.44444 18 38
## 19 38 27.70588 34.44444 18 38
## 20 38 27.70588 34.44444 18 38
## 21 38 27.70588 34.44444 18 38
## 23 38 27.70588 34.44444 18 38
## 24 38 27.70588 34.44444 18 38
##
## [[7]]
## city state
## 1 Manchester NH
## 2 Manchester NH
## 3 Manchester NH
## 4 Manchester NH
## 5 Manchester NH
## 6 Manchester NH
## 7 Manchester NH
## 8 Manchester NH
## 9 Manchester NH
## 10 Manchester NH
## 11 Manchester NH
## 12 Manchester NH
## 13 Manchester NH
## 14 Manchester NH
## 15 Manchester NH
## 16 Manchester NH
## 17 Manchester NH
## 18 Manchester NH
## 19 Manchester NH
## 20 Manchester NH
## 21 Manchester NH
## 22 Manchester NH
## 23 Manchester NH
## 24 Manchester NH
## 25 Manchester NH
## 26 Manchester NH
## 27 Manchester NH
## 28 Manchester NH
## 29 Manchester NH
## 30 Manchester NH
## 31 Manchester NH
## 32 Manchester NH
## 33 Manchester NH
## 34 Manchester NH
## 35 Manchester NH
## 36 Manchester NH
## 37 Manchester NH
## 38 Manchester NH
## 39 Manchester NH
## 40 Manchester NH
## 41 Manchester NH
## 42 Manchester NH
## 43 Manchester NH
## 44 Manchester NH
## 45 Manchester NH
## 46 Manchester NH
## 47 Manchester NH
## 48 Manchester NH
## 49 Manchester NH
## 50 Manchester NH
## 51 Manchester NH
## 52 Manchester NH
## 53 Manchester NH
## 54 Manchester NH
## 55 Manchester NH
## 56 Manchester NH
## 57 Manchester NH
## 58 Manchester NH
## 59 Manchester NH
## 60 Manchester NH
## 61 Manchester NH
## 62 Manchester NH
## 63 Manchester NH
## jobTitle
## 1 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist (LMT)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist - Full Time
## 16 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 17 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 18 Licensed Massage Therapist
## 19 Lead Massage Therapist - Trainer
## 20 Massage Therapist; Night shifts
## 21 Massage Therapist Nights & Weekends
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Massage Therapist - Independent Contractor
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist (LMT)
## 33 Massage Therapist - Full Time
## 34 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 35 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 36 Licensed Massage Therapist
## 37 Lead Massage Therapist - Trainer
## 38 Massage Therapist; Night shifts
## 39 Massage Therapist Nights & Weekends
## 40 Licensed Massage Therapist (LMT)
## 41 Massage Therapist
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist (LMT)
## 44 Massage Therapist - Full Time
## 45 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 46 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 47 Licensed Massage Therapist
## 48 Lead Massage Therapist - Trainer
## 49 Massage Therapist; Night shifts
## 50 Massage Therapist Nights & Weekends
## 51 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 52 Licensed Massage Therapist (LMT)
## 53 Massage Therapist
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist (LMT)
## 56 Massage Therapist - Full Time
## 57 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 58 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 59 Licensed Massage Therapist
## 60 Lead Massage Therapist - Trainer
## 61 Massage Therapist; Night shifts
## 62 Massage Therapist Nights & Weekends
## 63 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## HiringAgency
## 1 Serendipity Day SpaPembroke, NH 03275
## 2 Synergy Acupuncture & WellnessAmherst, NH 03031
## 3 Elements Massage3.6Concord, NH
## 4 Elements Massage3.6Nashua, NH+2 locations
## 5 CasaBella Salon & SpaAmherst, NH 03031
## 6 Elements3.6Nashua, NH 03063+2 locations
## 7 Inner Beauty ConceptsNashua, NH 03064
## 8 Salem Chiropractic CenterWindham, NH 03087
## 9 The Sensory spa PLLCGoffstown, NH 03045
## 10 bleu tangerineHampstead, NH 03841
## 11 Massage Heights3.1Bedford, NH 03110
## 12 Strength and Power MassageConcord, NH 03301
## 13 Massage Heights3.1Bedford, NH 03110
## 14 Strength and Power MassageConcord, NH 03301
## 15 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 16 The Aesthetic LoungeLondonderry, NH 03053
## 17 Massage Heights3.1Bedford, NH 03110
## 18 Hand and Stone3.0Bedford, NH 03110
## 19 Massage Heights3.1Bedford, NH 03110
## 20 Massage Envy3.2Methuen, MA 01844
## 21 Massage Envy3.2Methuen, MA 01844
## 22 Elements Massage3.6Concord, NH
## 23 Synergy Acupuncture & WellnessAmherst, NH 03031
## 24 Serendipity Day SpaPembroke, NH 03275
## 25 CasaBella Salon & SpaAmherst, NH 03031
## 26 Elements3.6Nashua, NH 03063+2 locations
## 27 Inner Beauty ConceptsNashua, NH 03064
## 28 Salem Chiropractic CenterWindham, NH 03087
## 29 The Sensory spa PLLCGoffstown, NH 03045
## 30 bleu tangerineHampstead, NH 03841
## 31 Massage Heights3.1Bedford, NH 03110
## 32 Strength and Power MassageConcord, NH 03301
## 33 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 34 The Aesthetic LoungeLondonderry, NH 03053
## 35 Massage Heights3.1Bedford, NH 03110
## 36 Hand and Stone3.0Bedford, NH 03110
## 37 Massage Heights3.1Bedford, NH 03110
## 38 Massage Envy3.2Methuen, MA 01844
## 39 Massage Envy3.2Methuen, MA 01844
## 40 Synergy Acupuncture & WellnessAmherst, NH 03031
## 41 Elements Massage3.6Concord, NH
## 42 Massage Heights3.1Bedford, NH 03110
## 43 Strength and Power MassageConcord, NH 03301
## 44 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 45 The Aesthetic LoungeLondonderry, NH 03053
## 46 Massage Heights3.1Bedford, NH 03110
## 47 Hand and Stone3.0Bedford, NH 03110
## 48 Massage Heights3.1Bedford, NH 03110
## 49 Massage Envy3.2Methuen, MA 01844
## 50 Massage Envy3.2Methuen, MA 01844
## 51 Serendipity Day SpaPembroke, NH 03275
## 52 Synergy Acupuncture & WellnessAmherst, NH 03031
## 53 Elements Massage3.6Concord, NH
## 54 Massage Heights3.1Bedford, NH 03110
## 55 Strength and Power MassageConcord, NH 03301
## 56 Massage Envy3.2Manchester, NH 03103 (Southside area)+2 locations
## 57 The Aesthetic LoungeLondonderry, NH 03053
## 58 Massage Heights3.1Bedford, NH 03110
## 59 Hand and Stone3.0Bedford, NH 03110
## 60 Massage Heights3.1Bedford, NH 03110
## 61 Massage Envy3.2Methuen, MA 01844
## 62 Massage Envy3.2Methuen, MA 01844
## 63 Serendipity Day SpaPembroke, NH 03275
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 15 18 38 35000 65000
## 2 27 18 38 35000 65000
## 3 Today 18 38 35000 65000
## 4 Just posted 18 38 35000 65000
## 5 30 18 38 35000 65000
## 6 30 18 38 35000 65000
## 7 30 18 38 35000 65000
## 8 11 18 38 35000 65000
## 9 7 18 38 35000 65000
## 10 30 18 38 35000 65000
## 11 30 18 38 35000 65000
## 12 24 18 38 35000 65000
## 13 30 18 38 35000 65000
## 14 24 18 38 35000 65000
## 15 6 18 38 35000 65000
## 16 13 18 38 35000 65000
## 17 30 18 38 35000 65000
## 18 30 18 38 35000 65000
## 19 30 18 38 35000 65000
## 20 6 18 38 35000 65000
## 21 6 18 38 35000 65000
## 22 Today 18 38 35000 65000
## 23 27 18 38 35000 65000
## 24 15 18 38 35000 65000
## 25 30 18 38 35000 65000
## 26 30 18 38 35000 65000
## 27 30 18 38 35000 65000
## 28 11 18 38 35000 65000
## 29 7 18 38 35000 65000
## 30 30 18 38 35000 65000
## 31 30 18 38 35000 65000
## 32 24 18 38 35000 65000
## 33 6 18 38 35000 65000
## 34 13 18 38 35000 65000
## 35 30 18 38 35000 65000
## 36 30 18 38 35000 65000
## 37 30 18 38 35000 65000
## 38 6 18 38 35000 65000
## 39 6 18 38 35000 65000
## 40 27 18 38 35000 65000
## 41 Today 18 38 35000 65000
## 42 30 18 38 35000 65000
## 43 24 18 38 35000 65000
## 44 6 18 38 35000 65000
## 45 13 18 38 35000 65000
## 46 30 18 38 35000 65000
## 47 30 18 38 35000 65000
## 48 30 18 38 35000 65000
## 49 6 18 38 35000 65000
## 50 6 18 38 35000 65000
## 51 15 18 38 35000 65000
## 52 27 18 38 35000 65000
## 53 Today 18 38 35000 65000
## 54 30 18 38 35000 65000
## 55 24 18 38 35000 65000
## 56 6 18 38 35000 65000
## 57 13 18 38 35000 65000
## 58 30 18 38 35000 65000
## 59 30 18 38 35000 65000
## 60 30 18 38 35000 65000
## 61 6 18 38 35000 65000
## 62 6 18 38 35000 65000
## 63 15 18 38 35000 65000
getIndeedJobData5pages('massage therapist', 'Nashua','NH')
## Warning in getIndeedJobData5pages("massage therapist", "Nashua", "NH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Nashua", "NH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Nashua", "NH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Nashua", "NH"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Licensed Massage Therapist
## 3 Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 11 Massage Therapist - Full Time
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 18 Massage Therapist
## 19 Licensed Massage Therapist (LMT)
## 20 Lead Massage Therapist - Trainer
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist Full-Time 60-70K
## 26 Massage Therapist; Night shifts
## 27 Massage Therapist Nights & Weekends
## 28 Licensed Massage Therapist (LMT)
## 29 Massage Therapist Part-Time up to 35K
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT)
## 32 Licensed Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist (LMT)
## 36 Massage Therapist Full-Time 60-70K
## 37 Massage Therapist; Night shifts
## 38 Massage Therapist Nights & Weekends
## 39 Licensed Massage Therapist (LMT)
## 40 Massage Therapist Part-Time up to 35K
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 44 Licensed Massage Therapist (LMT)
## 45 Massage Therapist Full-Time 60-70K
## 46 Massage Therapist; Night shifts
## 47 Massage Therapist Nights & Weekends
## 48 Licensed Massage Therapist (LMT)
## 49 Massage Therapist Part-Time up to 35K
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist (LMT)
## 54 Licensed Massage Therapist (LMT)
## 55 Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 56 Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist (LMT)
## 59 Licensed Massage Therapist
## 60 Massage Therapist Full-Time 60-70K
## 61 Massage Therapist; Night shifts
## 62 Massage Therapist Nights & Weekends
## 63 Licensed Massage Therapist (LMT)
## 64 Massage Therapist Part-Time up to 35K
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist (LMT)
## 69 Licensed Massage Therapist (LMT)
## 70 Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 71 Massage Therapist
## 72 Licensed Massage Therapist
## 73 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $30 an hour $22 - $30 22.0 30
## 2 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000
## 3 \n$30,000 - $50,000 a year $30000 - $50000 30000.0 50000
## 4 \n$15 - $20 an hour $15 - $20 15.0 20
## 5 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 6 \n$47.50 an hour $47.50 47.5 NA
## 7 \nUp to $65,000 a year $65000 65000.0 NA
## 8 \n$48 an hour $48 48.0 NA
## 9 \n$18 an hour $18 18.0 NA
## 10 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 11 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 12 \n$55,000 - $65,000 a year ++ $55000 - $65000 55000.0 65000
## 13 \n$45,760 a year $45760 45760.0 NA
## 14 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 15 \n$35 - $45 an hour $35 - $45 35.0 45
## 16 \n$15 - $20 an hour $15 - $20 15.0 20
## 17 \n$60,000 - $70,000 a year $60000 - $70000 60000.0 70000
## 18 \n$24 - $38 an hour $24 - $38 24.0 38
## 19 \n$30,000 - $35,000 a year $30000 - $35000 30000.0 35000
## 20 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 21 \n$15 - $20 an hour $15 - $20 15.0 20
## 22 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 23 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000
## 24 \n$45,760 a year $45760 45760.0 NA
## 25 \n$60,000 - $70,000 a year $60000 - $70000 60000.0 70000
## 26 \n$24 - $38 an hour $24 - $38 24.0 38
## 27 \n$30,000 - $35,000 a year $30000 - $35000 30000.0 35000
## 28 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 29 \n$30,000 - $50,000 a year $30000 - $50000 30000.0 50000
## 30 \n$22 - $30 an hour $22 - $30 22.0 30
## 31 \n$60,000 - $70,000 a year $60000 - $70000 60000.0 70000
## 32 \n$24 - $38 an hour $24 - $38 24.0 38
## 33 \n$30,000 - $35,000 a year $30000 - $35000 30000.0 35000
## 34 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 35 \n$15 - $20 an hour $15 - $20 15.0 20
## 36 \n$45,760 a year $45760 45760.0 NA
## 37 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 38 \n$30,000 - $50,000 a year $30000 - $50000 30000.0 50000
## 39 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 40 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000
## 41 \n$22 - $30 an hour $22 - $30 22.0 30
## 42 \nUp to $1,000 a week $1000 a week NA NA
## 43 \n$60,000 - $70,000 a year $60000 - $70000 60000.0 70000
## 44 \n$24 - $38 an hour $24 - $38 24.0 38
## 45 \n$30,000 - $35,000 a year $30000 - $35000 30000.0 35000
## 46 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 47 \n$15 - $20 an hour $15 - $20 15.0 20
## 48 \n$45,760 a year $45760 45760.0 NA
## 49 \n$20,000 - $65,000 a year $20000 - $65000 20000.0 65000
## 50 \n$30,000 - $50,000 a year $30000 - $50000 30000.0 50000
## 51 \n$35,000 - $65,000 a year $35000 - $65000 35000.0 65000
## 52 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000
## 53 \n$22 - $30 an hour $22 - $30 22.0 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30000 35000 24585.53 31759.01 15
## 2 30000 35000 24585.53 31759.01 15
## 3 30000 35000 24585.53 31759.01 15
## 4 30000 35000 24585.53 31759.01 15
## 5 30000 35000 24585.53 31759.01 15
## 6 30000 35000 24585.53 31759.01 15
## 7 30000 35000 24585.53 31759.01 15
## 8 30000 35000 24585.53 31759.01 15
## 9 30000 35000 24585.53 31759.01 15
## 10 30000 35000 24585.53 31759.01 15
## 11 30000 35000 24585.53 31759.01 15
## 12 30000 35000 24585.53 31759.01 15
## 13 30000 35000 24585.53 31759.01 15
## 14 30000 35000 24585.53 31759.01 15
## 15 30000 35000 24585.53 31759.01 15
## 16 30000 35000 24585.53 31759.01 15
## 17 30000 35000 24585.53 31759.01 15
## 18 30000 35000 24585.53 31759.01 15
## 19 30000 35000 24585.53 31759.01 15
## 20 30000 35000 24585.53 31759.01 15
## 21 30000 35000 24585.53 31759.01 15
## 22 30000 35000 24585.53 31759.01 15
## 23 30000 35000 24585.53 31759.01 15
## 24 30000 35000 24585.53 31759.01 15
## 25 30000 35000 24585.53 31759.01 15
## 26 30000 35000 24585.53 31759.01 15
## 27 30000 35000 24585.53 31759.01 15
## 28 30000 35000 24585.53 31759.01 15
## 29 30000 35000 24585.53 31759.01 15
## 30 30000 35000 24585.53 31759.01 15
## 31 30000 35000 24585.53 31759.01 15
## 32 30000 35000 24585.53 31759.01 15
## 33 30000 35000 24585.53 31759.01 15
## 34 30000 35000 24585.53 31759.01 15
## 35 30000 35000 24585.53 31759.01 15
## 36 30000 35000 24585.53 31759.01 15
## 37 30000 35000 24585.53 31759.01 15
## 38 30000 35000 24585.53 31759.01 15
## 39 30000 35000 24585.53 31759.01 15
## 40 30000 35000 24585.53 31759.01 15
## 41 30000 35000 24585.53 31759.01 15
## 42 30000 35000 24585.53 31759.01 15
## 43 30000 35000 24585.53 31759.01 15
## 44 30000 35000 24585.53 31759.01 15
## 45 30000 35000 24585.53 31759.01 15
## 46 30000 35000 24585.53 31759.01 15
## 47 30000 35000 24585.53 31759.01 15
## 48 30000 35000 24585.53 31759.01 15
## 49 30000 35000 24585.53 31759.01 15
## 50 30000 35000 24585.53 31759.01 15
## 51 30000 35000 24585.53 31759.01 15
## 52 30000 35000 24585.53 31759.01 15
## 53 30000 35000 24585.53 31759.01 15
## maximumMaxSalary
## 1 70000
## 2 70000
## 3 70000
## 4 70000
## 5 70000
## 6 70000
## 7 70000
## 8 70000
## 9 70000
## 10 70000
## 11 70000
## 12 70000
## 13 70000
## 14 70000
## 15 70000
## 16 70000
## 17 70000
## 18 70000
## 19 70000
## 20 70000
## 21 70000
## 22 70000
## 23 70000
## 24 70000
## 25 70000
## 26 70000
## 27 70000
## 28 70000
## 29 70000
## 30 70000
## 31 70000
## 32 70000
## 33 70000
## 34 70000
## 35 70000
## 36 70000
## 37 70000
## 38 70000
## 39 70000
## 40 70000
## 41 70000
## 42 70000
## 43 70000
## 44 70000
## 45 70000
## 46 70000
## 47 70000
## 48 70000
## 49 70000
## 50 70000
## 51 70000
## 52 70000
## 53 70000
##
## [[3]]
## date_daysAgo
## 1 27
## 2 7
## 3 30
## 4 27
## 5 Just posted
## 6 30
## 7 30
## 8 30
## 9 11
## 10 13
## 11 6
## 12 30
## 13 30
## 14 10
## 15 6
## 16 30
## 17 30
## 18 14
## 19 30
## 20 30
## 21 13
## 22 19
## 23 30
## 24 27
## 25 13
## 26 6
## 27 6
## 28 14
## 29 13
## 30 16
## 31 10
## 32 27
## 33 6
## 34 7
## 35 30
## 36 13
## 37 6
## 38 6
## 39 14
## 40 13
## 41 16
## 42 13
## 43 30
## 44 27
## 45 13
## 46 6
## 47 6
## 48 14
## 49 13
## 50 16
## 51 13
## 52 27
## 53 30
## 54 10
## 55 30
## 56 6
## 57 7
## 58 27
## 59 30
## 60 13
## 61 6
## 62 6
## 63 14
## 64 13
## 65 16
## 66 13
## 67 27
## 68 30
## 69 10
## 70 30
## 71 6
## 72 7
## 73 27
##
## [[4]]
## HiringAgency
## 1 Synergy Acupuncture & WellnessAmherst, NH 03031
## 2 Hand & Stone - Bedford, MABedford, MA 01730
## 3 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 4 Escape Day Spa3.7North Reading, MA 01864
## 5 Elements Massage3.6Nashua, NH+6 locations
## 6 Inner Beauty ConceptsNashua, NH 03064
## 7 Elements3.6Nashua, NH 03063+6 locations
## 8 CasaBella Salon & SpaAmherst, NH 03031
## 9 Salem Chiropractic CenterWindham, NH 03087
## 10 The Aesthetic LoungeLondonderry, NH 03053
## 11 Massage Envy3.2Nashua, NH 03060+5 locations
## 12 bleu tangerineHampstead, NH 03841
## 13 Hand and Stone3.0Bedford, NH 03110+1 location
## 14 Massage EnvyBillerica, MA
## 15 Elements Massage3.6Tewksbury, MA 01876
## 16 Massage Heights3.1Bedford, NH 03110
## 17 Massage Heights3.1Bedford, NH 03110
## 18 Spavia Day Spa3.3Littleton, MA 01460
## 19 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 20 Massage Heights3.1Bedford, NH 03110
## 21 Massage EnvyBurlington, MA 01803
## 22 Whole Beauty and HealthLowell, MA
## 23 Life Time3.6Burlington, MA 01803
## 24 Escape Day Spa3.7North Reading, MA 01864
## 25 Massage Envy3.2North Reading, MA 01864
## 26 Massage Envy3.2Methuen, MA 01844
## 27 Massage Envy3.2Methuen, MA 01844
## 28 Mint Rose Day SpaBillerica, MA 01821
## 29 Massage Envy3.2North Reading, MA 01864
## 30 Moodz Salon and SpaActon, MA 01720
## 31 Massage EnvyBillerica, MA
## 32 Escape Day Spa3.7North Reading, MA 01864
## 33 Elements Massage3.6Tewksbury, MA 01876
## 34 Hand & Stone - Bedford, MABedford, MA 01730
## 35 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 36 Massage Envy3.2North Reading, MA 01864
## 37 Massage Envy3.2Methuen, MA 01844
## 38 Massage Envy3.2Methuen, MA 01844
## 39 Mint Rose Day SpaBillerica, MA 01821
## 40 Massage Envy3.2North Reading, MA 01864
## 41 Moodz Salon and SpaActon, MA 01720
## 42 Massage EnvyBurlington, MA 01803
## 43 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 44 Synergy Acupuncture & WellnessAmherst, NH 03031
## 45 Massage Envy3.2North Reading, MA 01864
## 46 Massage Envy3.2Methuen, MA 01844
## 47 Massage Envy3.2Methuen, MA 01844
## 48 Mint Rose Day SpaBillerica, MA 01821
## 49 Massage Envy3.2North Reading, MA 01864
## 50 Moodz Salon and SpaActon, MA 01720
## 51 Massage EnvyBurlington, MA 01803
## 52 Escape Day Spa3.7North Reading, MA 01864
## 53 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 54 Massage EnvyBillerica, MA
## 55 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 56 Elements Massage3.6Tewksbury, MA 01876
## 57 Hand & Stone - Bedford, MABedford, MA 01730
## 58 Synergy Acupuncture & WellnessAmherst, NH 03031
## 59 Hand & Stone - Bedford, MABedford, MA 01730
## 60 Massage Envy3.2North Reading, MA 01864
## 61 Massage Envy3.2Methuen, MA 01844
## 62 Massage Envy3.2Methuen, MA 01844
## 63 Mint Rose Day SpaBillerica, MA 01821
## 64 Massage Envy3.2North Reading, MA 01864
## 65 Moodz Salon and SpaActon, MA 01720
## 66 Massage EnvyBurlington, MA 01803
## 67 Escape Day Spa3.7North Reading, MA 01864
## 68 Bella Vita Salon & Day Spa4.0North Andover, MA 01845
## 69 Massage EnvyBillerica, MA
## 70 Compassion Massage Therapeutic ClinicWestford, MA 01886
## 71 Elements Massage3.6Tewksbury, MA 01876
## 72 Hand & Stone - Bedford, MABedford, MA 01730
## 73 Synergy Acupuncture & WellnessAmherst, NH 03031
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 3 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 5 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 7 \nUp to $65,000 a year $65000 65000 NA
## 10 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 11 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 12 \n$55,000 - $65,000 a year ++ $55000 - $65000 55000 65000
## 13 \n$45,760 a year $45760 45760 NA
## 14 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 17 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 19 \n$30,000 - $35,000 a year $30000 - $35000 30000 35000
## 20 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 22 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 23 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 24 \n$45,760 a year $45760 45760 NA
## 25 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 27 \n$30,000 - $35,000 a year $30000 - $35000 30000 35000
## 28 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 29 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 31 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 33 \n$30,000 - $35,000 a year $30000 - $35000 30000 35000
## 34 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 36 \n$45,760 a year $45760 45760 NA
## 37 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 38 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 39 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 40 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 43 \n$60,000 - $70,000 a year $60000 - $70000 60000 70000
## 45 \n$30,000 - $35,000 a year $30000 - $35000 30000 35000
## 46 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 48 \n$45,760 a year $45760 45760 NA
## 49 \n$20,000 - $65,000 a year $20000 - $65000 20000 65000
## 50 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 51 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 52 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 35000 65000 36515.43 59000 20000
## 3 35000 65000 36515.43 59000 20000
## 5 35000 65000 36515.43 59000 20000
## 7 35000 65000 36515.43 59000 20000
## 10 35000 65000 36515.43 59000 20000
## 11 35000 65000 36515.43 59000 20000
## 12 35000 65000 36515.43 59000 20000
## 13 35000 65000 36515.43 59000 20000
## 14 35000 65000 36515.43 59000 20000
## 17 35000 65000 36515.43 59000 20000
## 19 35000 65000 36515.43 59000 20000
## 20 35000 65000 36515.43 59000 20000
## 22 35000 65000 36515.43 59000 20000
## 23 35000 65000 36515.43 59000 20000
## 24 35000 65000 36515.43 59000 20000
## 25 35000 65000 36515.43 59000 20000
## 27 35000 65000 36515.43 59000 20000
## 28 35000 65000 36515.43 59000 20000
## 29 35000 65000 36515.43 59000 20000
## 31 35000 65000 36515.43 59000 20000
## 33 35000 65000 36515.43 59000 20000
## 34 35000 65000 36515.43 59000 20000
## 36 35000 65000 36515.43 59000 20000
## 37 35000 65000 36515.43 59000 20000
## 38 35000 65000 36515.43 59000 20000
## 39 35000 65000 36515.43 59000 20000
## 40 35000 65000 36515.43 59000 20000
## 43 35000 65000 36515.43 59000 20000
## 45 35000 65000 36515.43 59000 20000
## 46 35000 65000 36515.43 59000 20000
## 48 35000 65000 36515.43 59000 20000
## 49 35000 65000 36515.43 59000 20000
## 50 35000 65000 36515.43 59000 20000
## 51 35000 65000 36515.43 59000 20000
## 52 35000 65000 36515.43 59000 20000
## maximumMaxSalary
## 2 70000
## 3 70000
## 5 70000
## 7 70000
## 10 70000
## 11 70000
## 12 70000
## 13 70000
## 14 70000
## 17 70000
## 19 70000
## 20 70000
## 22 70000
## 23 70000
## 24 70000
## 25 70000
## 27 70000
## 28 70000
## 29 70000
## 31 70000
## 33 70000
## 34 70000
## 36 70000
## 37 70000
## 38 70000
## 39 70000
## 40 70000
## 43 70000
## 45 70000
## 46 70000
## 48 70000
## 49 70000
## 50 70000
## 51 70000
## 52 70000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$22 - $30 an hour $22 - $30 22.0 30 22
## 4 \n$15 - $20 an hour $15 - $20 15.0 20 22
## 6 \n$47.50 an hour $47.50 47.5 NA 22
## 8 \n$48 an hour $48 48.0 NA 22
## 9 \n$18 an hour $18 18.0 NA 22
## 15 \n$35 - $45 an hour $35 - $45 35.0 45 22
## 16 \n$15 - $20 an hour $15 - $20 15.0 20 22
## 18 \n$24 - $38 an hour $24 - $38 24.0 38 22
## 21 \n$15 - $20 an hour $15 - $20 15.0 20 22
## 26 \n$24 - $38 an hour $24 - $38 24.0 38 22
## 30 \n$22 - $30 an hour $22 - $30 22.0 30 22
## 32 \n$24 - $38 an hour $24 - $38 24.0 38 22
## 35 \n$15 - $20 an hour $15 - $20 15.0 20 22
## 41 \n$22 - $30 an hour $22 - $30 22.0 30 22
## 44 \n$24 - $38 an hour $24 - $38 24.0 38 22
## 47 \n$15 - $20 an hour $15 - $20 15.0 20 22
## 53 \n$22 - $30 an hour $22 - $30 22.0 30 22
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 23.97059 29.78571 15 45
## 4 30 23.97059 29.78571 15 45
## 6 30 23.97059 29.78571 15 45
## 8 30 23.97059 29.78571 15 45
## 9 30 23.97059 29.78571 15 45
## 15 30 23.97059 29.78571 15 45
## 16 30 23.97059 29.78571 15 45
## 18 30 23.97059 29.78571 15 45
## 21 30 23.97059 29.78571 15 45
## 26 30 23.97059 29.78571 15 45
## 30 30 23.97059 29.78571 15 45
## 32 30 23.97059 29.78571 15 45
## 35 30 23.97059 29.78571 15 45
## 41 30 23.97059 29.78571 15 45
## 44 30 23.97059 29.78571 15 45
## 47 30 23.97059 29.78571 15 45
## 53 30 23.97059 29.78571 15 45
##
## [[7]]
## city state jobTitle
## 1 Nashua NH Licensed Massage Therapist (LMT)
## 2 Nashua NH Licensed Massage Therapist
## 3 Nashua NH Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 4 Nashua NH Licensed Massage Therapist
## 5 Nashua NH Massage Therapist
## 6 Nashua NH Massage Therapist - Independent Contractor
## 7 Nashua NH Massage Therapist
## 8 Nashua NH Massage Therapist
## 9 Nashua NH Massage Therapist
## 10 Nashua NH Esthetician/Makeup Artist/Massage Therapist/Microblader/Nail...
## 11 Nashua NH Massage Therapist - Full Time
## 12 Nashua NH Massage Therapist
## 13 Nashua NH Licensed Massage Therapist
## 14 Nashua NH Licensed Massage Therapist (LMT)
## 15 Nashua NH Massage Therapist
## 16 Nashua NH Licensed Massage Therapist
## 17 Nashua NH Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 18 Nashua NH Massage Therapist
## 19 Nashua NH Licensed Massage Therapist (LMT)
## 20 Nashua NH Lead Massage Therapist - Trainer
## 21 Nashua NH Licensed Massage Therapist
## 22 Nashua NH Licensed Massage Therapist (LMT)
## 23 Nashua NH Massage Therapist
## 24 Nashua NH Licensed Massage Therapist
## 25 Nashua NH Massage Therapist Full-Time 60-70K
## 26 Nashua NH Massage Therapist; Night shifts
## 27 Nashua NH Massage Therapist Nights & Weekends
## 28 Nashua NH Licensed Massage Therapist (LMT)
## 29 Nashua NH Massage Therapist Part-Time up to 35K
## 30 Nashua NH Licensed Massage Therapist
## 31 Nashua NH Licensed Massage Therapist (LMT)
## 32 Nashua NH Licensed Massage Therapist
## 33 Nashua NH Massage Therapist
## 34 Nashua NH Licensed Massage Therapist
## 35 Nashua NH Licensed Massage Therapist (LMT)
## 36 Nashua NH Massage Therapist Full-Time 60-70K
## 37 Nashua NH Massage Therapist; Night shifts
## 38 Nashua NH Massage Therapist Nights & Weekends
## 39 Nashua NH Licensed Massage Therapist (LMT)
## 40 Nashua NH Massage Therapist Part-Time up to 35K
## 41 Nashua NH Licensed Massage Therapist
## 42 Nashua NH Licensed Massage Therapist
## 43 Nashua NH Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 44 Nashua NH Licensed Massage Therapist (LMT)
## 45 Nashua NH Massage Therapist Full-Time 60-70K
## 46 Nashua NH Massage Therapist; Night shifts
## 47 Nashua NH Massage Therapist Nights & Weekends
## 48 Nashua NH Licensed Massage Therapist (LMT)
## 49 Nashua NH Massage Therapist Part-Time up to 35K
## 50 Nashua NH Licensed Massage Therapist
## 51 Nashua NH Licensed Massage Therapist
## 52 Nashua NH Licensed Massage Therapist
## 53 Nashua NH Licensed Massage Therapist (LMT)
## 54 Nashua NH Licensed Massage Therapist (LMT)
## 55 Nashua NH Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 56 Nashua NH Massage Therapist
## 57 Nashua NH Licensed Massage Therapist
## 58 Nashua NH Licensed Massage Therapist (LMT)
## 59 Nashua NH Licensed Massage Therapist
## 60 Nashua NH Massage Therapist Full-Time 60-70K
## 61 Nashua NH Massage Therapist; Night shifts
## 62 Nashua NH Massage Therapist Nights & Weekends
## 63 Nashua NH Licensed Massage Therapist (LMT)
## 64 Nashua NH Massage Therapist Part-Time up to 35K
## 65 Nashua NH Licensed Massage Therapist
## 66 Nashua NH Licensed Massage Therapist
## 67 Nashua NH Licensed Massage Therapist
## 68 Nashua NH Licensed Massage Therapist (LMT)
## 69 Nashua NH Licensed Massage Therapist (LMT)
## 70 Nashua NH Massage Therapist (LMT) 1 to 3 days per week - Already Licen...
## 71 Nashua NH Massage Therapist
## 72 Nashua NH Licensed Massage Therapist
## 73 Nashua NH Licensed Massage Therapist (LMT)
## HiringAgency date_daysAgo
## 1 Synergy Acupuncture & WellnessAmherst, NH 03031 27
## 2 Hand & Stone - Bedford, MABedford, MA 01730 7
## 3 Compassion Massage Therapeutic ClinicWestford, MA 01886 30
## 4 Escape Day Spa3.7North Reading, MA 01864 27
## 5 Elements Massage3.6Nashua, NH+6 locations Just posted
## 6 Inner Beauty ConceptsNashua, NH 03064 30
## 7 Elements3.6Nashua, NH 03063+6 locations 30
## 8 CasaBella Salon & SpaAmherst, NH 03031 30
## 9 Salem Chiropractic CenterWindham, NH 03087 11
## 10 The Aesthetic LoungeLondonderry, NH 03053 13
## 11 Massage Envy3.2Nashua, NH 03060+5 locations 6
## 12 bleu tangerineHampstead, NH 03841 30
## 13 Hand and Stone3.0Bedford, NH 03110+1 location 30
## 14 Massage EnvyBillerica, MA 10
## 15 Elements Massage3.6Tewksbury, MA 01876 6
## 16 Massage Heights3.1Bedford, NH 03110 30
## 17 Massage Heights3.1Bedford, NH 03110 30
## 18 Spavia Day Spa3.3Littleton, MA 01460 14
## 19 Bella Vita Salon & Day Spa4.0North Andover, MA 01845 30
## 20 Massage Heights3.1Bedford, NH 03110 30
## 21 Massage EnvyBurlington, MA 01803 13
## 22 Whole Beauty and HealthLowell, MA 19
## 23 Life Time3.6Burlington, MA 01803 30
## 24 Escape Day Spa3.7North Reading, MA 01864 27
## 25 Massage Envy3.2North Reading, MA 01864 13
## 26 Massage Envy3.2Methuen, MA 01844 6
## 27 Massage Envy3.2Methuen, MA 01844 6
## 28 Mint Rose Day SpaBillerica, MA 01821 14
## 29 Massage Envy3.2North Reading, MA 01864 13
## 30 Moodz Salon and SpaActon, MA 01720 16
## 31 Massage EnvyBillerica, MA 10
## 32 Escape Day Spa3.7North Reading, MA 01864 27
## 33 Elements Massage3.6Tewksbury, MA 01876 6
## 34 Hand & Stone - Bedford, MABedford, MA 01730 7
## 35 Bella Vita Salon & Day Spa4.0North Andover, MA 01845 30
## 36 Massage Envy3.2North Reading, MA 01864 13
## 37 Massage Envy3.2Methuen, MA 01844 6
## 38 Massage Envy3.2Methuen, MA 01844 6
## 39 Mint Rose Day SpaBillerica, MA 01821 14
## 40 Massage Envy3.2North Reading, MA 01864 13
## 41 Moodz Salon and SpaActon, MA 01720 16
## 42 Massage EnvyBurlington, MA 01803 13
## 43 Compassion Massage Therapeutic ClinicWestford, MA 01886 30
## 44 Synergy Acupuncture & WellnessAmherst, NH 03031 27
## 45 Massage Envy3.2North Reading, MA 01864 13
## 46 Massage Envy3.2Methuen, MA 01844 6
## 47 Massage Envy3.2Methuen, MA 01844 6
## 48 Mint Rose Day SpaBillerica, MA 01821 14
## 49 Massage Envy3.2North Reading, MA 01864 13
## 50 Moodz Salon and SpaActon, MA 01720 16
## 51 Massage EnvyBurlington, MA 01803 13
## 52 Escape Day Spa3.7North Reading, MA 01864 27
## 53 Bella Vita Salon & Day Spa4.0North Andover, MA 01845 30
## 54 Massage EnvyBillerica, MA 10
## 55 Compassion Massage Therapeutic ClinicWestford, MA 01886 30
## 56 Elements Massage3.6Tewksbury, MA 01876 6
## 57 Hand & Stone - Bedford, MABedford, MA 01730 7
## 58 Synergy Acupuncture & WellnessAmherst, NH 03031 27
## 59 Hand & Stone - Bedford, MABedford, MA 01730 30
## 60 Massage Envy3.2North Reading, MA 01864 13
## 61 Massage Envy3.2Methuen, MA 01844 6
## 62 Massage Envy3.2Methuen, MA 01844 6
## 63 Mint Rose Day SpaBillerica, MA 01821 14
## 64 Massage Envy3.2North Reading, MA 01864 13
## 65 Moodz Salon and SpaActon, MA 01720 16
## 66 Massage EnvyBurlington, MA 01803 13
## 67 Escape Day Spa3.7North Reading, MA 01864 27
## 68 Bella Vita Salon & Day Spa4.0North Andover, MA 01845 30
## 69 Massage EnvyBillerica, MA 10
## 70 Compassion Massage Therapeutic ClinicWestford, MA 01886 30
## 71 Elements Massage3.6Tewksbury, MA 01876 6
## 72 Hand & Stone - Bedford, MABedford, MA 01730 7
## 73 Synergy Acupuncture & WellnessAmherst, NH 03031 27
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 15 45 20000 70000
## 2 15 45 20000 70000
## 3 15 45 20000 70000
## 4 15 45 20000 70000
## 5 15 45 20000 70000
## 6 15 45 20000 70000
## 7 15 45 20000 70000
## 8 15 45 20000 70000
## 9 15 45 20000 70000
## 10 15 45 20000 70000
## 11 15 45 20000 70000
## 12 15 45 20000 70000
## 13 15 45 20000 70000
## 14 15 45 20000 70000
## 15 15 45 20000 70000
## 16 15 45 20000 70000
## 17 15 45 20000 70000
## 18 15 45 20000 70000
## 19 15 45 20000 70000
## 20 15 45 20000 70000
## 21 15 45 20000 70000
## 22 15 45 20000 70000
## 23 15 45 20000 70000
## 24 15 45 20000 70000
## 25 15 45 20000 70000
## 26 15 45 20000 70000
## 27 15 45 20000 70000
## 28 15 45 20000 70000
## 29 15 45 20000 70000
## 30 15 45 20000 70000
## 31 15 45 20000 70000
## 32 15 45 20000 70000
## 33 15 45 20000 70000
## 34 15 45 20000 70000
## 35 15 45 20000 70000
## 36 15 45 20000 70000
## 37 15 45 20000 70000
## 38 15 45 20000 70000
## 39 15 45 20000 70000
## 40 15 45 20000 70000
## 41 15 45 20000 70000
## 42 15 45 20000 70000
## 43 15 45 20000 70000
## 44 15 45 20000 70000
## 45 15 45 20000 70000
## 46 15 45 20000 70000
## 47 15 45 20000 70000
## 48 15 45 20000 70000
## 49 15 45 20000 70000
## 50 15 45 20000 70000
## 51 15 45 20000 70000
## 52 15 45 20000 70000
## 53 15 45 20000 70000
## 54 15 45 20000 70000
## 55 15 45 20000 70000
## 56 15 45 20000 70000
## 57 15 45 20000 70000
## 58 15 45 20000 70000
## 59 15 45 20000 70000
## 60 15 45 20000 70000
## 61 15 45 20000 70000
## 62 15 45 20000 70000
## 63 15 45 20000 70000
## 64 15 45 20000 70000
## 65 15 45 20000 70000
## 66 15 45 20000 70000
## 67 15 45 20000 70000
## 68 15 45 20000 70000
## 69 15 45 20000 70000
## 70 15 45 20000 70000
## 71 15 45 20000 70000
## 72 15 45 20000 70000
## 73 15 45 20000 70000
getIndeedJobData5pages('massage therapist', 'Concord','NH')
## Warning in getIndeedJobData5pages("massage therapist", "Concord", "NH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Concord", "NH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Concord", "NH"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 10 Massage Therapist - Full Time
## 11 Lead Massage Therapist - Trainer
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 21 Massage Therapist - Full Time
## 22 Lead Massage Therapist - Trainer
## 23 Massage Therapist
## 24 Massage Therapist
## 25 Licensed Massage Therapist (LMT)
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 31 Massage Therapist - Full Time
## 32 Lead Massage Therapist - Trainer
## 33 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 34 Massage Therapist
## 35 Licensed Massage Therapist (LMT)
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 41 Massage Therapist - Full Time
## 42 Lead Massage Therapist - Trainer
## 43 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 44 Massage Therapist
## 45 Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 46 Massage Therapist
## 47 Licensed Massage Therapist (LMT)
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 53 Massage Therapist - Full Time
## 54 Lead Massage Therapist - Trainer
## 55 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 2 \nUp to $65,000 a year $65000 65000 NA
## 3 \n$24 - $38 an hour $24 - $38 24 38
## 4 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 5 \n$18 an hour $18 18 NA
## 6 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 7 \nUp to $65,000 a year $65000 65000 NA
## 8 \n$24 - $38 an hour $24 - $38 24 38
## 9 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 10 \n$18 an hour $18 18 NA
## 11 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 12 \nUp to $65,000 a year $65000 65000 NA
## 13 \n$24 - $38 an hour $24 - $38 24 38
## 14 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 15 \n$18 an hour $18 18 NA
## 16 \nUp to $65,000 a year $65000 65000 NA
## 17 \n$24 - $38 an hour $24 - $38 24 38
## 18 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 19 \n$18 an hour $18 18 NA
## 20 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 21 \nUp to $65,000 a year $65000 65000 NA
## 22 \n$24 - $38 an hour $24 - $38 24 38
## 23 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 24 \n$18 an hour $18 18 NA
## 25 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30000 32500 26008.4 32510 18
## 2 30000 32500 26008.4 32510 18
## 3 30000 32500 26008.4 32510 18
## 4 30000 32500 26008.4 32510 18
## 5 30000 32500 26008.4 32510 18
## 6 30000 32500 26008.4 32510 18
## 7 30000 32500 26008.4 32510 18
## 8 30000 32500 26008.4 32510 18
## 9 30000 32500 26008.4 32510 18
## 10 30000 32500 26008.4 32510 18
## 11 30000 32500 26008.4 32510 18
## 12 30000 32500 26008.4 32510 18
## 13 30000 32500 26008.4 32510 18
## 14 30000 32500 26008.4 32510 18
## 15 30000 32500 26008.4 32510 18
## 16 30000 32500 26008.4 32510 18
## 17 30000 32500 26008.4 32510 18
## 18 30000 32500 26008.4 32510 18
## 19 30000 32500 26008.4 32510 18
## 20 30000 32500 26008.4 32510 18
## 21 30000 32500 26008.4 32510 18
## 22 30000 32500 26008.4 32510 18
## 23 30000 32500 26008.4 32510 18
## 24 30000 32500 26008.4 32510 18
## 25 30000 32500 26008.4 32510 18
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
##
## [[3]]
## date_daysAgo
## 1 Today
## 2 30
## 3 24
## 4 15
## 5 13
## 6 7
## 7 30
## 8 30
## 9 30
## 10 6
## 11 30
## 12 Today
## 13 30
## 14 24
## 15 15
## 16 13
## 17 7
## 18 30
## 19 30
## 20 30
## 21 6
## 22 30
## 23 Today
## 24 30
## 25 24
## 26 13
## 27 7
## 28 30
## 29 30
## 30 30
## 31 6
## 32 30
## 33 15
## 34 30
## 35 24
## 36 13
## 37 7
## 38 30
## 39 30
## 40 30
## 41 6
## 42 30
## 43 15
## 44 Today
## 45 15
## 46 30
## 47 24
## 48 13
## 49 7
## 50 30
## 51 30
## 52 30
## 53 6
## 54 30
## 55 Today
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Concord, NH
## 2 Elements3.6Concord, NH 03301
## 3 Strength and Power MassageConcord, NH 03301
## 4 Serendipity Day SpaPembroke, NH 03275
## 5 CBD American shaman2.0Laconia, NH 03246
## 6 The Sensory spa PLLCGoffstown, NH 03045
## 7 Hand and Stone3.0Bedford, NH 03110
## 8 Massage Heights3.1Bedford, NH 03110
## 9 Massage Heights3.1Bedford, NH 03110
## 10 Massage Envy3.2Manchester, NH 03103 (Southside area)
## 11 Massage Heights3.1Bedford, NH 03110
## 12 Elements Massage3.6Concord, NH
## 13 Elements3.6Concord, NH 03301
## 14 Strength and Power MassageConcord, NH 03301
## 15 Serendipity Day SpaPembroke, NH 03275
## 16 CBD American shaman2.0Laconia, NH 03246
## 17 The Sensory spa PLLCGoffstown, NH 03045
## 18 Hand and Stone3.0Bedford, NH 03110
## 19 Massage Heights3.1Bedford, NH 03110
## 20 Massage Heights3.1Bedford, NH 03110
## 21 Massage Envy3.2Manchester, NH 03103 (Southside area)
## 22 Massage Heights3.1Bedford, NH 03110
## 23 Elements Massage3.6Concord, NH
## 24 Elements3.6Concord, NH 03301
## 25 Strength and Power MassageConcord, NH 03301
## 26 CBD American shaman2.0Laconia, NH 03246
## 27 The Sensory spa PLLCGoffstown, NH 03045
## 28 Hand and Stone3.0Bedford, NH 03110
## 29 Massage Heights3.1Bedford, NH 03110
## 30 Massage Heights3.1Bedford, NH 03110
## 31 Massage Envy3.2Manchester, NH 03103 (Southside area)
## 32 Massage Heights3.1Bedford, NH 03110
## 33 Serendipity Day SpaPembroke, NH 03275
## 34 Elements3.6Concord, NH 03301
## 35 Strength and Power MassageConcord, NH 03301
## 36 CBD American shaman2.0Laconia, NH 03246
## 37 The Sensory spa PLLCGoffstown, NH 03045
## 38 Hand and Stone3.0Bedford, NH 03110
## 39 Massage Heights3.1Bedford, NH 03110
## 40 Massage Heights3.1Bedford, NH 03110
## 41 Massage Envy3.2Manchester, NH 03103 (Southside area)
## 42 Massage Heights3.1Bedford, NH 03110
## 43 Serendipity Day SpaPembroke, NH 03275
## 44 Elements Massage3.6Concord, NH
## 45 Serendipity Day SpaPembroke, NH 03275
## 46 Elements3.6Concord, NH 03301
## 47 Strength and Power MassageConcord, NH 03301
## 48 CBD American shaman2.0Laconia, NH 03246
## 49 The Sensory spa PLLCGoffstown, NH 03045
## 50 Hand and Stone3.0Bedford, NH 03110
## 51 Massage Heights3.1Bedford, NH 03110
## 52 Massage Heights3.1Bedford, NH 03110
## 53 Massage Envy3.2Manchester, NH 03103 (Southside area)
## 54 Massage Heights3.1Bedford, NH 03110
## 55 Elements Massage3.6Concord, NH
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 2 \nUp to $65,000 a year $65000 65000 NA
## 4 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 6 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 7 \nUp to $65,000 a year $65000 65000 NA
## 9 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 11 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 12 \nUp to $65,000 a year $65000 65000 NA
## 14 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 16 \nUp to $65,000 a year $65000 65000 NA
## 18 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 20 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 21 \nUp to $65,000 a year $65000 65000 NA
## 23 \n$30,000 - $65,000 a year $30000 - $65000 30000 65000
## 25 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35000 65000 43333.33 65000 30000
## 2 35000 65000 43333.33 65000 30000
## 4 35000 65000 43333.33 65000 30000
## 6 35000 65000 43333.33 65000 30000
## 7 35000 65000 43333.33 65000 30000
## 9 35000 65000 43333.33 65000 30000
## 11 35000 65000 43333.33 65000 30000
## 12 35000 65000 43333.33 65000 30000
## 14 35000 65000 43333.33 65000 30000
## 16 35000 65000 43333.33 65000 30000
## 18 35000 65000 43333.33 65000 30000
## 20 35000 65000 43333.33 65000 30000
## 21 35000 65000 43333.33 65000 30000
## 23 35000 65000 43333.33 65000 30000
## 25 35000 65000 43333.33 65000 30000
## maximumMaxSalary
## 1 65000
## 2 65000
## 4 65000
## 6 65000
## 7 65000
## 9 65000
## 11 65000
## 12 65000
## 14 65000
## 16 65000
## 18 65000
## 20 65000
## 21 65000
## 23 65000
## 25 65000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 3 \n$24 - $38 an hour $24 - $38 24 38 21
## 5 \n$18 an hour $18 18 NA 21
## 8 \n$24 - $38 an hour $24 - $38 24 38 21
## 10 \n$18 an hour $18 18 NA 21
## 13 \n$24 - $38 an hour $24 - $38 24 38 21
## 15 \n$18 an hour $18 18 NA 21
## 17 \n$24 - $38 an hour $24 - $38 24 38 21
## 19 \n$18 an hour $18 18 NA 21
## 22 \n$24 - $38 an hour $24 - $38 24 38 21
## 24 \n$18 an hour $18 18 NA 21
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 3 38 21 38 18 38
## 5 38 21 38 18 38
## 8 38 21 38 18 38
## 10 38 21 38 18 38
## 13 38 21 38 18 38
## 15 38 21 38 18 38
## 17 38 21 38 18 38
## 19 38 21 38 18 38
## 22 38 21 38 18 38
## 24 38 21 38 18 38
##
## [[7]]
## city state jobTitle
## 1 Concord NH Massage Therapist
## 2 Concord NH Massage Therapist
## 3 Concord NH Licensed Massage Therapist (LMT)
## 4 Concord NH Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 5 Concord NH Licensed Massage Therapist
## 6 Concord NH Licensed Massage Therapist
## 7 Concord NH Licensed Massage Therapist
## 8 Concord NH Licensed Massage Therapist
## 9 Concord NH Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 10 Concord NH Massage Therapist - Full Time
## 11 Concord NH Lead Massage Therapist - Trainer
## 12 Concord NH Massage Therapist
## 13 Concord NH Massage Therapist
## 14 Concord NH Licensed Massage Therapist (LMT)
## 15 Concord NH Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 16 Concord NH Licensed Massage Therapist
## 17 Concord NH Licensed Massage Therapist
## 18 Concord NH Licensed Massage Therapist
## 19 Concord NH Licensed Massage Therapist
## 20 Concord NH Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 21 Concord NH Massage Therapist - Full Time
## 22 Concord NH Lead Massage Therapist - Trainer
## 23 Concord NH Massage Therapist
## 24 Concord NH Massage Therapist
## 25 Concord NH Licensed Massage Therapist (LMT)
## 26 Concord NH Licensed Massage Therapist
## 27 Concord NH Licensed Massage Therapist
## 28 Concord NH Licensed Massage Therapist
## 29 Concord NH Licensed Massage Therapist
## 30 Concord NH Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 31 Concord NH Massage Therapist - Full Time
## 32 Concord NH Lead Massage Therapist - Trainer
## 33 Concord NH Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 34 Concord NH Massage Therapist
## 35 Concord NH Licensed Massage Therapist (LMT)
## 36 Concord NH Licensed Massage Therapist
## 37 Concord NH Licensed Massage Therapist
## 38 Concord NH Licensed Massage Therapist
## 39 Concord NH Licensed Massage Therapist
## 40 Concord NH Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 41 Concord NH Massage Therapist - Full Time
## 42 Concord NH Lead Massage Therapist - Trainer
## 43 Concord NH Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 44 Concord NH Massage Therapist
## 45 Concord NH Certified Massage Therapist-Up To $2,000 Sign On Bonus!
## 46 Concord NH Massage Therapist
## 47 Concord NH Licensed Massage Therapist (LMT)
## 48 Concord NH Licensed Massage Therapist
## 49 Concord NH Licensed Massage Therapist
## 50 Concord NH Licensed Massage Therapist
## 51 Concord NH Licensed Massage Therapist
## 52 Concord NH Licensed Massage Therapist with a $2000 Appreciation Bonus!
## 53 Concord NH Massage Therapist - Full Time
## 54 Concord NH Lead Massage Therapist - Trainer
## 55 Concord NH Massage Therapist
## HiringAgency date_daysAgo
## 1 Elements Massage3.6Concord, NH Today
## 2 Elements3.6Concord, NH 03301 30
## 3 Strength and Power MassageConcord, NH 03301 24
## 4 Serendipity Day SpaPembroke, NH 03275 15
## 5 CBD American shaman2.0Laconia, NH 03246 13
## 6 The Sensory spa PLLCGoffstown, NH 03045 7
## 7 Hand and Stone3.0Bedford, NH 03110 30
## 8 Massage Heights3.1Bedford, NH 03110 30
## 9 Massage Heights3.1Bedford, NH 03110 30
## 10 Massage Envy3.2Manchester, NH 03103 (Southside area) 6
## 11 Massage Heights3.1Bedford, NH 03110 30
## 12 Elements Massage3.6Concord, NH Today
## 13 Elements3.6Concord, NH 03301 30
## 14 Strength and Power MassageConcord, NH 03301 24
## 15 Serendipity Day SpaPembroke, NH 03275 15
## 16 CBD American shaman2.0Laconia, NH 03246 13
## 17 The Sensory spa PLLCGoffstown, NH 03045 7
## 18 Hand and Stone3.0Bedford, NH 03110 30
## 19 Massage Heights3.1Bedford, NH 03110 30
## 20 Massage Heights3.1Bedford, NH 03110 30
## 21 Massage Envy3.2Manchester, NH 03103 (Southside area) 6
## 22 Massage Heights3.1Bedford, NH 03110 30
## 23 Elements Massage3.6Concord, NH Today
## 24 Elements3.6Concord, NH 03301 30
## 25 Strength and Power MassageConcord, NH 03301 24
## 26 CBD American shaman2.0Laconia, NH 03246 13
## 27 The Sensory spa PLLCGoffstown, NH 03045 7
## 28 Hand and Stone3.0Bedford, NH 03110 30
## 29 Massage Heights3.1Bedford, NH 03110 30
## 30 Massage Heights3.1Bedford, NH 03110 30
## 31 Massage Envy3.2Manchester, NH 03103 (Southside area) 6
## 32 Massage Heights3.1Bedford, NH 03110 30
## 33 Serendipity Day SpaPembroke, NH 03275 15
## 34 Elements3.6Concord, NH 03301 30
## 35 Strength and Power MassageConcord, NH 03301 24
## 36 CBD American shaman2.0Laconia, NH 03246 13
## 37 The Sensory spa PLLCGoffstown, NH 03045 7
## 38 Hand and Stone3.0Bedford, NH 03110 30
## 39 Massage Heights3.1Bedford, NH 03110 30
## 40 Massage Heights3.1Bedford, NH 03110 30
## 41 Massage Envy3.2Manchester, NH 03103 (Southside area) 6
## 42 Massage Heights3.1Bedford, NH 03110 30
## 43 Serendipity Day SpaPembroke, NH 03275 15
## 44 Elements Massage3.6Concord, NH Today
## 45 Serendipity Day SpaPembroke, NH 03275 15
## 46 Elements3.6Concord, NH 03301 30
## 47 Strength and Power MassageConcord, NH 03301 24
## 48 CBD American shaman2.0Laconia, NH 03246 13
## 49 The Sensory spa PLLCGoffstown, NH 03045 7
## 50 Hand and Stone3.0Bedford, NH 03110 30
## 51 Massage Heights3.1Bedford, NH 03110 30
## 52 Massage Heights3.1Bedford, NH 03110 30
## 53 Massage Envy3.2Manchester, NH 03103 (Southside area) 6
## 54 Massage Heights3.1Bedford, NH 03110 30
## 55 Elements Massage3.6Concord, NH Today
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 18 38 30000 65000
## 2 18 38 30000 65000
## 3 18 38 30000 65000
## 4 18 38 30000 65000
## 5 18 38 30000 65000
## 6 18 38 30000 65000
## 7 18 38 30000 65000
## 8 18 38 30000 65000
## 9 18 38 30000 65000
## 10 18 38 30000 65000
## 11 18 38 30000 65000
## 12 18 38 30000 65000
## 13 18 38 30000 65000
## 14 18 38 30000 65000
## 15 18 38 30000 65000
## 16 18 38 30000 65000
## 17 18 38 30000 65000
## 18 18 38 30000 65000
## 19 18 38 30000 65000
## 20 18 38 30000 65000
## 21 18 38 30000 65000
## 22 18 38 30000 65000
## 23 18 38 30000 65000
## 24 18 38 30000 65000
## 25 18 38 30000 65000
## 26 18 38 30000 65000
## 27 18 38 30000 65000
## 28 18 38 30000 65000
## 29 18 38 30000 65000
## 30 18 38 30000 65000
## 31 18 38 30000 65000
## 32 18 38 30000 65000
## 33 18 38 30000 65000
## 34 18 38 30000 65000
## 35 18 38 30000 65000
## 36 18 38 30000 65000
## 37 18 38 30000 65000
## 38 18 38 30000 65000
## 39 18 38 30000 65000
## 40 18 38 30000 65000
## 41 18 38 30000 65000
## 42 18 38 30000 65000
## 43 18 38 30000 65000
## 44 18 38 30000 65000
## 45 18 38 30000 65000
## 46 18 38 30000 65000
## 47 18 38 30000 65000
## 48 18 38 30000 65000
## 49 18 38 30000 65000
## 50 18 38 30000 65000
## 51 18 38 30000 65000
## 52 18 38 30000 65000
## 53 18 38 30000 65000
## 54 18 38 30000 65000
## 55 18 38 30000 65000
New Jersey Newark, Jersey City, Paterson
getIndeedJobData5pages('massage therapist', 'Newark','NJ')
## Warning in getIndeedJobData5pages("massage therapist", "Newark", "NJ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Newark", "NJ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Newark", "NJ"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist and/or Esthetician
## 4 Licensed Massage Therapist, Independent Contractor
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist Per Diem
## 10 Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 MASSAGE THERAPIST
## 13 Massage Therapist Weehawken, NJ
## 14 Massage Therapist (LMT)
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist and/or Esthetician
## 19 Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist - West New York, NJ
## 26 Massage Therapist
## 27 Massage Therapist, Naturopathica Chelsea
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 LMT / Massage Therapist / Wellness Services Professionals
## 31 Licensed Massage Therapist
## 32 Medical Massage Therapist
## 33 Massage Therapist
## 34 Licensed Massage Therapist, Independent Contractor
## 35 Licensed Massage Therapist
## 36 Massage Therapist
## 37 Massage Therapist and/or Esthetician
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapist
## 45 Lead Massage Therapist
## 46 Flexologist (Stretch Professional)
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 LifeSpa Massage Therapist
## 50 Massage Therapist
## 51 Massage Therapist
## 52 Massage Therapist [Linden Signup Bonus]
## 53 Licensed Massage Therapist, Independent Contractor
## 54 Massage Therapist
## 55 Massage Therapist
## 56 Massage Therapist at Holmdel Massageenvy
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist / SIGN UP BONUS
## 60 Licensed Massage Therapist (LMT)
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 WEEKEND/EVENINGS: Licensed Massage Therapist JC/Bayonne
## 64 Massage Therapist - Independent Contractor
## 65 Massage Therapist
## 66 Licensed Massage Therapist (LMT)
## 67 Licensed Massage Therapist
## 68 Stretch Technician
## 69 Licensed Massage Therapist
## 70 Licensed Massage Therapist Tier 2
## 71 NOW HIRING FOR JULY TRAINING! Assisted Stretch for Fitness P...
## 72 Licensed Massage Therapist
## 73 Massage Therapist - Mt. Vernon, NY
## 74 Massage Therapist (Luxury Health Club)
## 75 Licensed Massage Therapist
## 76 Massage Therapist
## 77 Massage Therapist - Brooklyn, NY
## 78 Licensed Massage Therapist
## 79 Esthetician/Massage Therapist
## 80 Nail techs & massage therapists for mobile spa
## 81 Prenatal Massage Therapist for Award Winning Practice
## 82 Massage Therapist - Full-Time
## 83 Experienced Massage Therapist
## 84 Licensed Massage Therapist Tier 2
## 85 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $28 an hour $22 - $28 22.0 28
## 2 \n$13.50 an hour $13.50 13.5 NA
## 3 \n$30 - $40 an hour $30 - $40 30.0 40
## 4 \n$15 - $35 an hour $15 - $35 15.0 35
## 5 \n$40 - $60 an hour $40 - $60 40.0 60
## 6 \n$40 - $50 an hour $40 - $50 40.0 50
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 8 \n$35,000 a year $35000 35000.0 NA
## 9 \n$24 - $70 an hour $24 - $70 24.0 70
## 10 \n$30 - $45 an hour $30 - $45 30.0 45
## 11 \n$40 - $50 an hour $40 - $50 40.0 50
## 12 \n$15 - $35 an hour $15 - $35 15.0 35
## 13 \n$30 - $45 an hour $30 - $45 30.0 45
## 14 \n$13.50 an hour $13.50 13.5 NA
## 15 \n$60 - $65 an hour $60 - $65 60.0 65
## 16 \n$22 - $81 an hour $22 - $81 22.0 81
## 17 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000
## 18 \n$22 - $80 an hour $22 - $80 22.0 80
## 19 \n$15 an hour $15 15.0 NA
## 20 \n$60 - $65 an hour $60 - $65 60.0 65
## 21 \n$30 - $40 an hour $30 - $40 30.0 40
## 22 \n$40 - $60 an hour $40 - $60 40.0 60
## 23 \n$22 - $28 an hour $22 - $28 22.0 28
## 24 \n$40 - $60 an hour $40 - $60 40.0 60
## 25 \n$15 - $35 an hour $15 - $35 15.0 35
## 26 \n$30 - $45 an hour $30 - $45 30.0 45
## 27 \n$13.50 an hour $13.50 13.5 NA
## 28 \n$50,000 a year $50000 50000.0 NA
## 29 \n$30 - $40 an hour $30 - $40 30.0 40
## 30 \n$40 - $50 an hour $40 - $50 40.0 50
## 31 \n$22 - $28 an hour $22 - $28 22.0 28
## 32 \n$20 - $22 an hour ++ $20 - $22 20.0 22
## 33 \n$55,000 a year $55000 55000.0 NA
## 34 \n$16 - $19 an hour $16 - $19 16.0 19
## 35 \n$40,000 - $80,000 a year $40000 - $80000 40000.0 80000
## 36 \n$20 - $35 an hour $20 - $35 20.0 35
## 37 \n$17 - $25 an hour $17 - $25 17.0 25
## 38 \n$50 - $90 an hour $50 - $90 50.0 90
## 39 \n$40,000 - $80,000 a year $40000 - $80000 40000.0 80000
## 40 \n$50 - $60 an hour $50 - $60 50.0 60
## 41 \n$45 - $50 an hour $45 - $50 45.0 50
## 42 \n$22 - $37 an hour $22 - $37 22.0 37
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 40 6333.679 6486.851 13.5
## 2 30 40 6333.679 6486.851 13.5
## 3 30 40 6333.679 6486.851 13.5
## 4 30 40 6333.679 6486.851 13.5
## 5 30 40 6333.679 6486.851 13.5
## 6 30 40 6333.679 6486.851 13.5
## 7 30 40 6333.679 6486.851 13.5
## 8 30 40 6333.679 6486.851 13.5
## 9 30 40 6333.679 6486.851 13.5
## 10 30 40 6333.679 6486.851 13.5
## 11 30 40 6333.679 6486.851 13.5
## 12 30 40 6333.679 6486.851 13.5
## 13 30 40 6333.679 6486.851 13.5
## 14 30 40 6333.679 6486.851 13.5
## 15 30 40 6333.679 6486.851 13.5
## 16 30 40 6333.679 6486.851 13.5
## 17 30 40 6333.679 6486.851 13.5
## 18 30 40 6333.679 6486.851 13.5
## 19 30 40 6333.679 6486.851 13.5
## 20 30 40 6333.679 6486.851 13.5
## 21 30 40 6333.679 6486.851 13.5
## 22 30 40 6333.679 6486.851 13.5
## 23 30 40 6333.679 6486.851 13.5
## 24 30 40 6333.679 6486.851 13.5
## 25 30 40 6333.679 6486.851 13.5
## 26 30 40 6333.679 6486.851 13.5
## 27 30 40 6333.679 6486.851 13.5
## 28 30 40 6333.679 6486.851 13.5
## 29 30 40 6333.679 6486.851 13.5
## 30 30 40 6333.679 6486.851 13.5
## 31 30 40 6333.679 6486.851 13.5
## 32 30 40 6333.679 6486.851 13.5
## 33 30 40 6333.679 6486.851 13.5
## 34 30 40 6333.679 6486.851 13.5
## 35 30 40 6333.679 6486.851 13.5
## 36 30 40 6333.679 6486.851 13.5
## 37 30 40 6333.679 6486.851 13.5
## 38 30 40 6333.679 6486.851 13.5
## 39 30 40 6333.679 6486.851 13.5
## 40 30 40 6333.679 6486.851 13.5
## 41 30 40 6333.679 6486.851 13.5
## 42 30 40 6333.679 6486.851 13.5
## maximumMaxSalary
## 1 80000
## 2 80000
## 3 80000
## 4 80000
## 5 80000
## 6 80000
## 7 80000
## 8 80000
## 9 80000
## 10 80000
## 11 80000
## 12 80000
## 13 80000
## 14 80000
## 15 80000
## 16 80000
## 17 80000
## 18 80000
## 19 80000
## 20 80000
## 21 80000
## 22 80000
## 23 80000
## 24 80000
## 25 80000
## 26 80000
## 27 80000
## 28 80000
## 29 80000
## 30 80000
## 31 80000
## 32 80000
## 33 80000
## 34 80000
## 35 80000
## 36 80000
## 37 80000
## 38 80000
## 39 80000
## 40 80000
## 41 80000
## 42 80000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 4
## 3 20
## 4 30
## 5 30
## 6 1
## 7 5
## 8 5
## 9 30
## 10 30
## 11 6
## 12 13
## 13 17
## 14 30
## 15 2
## 16 30
## 17 7
## 18 20
## 19 5
## 20 7
## 21 30
## 22 30
## 23 4
## 24 30
## 25 30
## 26 18
## 27 Today
## 28 30
## 29 30
## 30 1
## 31 20
## 32 9
## 33 11
## 34 30
## 35 1
## 36 30
## 37 20
## 38 1
## 39 7
## 40 30
## 41 30
## 42 4
## 43 6
## 44 30
## 45 30
## 46 7
## 47 14
## 48 4
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 5
## 55 30
## 56 30
## 57 18
## 58 17
## 59 30
## 60 25
## 61 7
## 62 8
## 63 30
## 64 13
## 65 21
## 66 17
## 67 30
## 68 6
## 69 30
## 70 12
## 71 7
## 72 30
## 73 30
## 74 30
## 75 26
## 76 30
## 77 30
## 78 8
## 79 30
## 80 13
## 81 30
## 82 7
## 83 6
## 84 11
## 85 30
##
## [[4]]
## HiringAgency
## 1 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 2 The Woodhouse Day SpaMontclair, NJ 07042
## 3 Hand and Stone Massage and Facial Spa3.0Newark, NJ
## 4 Harmony Within Massage TherapyWestwood, NJ 07675
## 5 HealthcareAtlantic Highlands, NJ 07716
## 6 Blackbird Yoga StudioHaworth, NJ 07641
## 7 Elements Massage3.6Totowa, NJ 07512
## 8 Indo-Pak Massage TherapyEast Orange, NJ+15 locations•Remote work available
## 9 Englewood Hospital and Medical Center4.0Englewood, NJ 07631
## 10 Elements3.6Nutley, NJ 07110+3 locations
## 11 Franklin Lakes Sport & SpineFranklin Lakes, NJ 07417
## 12 THE URBAN MUSE4.3Denville, NJ 07834
## 13 Spa SocietyWeehawken, NJ 07086
## 14 Elements3.6Montclair, NJ 07042
## 15 Mosaic Salon & SpaWoodbridge, NJ 07095
## 16 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 17 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 18 Hand and Stone Massage and Facial Spa3.0Newark, NJ
## 19 Elements Massage3.6Totowa, NJ 07512
## 20 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 21 HealthcareAtlantic Highlands, NJ 07716
## 22 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 23 The Woodhouse Day SpaMontclair, NJ 07042
## 24 Hand and Stone3.0Livingston, NJ 07039+17 locations
## 25 Flamingo4.2West New York, NJ 07093
## 26 NJ Foot and Ankle CentersOradell, NJ 07649
## 27 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 28 Spavia Day Spa3.3Hanover, NJ+2 locations
## 29 Massage Envy3.2Verona, NJ 07044+29 locations
## 30 FitLoreNew York, NY 10065 (Upper East Side area)
## 31 TheraPhysical, LLCGarfield, NJ 07026
## 32 Kindness Unlimited Therapy ServicesQueens, NY
## 33 stronghands massage therapyRamsey, NJ
## 34 Harmony Within Massage TherapyWestwood, NJ 07675
## 35 Blackbird Yoga StudioHaworth, NJ 07641
## 36 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 37 Hand and Stone Massage and Facial Spa3.0Newark, NJ
## 38 Blackbird Yoga StudioHaworth, NJ 07641
## 39 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 40 HealthcareAtlantic Highlands, NJ 07716
## 41 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 42 The Woodhouse Day SpaMontclair, NJ 07042
## 43 Hand and Stone North BrunswickPiscataway, NJ 08854
## 44 Life Time3.6Berkeley Heights, NJ 07922+1 location
## 45 Hand and Stone3.0Kearny, NJ 07032+2 locations
## 46 StretchLab3.8Morristown, NJ 07960
## 47 Siskin Family ChiropracticTownship of Green Brook, NJ 08812
## 48 The Spa At Little RiverSouth River, NJ 08882
## 49 Life Time3.6Florham Park, NJ 07932
## 50 Island Spa & SaunaEdison, NJ 08817
## 51 Hand and Stone3.0Woodbridge, NJ 07095+1 location
## 52 Massage Envy3.2Linden, NJ 07036+1 location
## 53 Harmony Within Massage TherapyWestwood, NJ 07675
## 54 Elements Massage3.6Totowa, NJ 07512
## 55 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 56 Massage Envy3.2Holmdel, NJ 07733•Remote work available
## 57 Massage Heights3.1Morristown, NJ 07960
## 58 Massage Heights - Morristown3.1Morristown, NJ 07960
## 59 Massage Envy3.2Bayonne, NJ 07002
## 60 Pure Massage/Spa 23 Fitness & LifestylePompton Plains, NJ
## 61 Morris Plains Massage EnvyMorris Plains, NJ 07950
## 62 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 63 Hand and Stone3.0Bayonne, NJ 07002
## 64 Massage by ElizabethMarlboro, NJ 07751
## 65 Hand & Stone - Toms River, Manalapan, Howell, Bayo...Township of Old Bridge, NJ
## 66 Hand and Stone Massage and Facial Spa3.0Wayne, NJ 07470
## 67 The Wright Fit3.6New York, NY
## 68 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 69 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 70 Massage Heights3.1Morristown, NJ 07960
## 71 StretchLab3.8Morristown, NJ 07960
## 72 Nail Kitchen llcBrooklyn, NY 11249 (Chelsea area)
## 73 NuSpecies Holistic Health CentersMount Vernon, NY 10550+1 location
## 74 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 75 Uscape RejuvenationPearl River, NY 10965
## 76 Oasis Day Spa4.0New York, NY
## 77 NuSpecies Holistic Health CentersCanarsie, NY
## 78 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 79 FaceLoveNew York, NY 10010 (Flatiron District area)
## 80 MySpa2GoNew York, NY 10012 (SoHo area)
## 81 Medical Massage GroupNew York, NY 10021 (Upper East Side area)
## 82 Massage Envy3.2Ramsey, NJ 07446
## 83 Allure Day SpaNew York, NY 10022 (Sutton Place area)
## 84 Massage Heights - Morristown3.1Morristown, NJ 07960
## 85 New York Open Center4.7New York, NY 10016 (Flatiron District area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 8 \n$35,000 a year $35000 35000 NA
## 17 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 28 \n$50,000 a year $50000 50000 NA
## 33 \n$55,000 a year $55000 55000 NA
## 35 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 39 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 8 40000 80000 43333.33 73333.33 35000
## 17 40000 80000 43333.33 73333.33 35000
## 28 40000 80000 43333.33 73333.33 35000
## 33 40000 80000 43333.33 73333.33 35000
## 35 40000 80000 43333.33 73333.33 35000
## 39 40000 80000 43333.33 73333.33 35000
## maximumMaxSalary
## 8 80000
## 17 80000
## 28 80000
## 33 80000
## 35 80000
## 39 80000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$22 - $28 an hour $22 - $28 22.0 28 24
## 2 \n$13.50 an hour $13.50 13.5 NA 24
## 3 \n$30 - $40 an hour $30 - $40 30.0 40 24
## 4 \n$15 - $35 an hour $15 - $35 15.0 35 24
## 5 \n$40 - $60 an hour $40 - $60 40.0 60 24
## 6 \n$40 - $50 an hour $40 - $50 40.0 50 24
## 9 \n$24 - $70 an hour $24 - $70 24.0 70 24
## 10 \n$30 - $45 an hour $30 - $45 30.0 45 24
## 11 \n$40 - $50 an hour $40 - $50 40.0 50 24
## 12 \n$15 - $35 an hour $15 - $35 15.0 35 24
## 13 \n$30 - $45 an hour $30 - $45 30.0 45 24
## 14 \n$13.50 an hour $13.50 13.5 NA 24
## 15 \n$60 - $65 an hour $60 - $65 60.0 65 24
## 16 \n$22 - $81 an hour $22 - $81 22.0 81 24
## 18 \n$22 - $80 an hour $22 - $80 22.0 80 24
## 19 \n$15 an hour $15 15.0 NA 24
## 20 \n$60 - $65 an hour $60 - $65 60.0 65 24
## 21 \n$30 - $40 an hour $30 - $40 30.0 40 24
## 22 \n$40 - $60 an hour $40 - $60 40.0 60 24
## 23 \n$22 - $28 an hour $22 - $28 22.0 28 24
## 24 \n$40 - $60 an hour $40 - $60 40.0 60 24
## 25 \n$15 - $35 an hour $15 - $35 15.0 35 24
## 26 \n$30 - $45 an hour $30 - $45 30.0 45 24
## 27 \n$13.50 an hour $13.50 13.5 NA 24
## 29 \n$30 - $40 an hour $30 - $40 30.0 40 24
## 30 \n$40 - $50 an hour $40 - $50 40.0 50 24
## 31 \n$22 - $28 an hour $22 - $28 22.0 28 24
## 32 \n$20 - $22 an hour ++ $20 - $22 20.0 22 24
## 34 \n$16 - $19 an hour $16 - $19 16.0 19 24
## 36 \n$20 - $35 an hour $20 - $35 20.0 35 24
## 37 \n$17 - $25 an hour $17 - $25 17.0 25 24
## 38 \n$50 - $90 an hour $50 - $90 50.0 90 24
## 40 \n$50 - $60 an hour $50 - $60 50.0 60 24
## 41 \n$45 - $50 an hour $45 - $50 45.0 50 24
## 42 \n$22 - $37 an hour $22 - $37 22.0 37 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 28.98571 47.51613 13.5 90
## 2 45 28.98571 47.51613 13.5 90
## 3 45 28.98571 47.51613 13.5 90
## 4 45 28.98571 47.51613 13.5 90
## 5 45 28.98571 47.51613 13.5 90
## 6 45 28.98571 47.51613 13.5 90
## 9 45 28.98571 47.51613 13.5 90
## 10 45 28.98571 47.51613 13.5 90
## 11 45 28.98571 47.51613 13.5 90
## 12 45 28.98571 47.51613 13.5 90
## 13 45 28.98571 47.51613 13.5 90
## 14 45 28.98571 47.51613 13.5 90
## 15 45 28.98571 47.51613 13.5 90
## 16 45 28.98571 47.51613 13.5 90
## 18 45 28.98571 47.51613 13.5 90
## 19 45 28.98571 47.51613 13.5 90
## 20 45 28.98571 47.51613 13.5 90
## 21 45 28.98571 47.51613 13.5 90
## 22 45 28.98571 47.51613 13.5 90
## 23 45 28.98571 47.51613 13.5 90
## 24 45 28.98571 47.51613 13.5 90
## 25 45 28.98571 47.51613 13.5 90
## 26 45 28.98571 47.51613 13.5 90
## 27 45 28.98571 47.51613 13.5 90
## 29 45 28.98571 47.51613 13.5 90
## 30 45 28.98571 47.51613 13.5 90
## 31 45 28.98571 47.51613 13.5 90
## 32 45 28.98571 47.51613 13.5 90
## 34 45 28.98571 47.51613 13.5 90
## 36 45 28.98571 47.51613 13.5 90
## 37 45 28.98571 47.51613 13.5 90
## 38 45 28.98571 47.51613 13.5 90
## 40 45 28.98571 47.51613 13.5 90
## 41 45 28.98571 47.51613 13.5 90
## 42 45 28.98571 47.51613 13.5 90
##
## [[7]]
## city state jobTitle
## 1 Newark NJ Massage Therapist
## 2 Newark NJ Massage Therapist
## 3 Newark NJ Massage Therapist and/or Esthetician
## 4 Newark NJ Licensed Massage Therapist, Independent Contractor
## 5 Newark NJ Licensed Massage Therapist
## 6 Newark NJ Licensed Massage Therapist
## 7 Newark NJ Massage Therapist
## 8 Newark NJ Massage Therapist - Independent Contractor
## 9 Newark NJ Massage Therapist Per Diem
## 10 Newark NJ Massage Therapist
## 11 Newark NJ Licensed Massage Therapist (LMT)
## 12 Newark NJ MASSAGE THERAPIST
## 13 Newark NJ Massage Therapist Weehawken, NJ
## 14 Newark NJ Massage Therapist (LMT)
## 15 Newark NJ Licensed Massage Therapist
## 16 Newark NJ Licensed Massage Therapist
## 17 Newark NJ Licensed Massage Therapist
## 18 Newark NJ Massage Therapist and/or Esthetician
## 19 Newark NJ Massage Therapist
## 20 Newark NJ Licensed Massage Therapist
## 21 Newark NJ Licensed Massage Therapist
## 22 Newark NJ Licensed Massage Therapist
## 23 Newark NJ Massage Therapist
## 24 Newark NJ Licensed Massage Therapist
## 25 Newark NJ Licensed Massage Therapist - West New York, NJ
## 26 Newark NJ Massage Therapist
## 27 Newark NJ Massage Therapist, Naturopathica Chelsea
## 28 Newark NJ Licensed Massage Therapist
## 29 Newark NJ Massage Therapist
## 30 Newark NJ LMT / Massage Therapist / Wellness Services Professionals
## 31 Newark NJ Licensed Massage Therapist
## 32 Newark NJ Medical Massage Therapist
## 33 Newark NJ Massage Therapist
## 34 Newark NJ Licensed Massage Therapist, Independent Contractor
## 35 Newark NJ Licensed Massage Therapist
## 36 Newark NJ Massage Therapist
## 37 Newark NJ Massage Therapist and/or Esthetician
## 38 Newark NJ Licensed Massage Therapist
## 39 Newark NJ Licensed Massage Therapist
## 40 Newark NJ Licensed Massage Therapist
## 41 Newark NJ Licensed Massage Therapist
## 42 Newark NJ Massage Therapist
## 43 Newark NJ Licensed Massage Therapist
## 44 Newark NJ Massage Therapist
## 45 Newark NJ Lead Massage Therapist
## 46 Newark NJ Flexologist (Stretch Professional)
## 47 Newark NJ Licensed Massage Therapist
## 48 Newark NJ Licensed Massage Therapist
## 49 Newark NJ LifeSpa Massage Therapist
## 50 Newark NJ Massage Therapist
## 51 Newark NJ Massage Therapist
## 52 Newark NJ Massage Therapist [Linden Signup Bonus]
## 53 Newark NJ Licensed Massage Therapist, Independent Contractor
## 54 Newark NJ Massage Therapist
## 55 Newark NJ Massage Therapist
## 56 Newark NJ Massage Therapist at Holmdel Massageenvy
## 57 Newark NJ Licensed Massage Therapist
## 58 Newark NJ Licensed Massage Therapist
## 59 Newark NJ Massage Therapist / SIGN UP BONUS
## 60 Newark NJ Licensed Massage Therapist (LMT)
## 61 Newark NJ Licensed Massage Therapist
## 62 Newark NJ Licensed Massage Therapist
## 63 Newark NJ WEEKEND/EVENINGS: Licensed Massage Therapist JC/Bayonne
## 64 Newark NJ Massage Therapist - Independent Contractor
## 65 Newark NJ Massage Therapist
## 66 Newark NJ Licensed Massage Therapist (LMT)
## 67 Newark NJ Licensed Massage Therapist
## 68 Newark NJ Stretch Technician
## 69 Newark NJ Licensed Massage Therapist
## 70 Newark NJ Licensed Massage Therapist Tier 2
## 71 Newark NJ NOW HIRING FOR JULY TRAINING! Assisted Stretch for Fitness P...
## 72 Newark NJ Licensed Massage Therapist
## 73 Newark NJ Massage Therapist - Mt. Vernon, NY
## 74 Newark NJ Massage Therapist (Luxury Health Club)
## 75 Newark NJ Licensed Massage Therapist
## 76 Newark NJ Massage Therapist
## 77 Newark NJ Massage Therapist - Brooklyn, NY
## 78 Newark NJ Licensed Massage Therapist
## 79 Newark NJ Esthetician/Massage Therapist
## 80 Newark NJ Nail techs & massage therapists for mobile spa
## 81 Newark NJ Prenatal Massage Therapist for Award Winning Practice
## 82 Newark NJ Massage Therapist - Full-Time
## 83 Newark NJ Experienced Massage Therapist
## 84 Newark NJ Licensed Massage Therapist Tier 2
## 85 Newark NJ Licensed Massage Therapist
## HiringAgency
## 1 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 2 The Woodhouse Day SpaMontclair, NJ 07042
## 3 Hand and Stone Massage and Facial Spa3.0Newark, NJ
## 4 Harmony Within Massage TherapyWestwood, NJ 07675
## 5 HealthcareAtlantic Highlands, NJ 07716
## 6 Blackbird Yoga StudioHaworth, NJ 07641
## 7 Elements Massage3.6Totowa, NJ 07512
## 8 Indo-Pak Massage TherapyEast Orange, NJ+15 locations•Remote work available
## 9 Englewood Hospital and Medical Center4.0Englewood, NJ 07631
## 10 Elements3.6Nutley, NJ 07110+3 locations
## 11 Franklin Lakes Sport & SpineFranklin Lakes, NJ 07417
## 12 THE URBAN MUSE4.3Denville, NJ 07834
## 13 Spa SocietyWeehawken, NJ 07086
## 14 Elements3.6Montclair, NJ 07042
## 15 Mosaic Salon & SpaWoodbridge, NJ 07095
## 16 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 17 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 18 Hand and Stone Massage and Facial Spa3.0Newark, NJ
## 19 Elements Massage3.6Totowa, NJ 07512
## 20 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 21 HealthcareAtlantic Highlands, NJ 07716
## 22 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 23 The Woodhouse Day SpaMontclair, NJ 07042
## 24 Hand and Stone3.0Livingston, NJ 07039+17 locations
## 25 Flamingo4.2West New York, NJ 07093
## 26 NJ Foot and Ankle CentersOradell, NJ 07649
## 27 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 28 Spavia Day Spa3.3Hanover, NJ+2 locations
## 29 Massage Envy3.2Verona, NJ 07044+29 locations
## 30 FitLoreNew York, NY 10065 (Upper East Side area)
## 31 TheraPhysical, LLCGarfield, NJ 07026
## 32 Kindness Unlimited Therapy ServicesQueens, NY
## 33 stronghands massage therapyRamsey, NJ
## 34 Harmony Within Massage TherapyWestwood, NJ 07675
## 35 Blackbird Yoga StudioHaworth, NJ 07641
## 36 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 37 Hand and Stone Massage and Facial Spa3.0Newark, NJ
## 38 Blackbird Yoga StudioHaworth, NJ 07641
## 39 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 40 HealthcareAtlantic Highlands, NJ 07716
## 41 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 42 The Woodhouse Day SpaMontclair, NJ 07042
## 43 Hand and Stone North BrunswickPiscataway, NJ 08854
## 44 Life Time3.6Berkeley Heights, NJ 07922+1 location
## 45 Hand and Stone3.0Kearny, NJ 07032+2 locations
## 46 StretchLab3.8Morristown, NJ 07960
## 47 Siskin Family ChiropracticTownship of Green Brook, NJ 08812
## 48 The Spa At Little RiverSouth River, NJ 08882
## 49 Life Time3.6Florham Park, NJ 07932
## 50 Island Spa & SaunaEdison, NJ 08817
## 51 Hand and Stone3.0Woodbridge, NJ 07095+1 location
## 52 Massage Envy3.2Linden, NJ 07036+1 location
## 53 Harmony Within Massage TherapyWestwood, NJ 07675
## 54 Elements Massage3.6Totowa, NJ 07512
## 55 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 56 Massage Envy3.2Holmdel, NJ 07733•Remote work available
## 57 Massage Heights3.1Morristown, NJ 07960
## 58 Massage Heights - Morristown3.1Morristown, NJ 07960
## 59 Massage Envy3.2Bayonne, NJ 07002
## 60 Pure Massage/Spa 23 Fitness & LifestylePompton Plains, NJ
## 61 Morris Plains Massage EnvyMorris Plains, NJ 07950
## 62 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 63 Hand and Stone3.0Bayonne, NJ 07002
## 64 Massage by ElizabethMarlboro, NJ 07751
## 65 Hand & Stone - Toms River, Manalapan, Howell, Bayo...Township of Old Bridge, NJ
## 66 Hand and Stone Massage and Facial Spa3.0Wayne, NJ 07470
## 67 The Wright Fit3.6New York, NY
## 68 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 69 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 70 Massage Heights3.1Morristown, NJ 07960
## 71 StretchLab3.8Morristown, NJ 07960
## 72 Nail Kitchen llcBrooklyn, NY 11249 (Chelsea area)
## 73 NuSpecies Holistic Health CentersMount Vernon, NY 10550+1 location
## 74 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 75 Uscape RejuvenationPearl River, NY 10965
## 76 Oasis Day Spa4.0New York, NY
## 77 NuSpecies Holistic Health CentersCanarsie, NY
## 78 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 79 FaceLoveNew York, NY 10010 (Flatiron District area)
## 80 MySpa2GoNew York, NY 10012 (SoHo area)
## 81 Medical Massage GroupNew York, NY 10021 (Upper East Side area)
## 82 Massage Envy3.2Ramsey, NJ 07446
## 83 Allure Day SpaNew York, NY 10022 (Sutton Place area)
## 84 Massage Heights - Morristown3.1Morristown, NJ 07960
## 85 New York Open Center4.7New York, NY 10016 (Flatiron District area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 13.5 90 35000 80000
## 2 4 13.5 90 35000 80000
## 3 20 13.5 90 35000 80000
## 4 30 13.5 90 35000 80000
## 5 30 13.5 90 35000 80000
## 6 1 13.5 90 35000 80000
## 7 5 13.5 90 35000 80000
## 8 5 13.5 90 35000 80000
## 9 30 13.5 90 35000 80000
## 10 30 13.5 90 35000 80000
## 11 6 13.5 90 35000 80000
## 12 13 13.5 90 35000 80000
## 13 17 13.5 90 35000 80000
## 14 30 13.5 90 35000 80000
## 15 2 13.5 90 35000 80000
## 16 30 13.5 90 35000 80000
## 17 7 13.5 90 35000 80000
## 18 20 13.5 90 35000 80000
## 19 5 13.5 90 35000 80000
## 20 7 13.5 90 35000 80000
## 21 30 13.5 90 35000 80000
## 22 30 13.5 90 35000 80000
## 23 4 13.5 90 35000 80000
## 24 30 13.5 90 35000 80000
## 25 30 13.5 90 35000 80000
## 26 18 13.5 90 35000 80000
## 27 Today 13.5 90 35000 80000
## 28 30 13.5 90 35000 80000
## 29 30 13.5 90 35000 80000
## 30 1 13.5 90 35000 80000
## 31 20 13.5 90 35000 80000
## 32 9 13.5 90 35000 80000
## 33 11 13.5 90 35000 80000
## 34 30 13.5 90 35000 80000
## 35 1 13.5 90 35000 80000
## 36 30 13.5 90 35000 80000
## 37 20 13.5 90 35000 80000
## 38 1 13.5 90 35000 80000
## 39 7 13.5 90 35000 80000
## 40 30 13.5 90 35000 80000
## 41 30 13.5 90 35000 80000
## 42 4 13.5 90 35000 80000
## 43 6 13.5 90 35000 80000
## 44 30 13.5 90 35000 80000
## 45 30 13.5 90 35000 80000
## 46 7 13.5 90 35000 80000
## 47 14 13.5 90 35000 80000
## 48 4 13.5 90 35000 80000
## 49 30 13.5 90 35000 80000
## 50 30 13.5 90 35000 80000
## 51 30 13.5 90 35000 80000
## 52 30 13.5 90 35000 80000
## 53 30 13.5 90 35000 80000
## 54 5 13.5 90 35000 80000
## 55 30 13.5 90 35000 80000
## 56 30 13.5 90 35000 80000
## 57 18 13.5 90 35000 80000
## 58 17 13.5 90 35000 80000
## 59 30 13.5 90 35000 80000
## 60 25 13.5 90 35000 80000
## 61 7 13.5 90 35000 80000
## 62 8 13.5 90 35000 80000
## 63 30 13.5 90 35000 80000
## 64 13 13.5 90 35000 80000
## 65 21 13.5 90 35000 80000
## 66 17 13.5 90 35000 80000
## 67 30 13.5 90 35000 80000
## 68 6 13.5 90 35000 80000
## 69 30 13.5 90 35000 80000
## 70 12 13.5 90 35000 80000
## 71 7 13.5 90 35000 80000
## 72 30 13.5 90 35000 80000
## 73 30 13.5 90 35000 80000
## 74 30 13.5 90 35000 80000
## 75 26 13.5 90 35000 80000
## 76 30 13.5 90 35000 80000
## 77 30 13.5 90 35000 80000
## 78 8 13.5 90 35000 80000
## 79 30 13.5 90 35000 80000
## 80 13 13.5 90 35000 80000
## 81 30 13.5 90 35000 80000
## 82 7 13.5 90 35000 80000
## 83 6 13.5 90 35000 80000
## 84 11 13.5 90 35000 80000
## 85 30 13.5 90 35000 80000
getIndeedJobData5pages('massage therapist', 'Jersey City','NJ')
## Warning in getIndeedJobData5pages("massage therapist", "Jersey City", "NJ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Jersey City", "NJ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Jersey City", "NJ"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist, Independent Contractor
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist
## 10 Massage Therapist Weehawken, NJ
## 11 Massage Therapist Per Diem
## 12 Licensed Massage Therapist (LMT)
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist - West New York, NJ
## 15 MASSAGE THERAPIST
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist
## 27 Massage Therapist
## 28 Medical Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Massage Therapist Licensed in NJ
## 32 Massage Therapist (LMT)
## 33 FULL TIME: Licensed Massage Therapist JC/Bayonne NJ
## 34 Part Time Licensed Massage Therapist
## 35 Licensed Massage Therapist, Independent Contractor
## 36 Massage Therapist
## 37 Massage Therapist
## 38 Licensed Massage Therapist
## 39 LifeSpa Massage Therapist
## 40 NJ Licensed Massage Therapist (Hourly plus Commission)
## 41 WEEKEND/EVENINGS: Licensed Massage Therapist JC/Bayonne
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Flexologist (Stretch Professional)
## 45 Massage Therapist
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist (LMT): PAID TRAINING
## 48 Licensed Massage Therapist (LMT)
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist (LMT)
## 52 MASSAGE THERAPIST
## 53 Licensed Massage Therapist
## 54 NJ Licensed Massage Therapist (Hourly plus Commission)
## 55 Part-Time Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist (Luxury Health Club)
## 60 Massage Therapist [Linden Signup Bonus]
## 61 Massage Therapist at Holmdel Massageenvy
## 62 Nail techs & massage therapists for mobile spa
## 63 Licensed Massage Therapist (LMT): PAID TRAINING
## 64 Prenatal Massage Therapist for Award Winning Practice
## 65 Experienced Massage Therapist
## 66 Massage Therapist
## 67 Licensed Massage Therapist (LMT)
## 68 MASSAGE THERAPIST
## 69 Licensed Massage Therapist
## 70 Licensed Massage Therapist Full & Part Time
## 71 Stretch Technician
## 72 Licensed Massage Therapist
## 73 Part-Time Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Massage Therapist
## 76 Massage Therapist (Luxury Health Club)
## 77 Massage Therapist [Linden Signup Bonus]
## 78 Licensed Massage Therapist, Independent Contractor
## 79 Massage Therapist
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist
## 82 Massage Therapist
## 83 Licensed Massage Therapist
## 84 Licensed Massage Therapist
## 85 Licensed Massage Therapist
## 86 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $28 an hour $22 - $28 22.0 28
## 2 \n$15 - $35 an hour $15 - $35 15.0 35
## 3 \n$40 - $50 an hour $40 - $50 40.0 50
## 4 \n$30 - $40 an hour $30 - $40 30.0 40
## 5 \n$13.50 an hour $13.50 13.5 NA
## 6 \n$40 - $60 an hour $40 - $60 40.0 60
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 8 \n$24 - $70 an hour $24 - $70 24.0 70
## 9 \n$60 - $65 an hour $60 - $65 60.0 65
## 10 \n$19 - $20 an hour $19 - $20 19.0 20
## 11 \n$30 - $45 an hour $30 - $45 30.0 45
## 12 \n$40 - $50 an hour $40 - $50 40.0 50
## 13 \n$40 - $60 an hour $40 - $60 40.0 60
## 14 \n$15 - $35 an hour $15 - $35 15.0 35
## 15 \n$30 - $45 an hour $30 - $45 30.0 45
## 16 \n$15 an hour $15 15.0 NA
## 17 \n$60 - $65 an hour $60 - $65 60.0 65
## 18 \n$25 - $40 an hour $25 - $40 25.0 40
## 19 \n$37,000 - $52,671 a year $37000 - $52671 37000.0 52671
## 20 \nUp to $50,000 a year $50000 50000.0 NA
## 21 \n$30 - $40 an hour $30 - $40 30.0 40
## 22 \n$13.50 an hour $13.50 13.5 NA
## 23 \n$22 - $28 an hour $22 - $28 22.0 28
## 24 \n$50,000 a year $50000 50000.0 NA
## 25 \n$40,000 - $48,000 a year $40000 - $48000 40000.0 48000
## 26 \n$40,000 - $80,000 a year $40000 - $80000 40000.0 80000
## 27 \n$40 - $80 an hour $40 - $80 40.0 80
## 28 \n$32,000 - $100,000 a year $32000 - $100000 32000.0 100000
## 29 \n$17 - $20 an hour $17 - $20 17.0 20
## 30 \n$40,000 - $48,000 a year $40000 - $48000 40000.0 48000
## 31 \n$19 - $25 an hour $19 - $25 19.0 25
## 32 \n$40,000 - $80,000 a year $40000 - $80000 40000.0 80000
## 33 \n$50 - $60 an hour $50 - $60 50.0 60
## 34 \n$40 - $80 an hour $40 - $80 40.0 80
## 35 \n$45 - $50 an hour $45 - $50 45.0 50
## 36 \n$55,000 a year $55000 55000.0 NA
## 37 \n$16 - $19 an hour $16 - $19 16.0 19
## 38 \n$19 - $25 an hour $19 - $25 19.0 25
## 39 \n$30 - $40 an hour $30 - $40 30.0 40
## 40 \n$13.50 an hour $13.50 13.5 NA
## 41 \n$30 - $45 an hour $30 - $45 30.0 45
## 42 \n$40 - $50 an hour $40 - $50 40.0 50
## 43 \n$40 - $60 an hour $40 - $60 40.0 60
## 44 \n$15 - $35 an hour $15 - $35 15.0 35
## 45 \n$22 - $28 an hour $22 - $28 22.0 28
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 40 8667.122 9784.151 13.5
## 2 30 40 8667.122 9784.151 13.5
## 3 30 40 8667.122 9784.151 13.5
## 4 30 40 8667.122 9784.151 13.5
## 5 30 40 8667.122 9784.151 13.5
## 6 30 40 8667.122 9784.151 13.5
## 7 30 40 8667.122 9784.151 13.5
## 8 30 40 8667.122 9784.151 13.5
## 9 30 40 8667.122 9784.151 13.5
## 10 30 40 8667.122 9784.151 13.5
## 11 30 40 8667.122 9784.151 13.5
## 12 30 40 8667.122 9784.151 13.5
## 13 30 40 8667.122 9784.151 13.5
## 14 30 40 8667.122 9784.151 13.5
## 15 30 40 8667.122 9784.151 13.5
## 16 30 40 8667.122 9784.151 13.5
## 17 30 40 8667.122 9784.151 13.5
## 18 30 40 8667.122 9784.151 13.5
## 19 30 40 8667.122 9784.151 13.5
## 20 30 40 8667.122 9784.151 13.5
## 21 30 40 8667.122 9784.151 13.5
## 22 30 40 8667.122 9784.151 13.5
## 23 30 40 8667.122 9784.151 13.5
## 24 30 40 8667.122 9784.151 13.5
## 25 30 40 8667.122 9784.151 13.5
## 26 30 40 8667.122 9784.151 13.5
## 27 30 40 8667.122 9784.151 13.5
## 28 30 40 8667.122 9784.151 13.5
## 29 30 40 8667.122 9784.151 13.5
## 30 30 40 8667.122 9784.151 13.5
## 31 30 40 8667.122 9784.151 13.5
## 32 30 40 8667.122 9784.151 13.5
## 33 30 40 8667.122 9784.151 13.5
## 34 30 40 8667.122 9784.151 13.5
## 35 30 40 8667.122 9784.151 13.5
## 36 30 40 8667.122 9784.151 13.5
## 37 30 40 8667.122 9784.151 13.5
## 38 30 40 8667.122 9784.151 13.5
## 39 30 40 8667.122 9784.151 13.5
## 40 30 40 8667.122 9784.151 13.5
## 41 30 40 8667.122 9784.151 13.5
## 42 30 40 8667.122 9784.151 13.5
## 43 30 40 8667.122 9784.151 13.5
## 44 30 40 8667.122 9784.151 13.5
## 45 30 40 8667.122 9784.151 13.5
## maximumMaxSalary
## 1 1e+05
## 2 1e+05
## 3 1e+05
## 4 1e+05
## 5 1e+05
## 6 1e+05
## 7 1e+05
## 8 1e+05
## 9 1e+05
## 10 1e+05
## 11 1e+05
## 12 1e+05
## 13 1e+05
## 14 1e+05
## 15 1e+05
## 16 1e+05
## 17 1e+05
## 18 1e+05
## 19 1e+05
## 20 1e+05
## 21 1e+05
## 22 1e+05
## 23 1e+05
## 24 1e+05
## 25 1e+05
## 26 1e+05
## 27 1e+05
## 28 1e+05
## 29 1e+05
## 30 1e+05
## 31 1e+05
## 32 1e+05
## 33 1e+05
## 34 1e+05
## 35 1e+05
## 36 1e+05
## 37 1e+05
## 38 1e+05
## 39 1e+05
## 40 1e+05
## 41 1e+05
## 42 1e+05
## 43 1e+05
## 44 1e+05
## 45 1e+05
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 5
## 4 30
## 5 30
## 6 4
## 7 1
## 8 5
## 9 15
## 10 17
## 11 30
## 12 6
## 13 11
## 14 30
## 15 13
## 16 17
## 17 30
## 18 7
## 19 5
## 20 1
## 21 7
## 22 30
## 23 30
## 24 30
## 25 5
## 26 30
## 27 18
## 28 9
## 29 6
## 30 26
## 31 14
## 32 30
## 33 30
## 34 30
## 35 30
## 36 4
## 37 30
## 38 6
## 39 30
## 40 20
## 41 30
## 42 Today
## 43 8
## 44 7
## 45 30
## 46 14
## 47 20
## 48 5
## 49 30
## 50 30
## 51 1
## 52 30
## 53 30
## 54 20
## 55 30
## 56 4
## 57 30
## 58 8
## 59 30
## 60 30
## 61 30
## 62 13
## 63 20
## 64 30
## 65 6
## 66 30
## 67 25
## 68 30
## 69 14
## 70 30
## 71 6
## 72 30
## 73 30
## 74 4
## 75 30
## 76 30
## 77 30
## 78 30
## 79 4
## 80 30
## 81 30
## 82 5
## 83 1
## 84 7
## 85 30
## 86 30
##
## [[4]]
## HiringAgency
## 1 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 2 HealthcareAtlantic Highlands, NJ 07716
## 3 Elements Massage3.6Totowa, NJ 07512
## 4 Harmony Within Massage TherapyWestwood, NJ 07675
## 5 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 6 The Woodhouse Day SpaMontclair, NJ 07042
## 7 Blackbird Yoga StudioHaworth, NJ 07641
## 8 Indo-Pak Massage TherapyHoboken, NJ+16 locations•Remote work available
## 9 Jersey Premier Pain3.3Jersey City, NJ 07306 (Journal Square area)
## 10 Spa SocietyWeehawken, NJ 07086
## 11 Englewood Hospital and Medical Center4.0Englewood, NJ 07631
## 12 Franklin Lakes Sport & SpineFranklin Lakes, NJ 07417
## 13 The Center for joint and spine reliefJersey City, NJ 07302 (Downtown area)
## 14 Flamingo4.2West New York, NJ 07093
## 15 THE URBAN MUSE4.3Denville, NJ 07834
## 16 The Wellness Center of PowerhouseGarfield, NJ 07606
## 17 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 18 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 19 Elements Massage3.6Totowa, NJ 07512
## 20 Blackbird Yoga StudioHaworth, NJ 07641
## 21 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 22 HealthcareAtlantic Highlands, NJ 07716
## 23 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 24 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 25 Personal Care ProfessionalsEdgewater, NJ 07020
## 26 Massage Envy3.2Jersey City, NJ 07302 (The Waterfront area)+33 locations
## 27 NJ Foot and Ankle CentersOradell, NJ 07649
## 28 Kindness Unlimited Therapy ServicesQueens, NY
## 29 Spavia Day Spa - Clark CommonsClark, NJ 07066
## 30 ANSH ChiropracticMetuchen, NJ 08840
## 31 Massage Envy3.2Bayonne, NJ 07002
## 32 Elements3.6Montclair, NJ 07042
## 33 Hand and Stone3.0Bayonne, NJ 07002
## 34 Hand and Stone3.0Bayonne, NJ 07002+18 locations
## 35 Harmony Within Massage TherapyWestwood, NJ 07675
## 36 The Woodhouse Day SpaMontclair, NJ 07042
## 37 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 38 Hand and Stone North BrunswickPiscataway, NJ 08854
## 39 Life Time3.6Florham Park, NJ 07932+1 location
## 40 Everlasting Haven Spa & Wellness StudioWestfield, NJ 07090
## 41 Hand and Stone3.0Bayonne, NJ 07002
## 42 Hand & Stone - HolmdelHolmdel, NJ 07733
## 43 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 44 StretchLab3.8Morristown, NJ 07960
## 45 Island Spa & SaunaEdison, NJ 08817
## 46 Siskin Family ChiropracticTownship of Green Brook, NJ 08812
## 47 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 48 Garwood Massage EnvyGarwood, NJ 07027
## 49 The Wright Fit3.6New York, NY
## 50 Life Time3.6Berkeley Heights, NJ 07922+2 locations
## 51 Massage Envy - Fair Lawn NJFair Lawn, NJ 07410
## 52 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 53 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 54 Everlasting Haven Spa & Wellness StudioWestfield, NJ 07090
## 55 Massage Envy3.2Hoboken, NJ 07030
## 56 Massage Envy WarrenTownship of Warren, NJ 07059
## 57 WTS International3.3New York, NY 10013 (SoHo area)
## 58 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 59 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 60 Massage Envy3.2Linden, NJ 07036+1 location
## 61 Massage Envy3.2Holmdel, NJ 07733•Remote work available
## 62 MySpa2GoNew York, NY 10012 (SoHo area)
## 63 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 64 Medical Massage GroupNew York, NY 10021 (Upper East Side area)
## 65 Allure Day SpaNew York, NY 10022 (Sutton Place area)
## 66 Oasis Day Spa4.0New York, NY
## 67 Pure Massage/Spa 23 Fitness & LifestylePompton Plains, NJ
## 68 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 69 Massage Envy East RutherfordEast Rutherford, NJ 07073
## 70 Massage Envy3.2Hoboken, NJ 07030
## 71 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 72 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 73 Massage Envy3.2Hoboken, NJ 07030
## 74 Massage Envy WarrenTownship of Warren, NJ 07059
## 75 WTS International3.3New York, NY 10013 (SoHo area)
## 76 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 77 Massage Envy3.2Linden, NJ 07036+1 location
## 78 Harmony Within Massage TherapyWestwood, NJ 07675
## 79 The Woodhouse Day SpaMontclair, NJ 07042
## 80 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 81 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 82 Elements Massage3.6Totowa, NJ 07512
## 83 Blackbird Yoga StudioHaworth, NJ 07641
## 84 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 85 HealthcareAtlantic Highlands, NJ 07716
## 86 Hand and Stone Bayonne3.0Bayonne, NJ 07002
##
## [[5]]
## Salary salary minSalary maxSalary
## 19 \n$37,000 - $52,671 a year $37000 - $52671 37000 52671
## 20 \nUp to $50,000 a year $50000 50000 NA
## 24 \n$50,000 a year $50000 50000 NA
## 25 \n$40,000 - $48,000 a year $40000 - $48000 40000 48000
## 26 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 28 \n$32,000 - $100,000 a year $32000 - $100000 32000 100000
## 30 \n$40,000 - $48,000 a year $40000 - $48000 40000 48000
## 32 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 36 \n$55,000 a year $55000 55000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 19 40000 66335.5 42666.67 68111.83 32000
## 20 40000 66335.5 42666.67 68111.83 32000
## 24 40000 66335.5 42666.67 68111.83 32000
## 25 40000 66335.5 42666.67 68111.83 32000
## 26 40000 66335.5 42666.67 68111.83 32000
## 28 40000 66335.5 42666.67 68111.83 32000
## 30 40000 66335.5 42666.67 68111.83 32000
## 32 40000 66335.5 42666.67 68111.83 32000
## 36 40000 66335.5 42666.67 68111.83 32000
## maximumMaxSalary
## 19 1e+05
## 20 1e+05
## 24 1e+05
## 25 1e+05
## 26 1e+05
## 28 1e+05
## 30 1e+05
## 32 1e+05
## 36 1e+05
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$22 - $28 an hour $22 - $28 22.0 28 30
## 2 \n$15 - $35 an hour $15 - $35 15.0 35 30
## 3 \n$40 - $50 an hour $40 - $50 40.0 50 30
## 4 \n$30 - $40 an hour $30 - $40 30.0 40 30
## 5 \n$13.50 an hour $13.50 13.5 NA 30
## 6 \n$40 - $60 an hour $40 - $60 40.0 60 30
## 8 \n$24 - $70 an hour $24 - $70 24.0 70 30
## 9 \n$60 - $65 an hour $60 - $65 60.0 65 30
## 10 \n$19 - $20 an hour $19 - $20 19.0 20 30
## 11 \n$30 - $45 an hour $30 - $45 30.0 45 30
## 12 \n$40 - $50 an hour $40 - $50 40.0 50 30
## 13 \n$40 - $60 an hour $40 - $60 40.0 60 30
## 14 \n$15 - $35 an hour $15 - $35 15.0 35 30
## 15 \n$30 - $45 an hour $30 - $45 30.0 45 30
## 16 \n$15 an hour $15 15.0 NA 30
## 17 \n$60 - $65 an hour $60 - $65 60.0 65 30
## 18 \n$25 - $40 an hour $25 - $40 25.0 40 30
## 21 \n$30 - $40 an hour $30 - $40 30.0 40 30
## 22 \n$13.50 an hour $13.50 13.5 NA 30
## 23 \n$22 - $28 an hour $22 - $28 22.0 28 30
## 27 \n$40 - $80 an hour $40 - $80 40.0 80 30
## 29 \n$17 - $20 an hour $17 - $20 17.0 20 30
## 31 \n$19 - $25 an hour $19 - $25 19.0 25 30
## 33 \n$50 - $60 an hour $50 - $60 50.0 60 30
## 34 \n$40 - $80 an hour $40 - $80 40.0 80 30
## 35 \n$45 - $50 an hour $45 - $50 45.0 50 30
## 37 \n$16 - $19 an hour $16 - $19 16.0 19 30
## 38 \n$19 - $25 an hour $19 - $25 19.0 25 30
## 39 \n$30 - $40 an hour $30 - $40 30.0 40 30
## 40 \n$13.50 an hour $13.50 13.5 NA 30
## 41 \n$30 - $45 an hour $30 - $45 30.0 45 30
## 42 \n$40 - $50 an hour $40 - $50 40.0 50 30
## 43 \n$40 - $60 an hour $40 - $60 40.0 60 30
## 44 \n$15 - $35 an hour $15 - $35 15.0 35 30
## 45 \n$22 - $28 an hour $22 - $28 22.0 28 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 29.15714 44.93548 13.5 80
## 2 45 29.15714 44.93548 13.5 80
## 3 45 29.15714 44.93548 13.5 80
## 4 45 29.15714 44.93548 13.5 80
## 5 45 29.15714 44.93548 13.5 80
## 6 45 29.15714 44.93548 13.5 80
## 8 45 29.15714 44.93548 13.5 80
## 9 45 29.15714 44.93548 13.5 80
## 10 45 29.15714 44.93548 13.5 80
## 11 45 29.15714 44.93548 13.5 80
## 12 45 29.15714 44.93548 13.5 80
## 13 45 29.15714 44.93548 13.5 80
## 14 45 29.15714 44.93548 13.5 80
## 15 45 29.15714 44.93548 13.5 80
## 16 45 29.15714 44.93548 13.5 80
## 17 45 29.15714 44.93548 13.5 80
## 18 45 29.15714 44.93548 13.5 80
## 21 45 29.15714 44.93548 13.5 80
## 22 45 29.15714 44.93548 13.5 80
## 23 45 29.15714 44.93548 13.5 80
## 27 45 29.15714 44.93548 13.5 80
## 29 45 29.15714 44.93548 13.5 80
## 31 45 29.15714 44.93548 13.5 80
## 33 45 29.15714 44.93548 13.5 80
## 34 45 29.15714 44.93548 13.5 80
## 35 45 29.15714 44.93548 13.5 80
## 37 45 29.15714 44.93548 13.5 80
## 38 45 29.15714 44.93548 13.5 80
## 39 45 29.15714 44.93548 13.5 80
## 40 45 29.15714 44.93548 13.5 80
## 41 45 29.15714 44.93548 13.5 80
## 42 45 29.15714 44.93548 13.5 80
## 43 45 29.15714 44.93548 13.5 80
## 44 45 29.15714 44.93548 13.5 80
## 45 45 29.15714 44.93548 13.5 80
##
## [[7]]
## city state jobTitle
## 1 Jersey City NJ Massage Therapist
## 2 Jersey City NJ Licensed Massage Therapist
## 3 Jersey City NJ Massage Therapist
## 4 Jersey City NJ Licensed Massage Therapist, Independent Contractor
## 5 Jersey City NJ Licensed Massage Therapist
## 6 Jersey City NJ Massage Therapist
## 7 Jersey City NJ Licensed Massage Therapist
## 8 Jersey City NJ Massage Therapist - Independent Contractor
## 9 Jersey City NJ Licensed Massage Therapist
## 10 Jersey City NJ Massage Therapist Weehawken, NJ
## 11 Jersey City NJ Massage Therapist Per Diem
## 12 Jersey City NJ Licensed Massage Therapist (LMT)
## 13 Jersey City NJ Licensed Massage Therapist
## 14 Jersey City NJ Licensed Massage Therapist - West New York, NJ
## 15 Jersey City NJ MASSAGE THERAPIST
## 16 Jersey City NJ Licensed Massage Therapist
## 17 Jersey City NJ Licensed Massage Therapist
## 18 Jersey City NJ Licensed Massage Therapist
## 19 Jersey City NJ Massage Therapist
## 20 Jersey City NJ Licensed Massage Therapist
## 21 Jersey City NJ Licensed Massage Therapist
## 22 Jersey City NJ Licensed Massage Therapist
## 23 Jersey City NJ Licensed Massage Therapist
## 24 Jersey City NJ Licensed Massage Therapist
## 25 Jersey City NJ Licensed Massage Therapist
## 26 Jersey City NJ Massage Therapist
## 27 Jersey City NJ Massage Therapist
## 28 Jersey City NJ Medical Massage Therapist
## 29 Jersey City NJ Licensed Massage Therapist
## 30 Jersey City NJ Licensed Massage Therapist
## 31 Jersey City NJ Massage Therapist Licensed in NJ
## 32 Jersey City NJ Massage Therapist (LMT)
## 33 Jersey City NJ FULL TIME: Licensed Massage Therapist JC/Bayonne NJ
## 34 Jersey City NJ Part Time Licensed Massage Therapist
## 35 Jersey City NJ Licensed Massage Therapist, Independent Contractor
## 36 Jersey City NJ Massage Therapist
## 37 Jersey City NJ Massage Therapist
## 38 Jersey City NJ Licensed Massage Therapist
## 39 Jersey City NJ LifeSpa Massage Therapist
## 40 Jersey City NJ NJ Licensed Massage Therapist (Hourly plus Commission)
## 41 Jersey City NJ WEEKEND/EVENINGS: Licensed Massage Therapist JC/Bayonne
## 42 Jersey City NJ Licensed Massage Therapist
## 43 Jersey City NJ Licensed Massage Therapist
## 44 Jersey City NJ Flexologist (Stretch Professional)
## 45 Jersey City NJ Massage Therapist
## 46 Jersey City NJ Licensed Massage Therapist
## 47 Jersey City NJ Licensed Massage Therapist (LMT): PAID TRAINING
## 48 Jersey City NJ Licensed Massage Therapist (LMT)
## 49 Jersey City NJ Licensed Massage Therapist
## 50 Jersey City NJ Massage Therapist
## 51 Jersey City NJ Licensed Massage Therapist (LMT)
## 52 Jersey City NJ MASSAGE THERAPIST
## 53 Jersey City NJ Licensed Massage Therapist
## 54 Jersey City NJ NJ Licensed Massage Therapist (Hourly plus Commission)
## 55 Jersey City NJ Part-Time Licensed Massage Therapist
## 56 Jersey City NJ Licensed Massage Therapist
## 57 Jersey City NJ Massage Therapist
## 58 Jersey City NJ Licensed Massage Therapist
## 59 Jersey City NJ Massage Therapist (Luxury Health Club)
## 60 Jersey City NJ Massage Therapist [Linden Signup Bonus]
## 61 Jersey City NJ Massage Therapist at Holmdel Massageenvy
## 62 Jersey City NJ Nail techs & massage therapists for mobile spa
## 63 Jersey City NJ Licensed Massage Therapist (LMT): PAID TRAINING
## 64 Jersey City NJ Prenatal Massage Therapist for Award Winning Practice
## 65 Jersey City NJ Experienced Massage Therapist
## 66 Jersey City NJ Massage Therapist
## 67 Jersey City NJ Licensed Massage Therapist (LMT)
## 68 Jersey City NJ MASSAGE THERAPIST
## 69 Jersey City NJ Licensed Massage Therapist
## 70 Jersey City NJ Licensed Massage Therapist Full & Part Time
## 71 Jersey City NJ Stretch Technician
## 72 Jersey City NJ Licensed Massage Therapist
## 73 Jersey City NJ Part-Time Licensed Massage Therapist
## 74 Jersey City NJ Licensed Massage Therapist
## 75 Jersey City NJ Massage Therapist
## 76 Jersey City NJ Massage Therapist (Luxury Health Club)
## 77 Jersey City NJ Massage Therapist [Linden Signup Bonus]
## 78 Jersey City NJ Licensed Massage Therapist, Independent Contractor
## 79 Jersey City NJ Massage Therapist
## 80 Jersey City NJ Licensed Massage Therapist
## 81 Jersey City NJ Licensed Massage Therapist
## 82 Jersey City NJ Massage Therapist
## 83 Jersey City NJ Licensed Massage Therapist
## 84 Jersey City NJ Licensed Massage Therapist
## 85 Jersey City NJ Licensed Massage Therapist
## 86 Jersey City NJ Massage Therapist
## HiringAgency
## 1 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 2 HealthcareAtlantic Highlands, NJ 07716
## 3 Elements Massage3.6Totowa, NJ 07512
## 4 Harmony Within Massage TherapyWestwood, NJ 07675
## 5 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 6 The Woodhouse Day SpaMontclair, NJ 07042
## 7 Blackbird Yoga StudioHaworth, NJ 07641
## 8 Indo-Pak Massage TherapyHoboken, NJ+16 locations•Remote work available
## 9 Jersey Premier Pain3.3Jersey City, NJ 07306 (Journal Square area)
## 10 Spa SocietyWeehawken, NJ 07086
## 11 Englewood Hospital and Medical Center4.0Englewood, NJ 07631
## 12 Franklin Lakes Sport & SpineFranklin Lakes, NJ 07417
## 13 The Center for joint and spine reliefJersey City, NJ 07302 (Downtown area)
## 14 Flamingo4.2West New York, NJ 07093
## 15 THE URBAN MUSE4.3Denville, NJ 07834
## 16 The Wellness Center of PowerhouseGarfield, NJ 07606
## 17 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 18 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 19 Elements Massage3.6Totowa, NJ 07512
## 20 Blackbird Yoga StudioHaworth, NJ 07641
## 21 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 22 HealthcareAtlantic Highlands, NJ 07716
## 23 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 24 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 25 Personal Care ProfessionalsEdgewater, NJ 07020
## 26 Massage Envy3.2Jersey City, NJ 07302 (The Waterfront area)+33 locations
## 27 NJ Foot and Ankle CentersOradell, NJ 07649
## 28 Kindness Unlimited Therapy ServicesQueens, NY
## 29 Spavia Day Spa - Clark CommonsClark, NJ 07066
## 30 ANSH ChiropracticMetuchen, NJ 08840
## 31 Massage Envy3.2Bayonne, NJ 07002
## 32 Elements3.6Montclair, NJ 07042
## 33 Hand and Stone3.0Bayonne, NJ 07002
## 34 Hand and Stone3.0Bayonne, NJ 07002+18 locations
## 35 Harmony Within Massage TherapyWestwood, NJ 07675
## 36 The Woodhouse Day SpaMontclair, NJ 07042
## 37 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 38 Hand and Stone North BrunswickPiscataway, NJ 08854
## 39 Life Time3.6Florham Park, NJ 07932+1 location
## 40 Everlasting Haven Spa & Wellness StudioWestfield, NJ 07090
## 41 Hand and Stone3.0Bayonne, NJ 07002
## 42 Hand & Stone - HolmdelHolmdel, NJ 07733
## 43 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 44 StretchLab3.8Morristown, NJ 07960
## 45 Island Spa & SaunaEdison, NJ 08817
## 46 Siskin Family ChiropracticTownship of Green Brook, NJ 08812
## 47 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 48 Garwood Massage EnvyGarwood, NJ 07027
## 49 The Wright Fit3.6New York, NY
## 50 Life Time3.6Berkeley Heights, NJ 07922+2 locations
## 51 Massage Envy - Fair Lawn NJFair Lawn, NJ 07410
## 52 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 53 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 54 Everlasting Haven Spa & Wellness StudioWestfield, NJ 07090
## 55 Massage Envy3.2Hoboken, NJ 07030
## 56 Massage Envy WarrenTownship of Warren, NJ 07059
## 57 WTS International3.3New York, NY 10013 (SoHo area)
## 58 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 59 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 60 Massage Envy3.2Linden, NJ 07036+1 location
## 61 Massage Envy3.2Holmdel, NJ 07733•Remote work available
## 62 MySpa2GoNew York, NY 10012 (SoHo area)
## 63 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 64 Medical Massage GroupNew York, NY 10021 (Upper East Side area)
## 65 Allure Day SpaNew York, NY 10022 (Sutton Place area)
## 66 Oasis Day Spa4.0New York, NY
## 67 Pure Massage/Spa 23 Fitness & LifestylePompton Plains, NJ
## 68 CGI HOLISTIC FITNESS & SPA4.5Closter, NJ 07624
## 69 Massage Envy East RutherfordEast Rutherford, NJ 07073
## 70 Massage Envy3.2Hoboken, NJ 07030
## 71 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 72 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 73 Massage Envy3.2Hoboken, NJ 07030
## 74 Massage Envy WarrenTownship of Warren, NJ 07059
## 75 WTS International3.3New York, NY 10013 (SoHo area)
## 76 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 77 Massage Envy3.2Linden, NJ 07036+1 location
## 78 Harmony Within Massage TherapyWestwood, NJ 07675
## 79 The Woodhouse Day SpaMontclair, NJ 07042
## 80 Massage Envy - Woodbridge3.2Woodbridge, NJ 07095
## 81 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 82 Elements Massage3.6Totowa, NJ 07512
## 83 Blackbird Yoga StudioHaworth, NJ 07641
## 84 Hand and Stone Massage and Facial Spa Aberdeen, NJAberdeen, NJ
## 85 HealthcareAtlantic Highlands, NJ 07716
## 86 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 13.5 80 32000 1e+05
## 2 30 13.5 80 32000 1e+05
## 3 5 13.5 80 32000 1e+05
## 4 30 13.5 80 32000 1e+05
## 5 30 13.5 80 32000 1e+05
## 6 4 13.5 80 32000 1e+05
## 7 1 13.5 80 32000 1e+05
## 8 5 13.5 80 32000 1e+05
## 9 15 13.5 80 32000 1e+05
## 10 17 13.5 80 32000 1e+05
## 11 30 13.5 80 32000 1e+05
## 12 6 13.5 80 32000 1e+05
## 13 11 13.5 80 32000 1e+05
## 14 30 13.5 80 32000 1e+05
## 15 13 13.5 80 32000 1e+05
## 16 17 13.5 80 32000 1e+05
## 17 30 13.5 80 32000 1e+05
## 18 7 13.5 80 32000 1e+05
## 19 5 13.5 80 32000 1e+05
## 20 1 13.5 80 32000 1e+05
## 21 7 13.5 80 32000 1e+05
## 22 30 13.5 80 32000 1e+05
## 23 30 13.5 80 32000 1e+05
## 24 30 13.5 80 32000 1e+05
## 25 5 13.5 80 32000 1e+05
## 26 30 13.5 80 32000 1e+05
## 27 18 13.5 80 32000 1e+05
## 28 9 13.5 80 32000 1e+05
## 29 6 13.5 80 32000 1e+05
## 30 26 13.5 80 32000 1e+05
## 31 14 13.5 80 32000 1e+05
## 32 30 13.5 80 32000 1e+05
## 33 30 13.5 80 32000 1e+05
## 34 30 13.5 80 32000 1e+05
## 35 30 13.5 80 32000 1e+05
## 36 4 13.5 80 32000 1e+05
## 37 30 13.5 80 32000 1e+05
## 38 6 13.5 80 32000 1e+05
## 39 30 13.5 80 32000 1e+05
## 40 20 13.5 80 32000 1e+05
## 41 30 13.5 80 32000 1e+05
## 42 Today 13.5 80 32000 1e+05
## 43 8 13.5 80 32000 1e+05
## 44 7 13.5 80 32000 1e+05
## 45 30 13.5 80 32000 1e+05
## 46 14 13.5 80 32000 1e+05
## 47 20 13.5 80 32000 1e+05
## 48 5 13.5 80 32000 1e+05
## 49 30 13.5 80 32000 1e+05
## 50 30 13.5 80 32000 1e+05
## 51 1 13.5 80 32000 1e+05
## 52 30 13.5 80 32000 1e+05
## 53 30 13.5 80 32000 1e+05
## 54 20 13.5 80 32000 1e+05
## 55 30 13.5 80 32000 1e+05
## 56 4 13.5 80 32000 1e+05
## 57 30 13.5 80 32000 1e+05
## 58 8 13.5 80 32000 1e+05
## 59 30 13.5 80 32000 1e+05
## 60 30 13.5 80 32000 1e+05
## 61 30 13.5 80 32000 1e+05
## 62 13 13.5 80 32000 1e+05
## 63 20 13.5 80 32000 1e+05
## 64 30 13.5 80 32000 1e+05
## 65 6 13.5 80 32000 1e+05
## 66 30 13.5 80 32000 1e+05
## 67 25 13.5 80 32000 1e+05
## 68 30 13.5 80 32000 1e+05
## 69 14 13.5 80 32000 1e+05
## 70 30 13.5 80 32000 1e+05
## 71 6 13.5 80 32000 1e+05
## 72 30 13.5 80 32000 1e+05
## 73 30 13.5 80 32000 1e+05
## 74 4 13.5 80 32000 1e+05
## 75 30 13.5 80 32000 1e+05
## 76 30 13.5 80 32000 1e+05
## 77 30 13.5 80 32000 1e+05
## 78 30 13.5 80 32000 1e+05
## 79 4 13.5 80 32000 1e+05
## 80 30 13.5 80 32000 1e+05
## 81 30 13.5 80 32000 1e+05
## 82 5 13.5 80 32000 1e+05
## 83 1 13.5 80 32000 1e+05
## 84 7 13.5 80 32000 1e+05
## 85 30 13.5 80 32000 1e+05
## 86 30 13.5 80 32000 1e+05
getIndeedJobData5pages('massage therapist', 'Paterson','NJ')
## Warning in getIndeedJobData5pages("massage therapist", "Paterson", "NJ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Paterson", "NJ"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Paterson", "NJ"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist, Independent Contractor
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist and/or Esthetician
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist - Independent Contractor
## 11 Massage Therapist Per Diem
## 12 LMT / Massage Therapist / Wellness Services Professionals
## 13 Massage Therapist - Independent Contractor
## 14 Massage Therapist, Naturopathica Chelsea
## 15 MASSAGE THERAPIST
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist, Independent Contractor
## 20 Licensed Massage Therapist
## 21 Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Massage Therapist (LMT)
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist
## 29 LMT / Massage Therapist / Wellness Services Professionals
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist - Independent Contractor
## 32 Massage Therapist and/or Esthetician
## 33 Licensed Massage Therapist
## 34 Massage Therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist (LMT)
## 38 Licensed Massage Therapist
## 39 Lead Massage Therapist
## 40 Massage Therapist - Full-Time
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist Tier 2
## 43 Licensed Massage Therapist (LMT): PAID TRAINING
## 44 Licensed Massage Therapist
## 45 Massage Therapist [CUSTOMIZATION REQUIRED]
## 46 Part Time Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapist (Part-time)
## 49 Massage Therapist [Linden Signup Bonus]
## 50 NOW HIRING FOR JULY TRAINING! Assisted Stretch for Fitness P...
## 51 Massage Therapist - Part-Time
## 52 Licensed Full or Part time Massage Therapist
## 53 Stretch Technician
## 54 Licensed Massage Therapist
## 55 Massage Therapist (Luxury Health Club)
## 56 FULL TIME: Licensed Massage Therapist JC/Bayonne NJ
## 57 Lead Massage Therapist
## 58 Licensed Massage Therapist (LMT): PAID TRAINING
## 59 Licensed Massage Therapist
## 60 Prenatal Massage Therapist for Award Winning Practice
## 61 Massage Therapist Licensed in NJ
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist
## 65 Massage Therapist [Linden Signup Bonus]
## 66 Massage Therapist - Mt. Vernon, NY
## 67 Massage Therapist
## 68 NOW HIRING FOR JULY TRAINING! Assisted Stretch for Fitness P...
## 69 Licensed Full or Part time Massage Therapist
## 70 Stretch Technician
## 71 Licensed Massage Therapist
## 72 Massage Therapist (Luxury Health Club)
## 73 FULL TIME: Licensed Massage Therapist JC/Bayonne NJ
## 74 Lead Massage Therapist
## 75 Licensed Massage Therapist
## 76 Massage Therapist and/or Esthetician
## 77 Licensed Massage Therapist, Independent Contractor
## 78 Massage Therapist
## 79 Massage Therapist
## 80 Licensed Massage Therapist
## 81 Massage Therapist
## 82 Licensed Massage Therapist
## 83 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$40 - $50 an hour $40 - $50 40.0 50
## 2 \n$22 - $28 an hour $22 - $28 22.0 28
## 3 \n$30 - $40 an hour $30 - $40 30.0 40
## 4 \n$40 - $60 an hour $40 - $60 40.0 60
## 5 \n$13.50 an hour $13.50 13.5 NA
## 6 \n$35 - $55 an hour $35 - $55 35.0 55
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 8 \n$22 - $80 an hour $22 - $80 22.0 80
## 9 \n$90 - $125 an hour $90 - $125 90.0 125
## 10 \n$22 - $81 an hour $22 - $81 22.0 81
## 11 \n$35 - $55 an hour $35 - $55 35.0 55
## 12 \n$40 - $50 an hour $40 - $50 40.0 50
## 13 \n$30 - $40 an hour $30 - $40 30.0 40
## 14 \n$40 - $60 an hour $40 - $60 40.0 60
## 15 \n$13.50 an hour $13.50 13.5 NA
## 16 \n$17 - $25 an hour $17 - $25 17.0 25
## 17 \n$50,000 a year $50000 50000.0 NA
## 18 \n$25 - $40 an hour $25 - $40 25.0 40
## 19 \n$22 - $80 an hour $22 - $80 22.0 80
## 20 \n$55,000 a year $55000 55000.0 NA
## 21 \n$90 - $125 an hour $90 - $125 90.0 125
## 22 \n$22 - $28 an hour $22 - $28 22.0 28
## 23 \n$40,000 - $80,000 a year $40000 - $80000 40000.0 80000
## 24 \n$32,000 - $100,000 a year $32000 - $100000 32000.0 100000
## 25 \n$20 - $22 an hour ++ $20 - $22 20.0 22
## 26 \n$16 - $19 an hour $16 - $19 16.0 19
## 27 \n$40 - $80 an hour $40 - $80 40.0 80
## 28 \n$40 - $80 an hour $40 - $80 40.0 80
## 29 \n$45 - $50 an hour $45 - $50 45.0 50
## 30 \nUp to $50,000 a year $50000 50000.0 NA
## 31 \n$30 - $40 an hour $30 - $40 30.0 40
## 32 \n$13.50 an hour $13.50 13.5 NA
## 33 \n$35 - $55 an hour $35 - $55 35.0 55
## 34 \n$22 - $28 an hour $22 - $28 22.0 28
## 35 \n$40 - $60 an hour $40 - $60 40.0 60
## 36 \n$40 - $50 an hour $40 - $50 40.0 50
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 40 6471.958 6462.068 13.5
## 2 35 40 6471.958 6462.068 13.5
## 3 35 40 6471.958 6462.068 13.5
## 4 35 40 6471.958 6462.068 13.5
## 5 35 40 6471.958 6462.068 13.5
## 6 35 40 6471.958 6462.068 13.5
## 7 35 40 6471.958 6462.068 13.5
## 8 35 40 6471.958 6462.068 13.5
## 9 35 40 6471.958 6462.068 13.5
## 10 35 40 6471.958 6462.068 13.5
## 11 35 40 6471.958 6462.068 13.5
## 12 35 40 6471.958 6462.068 13.5
## 13 35 40 6471.958 6462.068 13.5
## 14 35 40 6471.958 6462.068 13.5
## 15 35 40 6471.958 6462.068 13.5
## 16 35 40 6471.958 6462.068 13.5
## 17 35 40 6471.958 6462.068 13.5
## 18 35 40 6471.958 6462.068 13.5
## 19 35 40 6471.958 6462.068 13.5
## 20 35 40 6471.958 6462.068 13.5
## 21 35 40 6471.958 6462.068 13.5
## 22 35 40 6471.958 6462.068 13.5
## 23 35 40 6471.958 6462.068 13.5
## 24 35 40 6471.958 6462.068 13.5
## 25 35 40 6471.958 6462.068 13.5
## 26 35 40 6471.958 6462.068 13.5
## 27 35 40 6471.958 6462.068 13.5
## 28 35 40 6471.958 6462.068 13.5
## 29 35 40 6471.958 6462.068 13.5
## 30 35 40 6471.958 6462.068 13.5
## 31 35 40 6471.958 6462.068 13.5
## 32 35 40 6471.958 6462.068 13.5
## 33 35 40 6471.958 6462.068 13.5
## 34 35 40 6471.958 6462.068 13.5
## 35 35 40 6471.958 6462.068 13.5
## 36 35 40 6471.958 6462.068 13.5
## maximumMaxSalary
## 1 1e+05
## 2 1e+05
## 3 1e+05
## 4 1e+05
## 5 1e+05
## 6 1e+05
## 7 1e+05
## 8 1e+05
## 9 1e+05
## 10 1e+05
## 11 1e+05
## 12 1e+05
## 13 1e+05
## 14 1e+05
## 15 1e+05
## 16 1e+05
## 17 1e+05
## 18 1e+05
## 19 1e+05
## 20 1e+05
## 21 1e+05
## 22 1e+05
## 23 1e+05
## 24 1e+05
## 25 1e+05
## 26 1e+05
## 27 1e+05
## 28 1e+05
## 29 1e+05
## 30 1e+05
## 31 1e+05
## 32 1e+05
## 33 1e+05
## 34 1e+05
## 35 1e+05
## 36 1e+05
##
## [[3]]
## date_daysAgo
## 1 5
## 2 30
## 3 30
## 4 1
## 5 18
## 6 4
## 7 30
## 8 20
## 9 6
## 10 5
## 11 30
## 12 1
## 13 Just posted
## 14 Today
## 15 13
## 16 30
## 17 18
## 18 5
## 19 30
## 20 1
## 21 4
## 22 30
## 23 17
## 24 30
## 25 11
## 26 15
## 27 6
## 28 30
## 29 1
## 30 25
## 31 Just posted
## 32 20
## 33 30
## 34 30
## 35 8
## 36 18
## 37 5
## 38 17
## 39 30
## 40 7
## 41 7
## 42 12
## 43 20
## 44 11
## 45 14
## 46 30
## 47 26
## 48 21
## 49 30
## 50 7
## 51 7
## 52 30
## 53 6
## 54 30
## 55 30
## 56 30
## 57 14
## 58 20
## 59 6
## 60 30
## 61 14
## 62 30
## 63 30
## 64 30
## 65 30
## 66 30
## 67 30
## 68 7
## 69 30
## 70 6
## 71 30
## 72 30
## 73 30
## 74 14
## 75 30
## 76 20
## 77 30
## 78 4
## 79 18
## 80 30
## 81 30
## 82 1
## 83 5
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Totowa, NJ 07512
## 2 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 3 Harmony Within Massage TherapyWestwood, NJ 07675
## 4 Blackbird Yoga StudioHaworth, NJ 07641
## 5 NJ Foot and Ankle CentersOradell, NJ 07649
## 6 The Woodhouse Day SpaMontclair, NJ 07042
## 7 Massage Envy3.2Edgewater, NJ 07020
## 8 Hand and Stone Massage and Facial Spa3.0Pompton Lakes, NJ 07442
## 9 Franklin Lakes Sport & SpineFranklin Lakes, NJ 07417
## 10 Indo-Pak Massage TherapyPassaic, NJ+14 locations•Remote work available
## 11 Englewood Hospital and Medical Center4.0Englewood, NJ 07631
## 12 FitLoreNew York, NY 10065 (Upper East Side area)
## 13 StressKnotNycNew York, NY
## 14 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 15 THE URBAN MUSE4.3Denville, NJ 07834
## 16 Massage Envy3.2Edgewater, NJ 07020
## 17 NJ Foot and Ankle CentersOradell, NJ 07649
## 18 Elements Massage3.6Totowa, NJ 07512
## 19 Harmony Within Massage TherapyWestwood, NJ 07675
## 20 Blackbird Yoga StudioHaworth, NJ 07641
## 21 The Woodhouse Day SpaMontclair, NJ 07042
## 22 Massage Envy3.2Wayne, NJ 07470+26 locations
## 23 Hand and Stone Massage and Facial Spa3.0Wayne, NJ 07470
## 24 Elements3.6Montclair, NJ 07042
## 25 The Woodhouse Day Spa - Montclair & Red BankMontclair, NJ 07042
## 26 Jersey Premier Pain3.3Jersey City, NJ 07306 (Journal Square area)
## 27 Spavia Day Spa - Clark CommonsClark, NJ 07066
## 28 Deldor Day SpaTenafly, NJ 07670
## 29 FitLoreNew York, NY 10065 (Upper East Side area)
## 30 Pure Massage/Spa 23 Fitness & LifestylePompton Plains, NJ
## 31 StressKnotNycNew York, NY
## 32 Hand and Stone Massage and Facial Spa3.0Pompton Lakes, NJ 07442
## 33 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 34 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 35 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 36 Massage Heights3.1Morristown, NJ 07960
## 37 Garwood Massage EnvyGarwood, NJ 07027
## 38 Massage Heights - Morristown3.1Morristown, NJ 07960
## 39 Hand and Stone3.0Kearny, NJ 07032+1 location
## 40 Massage Envy3.2Ramsey, NJ 07446
## 41 Morris Plains Massage EnvyMorris Plains, NJ 07950
## 42 Massage Heights3.1Morristown, NJ 07960
## 43 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 44 The Center for joint and spine reliefJersey City, NJ 07302 (Downtown area)
## 45 Massage Envy3.2Jersey City, NJ 07302 (The Waterfront area)+1 location
## 46 A Good Life MassageWayne, NJ
## 47 Uscape RejuvenationPearl River, NY 10965
## 48 Massage Envy3.2Ramsey, NJ 07446
## 49 Massage Envy3.2Linden, NJ 07036
## 50 StretchLab3.8Morristown, NJ 07960
## 51 Massage Envy3.2Ramsey, NJ 07446
## 52 Massage Envy3.2Fair Lawn, NJ 07410
## 53 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 54 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 55 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 56 Hand and Stone3.0Bayonne, NJ 07002
## 57 Massage Envy3.2Rockaway, NJ 07866
## 58 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 59 StretchLab - White Plains3.8White Plains, NY 10601
## 60 Medical Massage GroupNew York, NY 10021 (Upper East Side area)
## 61 Massage Envy3.2Bayonne, NJ 07002
## 62 WTS International3.3New York, NY 10013 (SoHo area)
## 63 The Wright Fit3.6New York, NY
## 64 StretchLab3.8White Plains, NY 10601
## 65 Massage Envy3.2Linden, NJ 07036
## 66 NuSpecies Holistic Health CentersMount Vernon, NY 10550
## 67 Skin Spa New YorkNew York, NY
## 68 StretchLab3.8Morristown, NJ 07960
## 69 Massage Envy3.2Fair Lawn, NJ 07410
## 70 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 71 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 72 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 73 Hand and Stone3.0Bayonne, NJ 07002
## 74 Massage Envy3.2Rockaway, NJ 07866
## 75 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 76 Hand and Stone Massage and Facial Spa3.0Pompton Lakes, NJ 07442
## 77 Harmony Within Massage TherapyWestwood, NJ 07675
## 78 The Woodhouse Day SpaMontclair, NJ 07042
## 79 NJ Foot and Ankle CentersOradell, NJ 07649
## 80 Massage Envy3.2Edgewater, NJ 07020
## 81 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 82 Blackbird Yoga StudioHaworth, NJ 07641
## 83 Elements Massage3.6Totowa, NJ 07512
##
## [[5]]
## Salary salary minSalary maxSalary
## 17 \n$50,000 a year $50000 50000 NA
## 20 \n$55,000 a year $55000 55000 NA
## 23 \n$40,000 - $80,000 a year $40000 - $80000 40000 8e+04
## 24 \n$32,000 - $100,000 a year $32000 - $100000 32000 1e+05
## 30 \nUp to $50,000 a year $50000 50000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 17 50000 90000 45400 90000 32000
## 20 50000 90000 45400 90000 32000
## 23 50000 90000 45400 90000 32000
## 24 50000 90000 45400 90000 32000
## 30 50000 90000 45400 90000 32000
## maximumMaxSalary
## 17 1e+05
## 20 1e+05
## 23 1e+05
## 24 1e+05
## 30 1e+05
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$40 - $50 an hour $40 - $50 40.0 50 30
## 2 \n$22 - $28 an hour $22 - $28 22.0 28 30
## 3 \n$30 - $40 an hour $30 - $40 30.0 40 30
## 4 \n$40 - $60 an hour $40 - $60 40.0 60 30
## 5 \n$13.50 an hour $13.50 13.5 NA 30
## 6 \n$35 - $55 an hour $35 - $55 35.0 55 30
## 8 \n$22 - $80 an hour $22 - $80 22.0 80 30
## 9 \n$90 - $125 an hour $90 - $125 90.0 125 30
## 10 \n$22 - $81 an hour $22 - $81 22.0 81 30
## 11 \n$35 - $55 an hour $35 - $55 35.0 55 30
## 12 \n$40 - $50 an hour $40 - $50 40.0 50 30
## 13 \n$30 - $40 an hour $30 - $40 30.0 40 30
## 14 \n$40 - $60 an hour $40 - $60 40.0 60 30
## 15 \n$13.50 an hour $13.50 13.5 NA 30
## 16 \n$17 - $25 an hour $17 - $25 17.0 25 30
## 18 \n$25 - $40 an hour $25 - $40 25.0 40 30
## 19 \n$22 - $80 an hour $22 - $80 22.0 80 30
## 21 \n$90 - $125 an hour $90 - $125 90.0 125 30
## 22 \n$22 - $28 an hour $22 - $28 22.0 28 30
## 25 \n$20 - $22 an hour ++ $20 - $22 20.0 22 30
## 26 \n$16 - $19 an hour $16 - $19 16.0 19 30
## 27 \n$40 - $80 an hour $40 - $80 40.0 80 30
## 28 \n$40 - $80 an hour $40 - $80 40.0 80 30
## 29 \n$45 - $50 an hour $45 - $50 45.0 50 30
## 31 \n$30 - $40 an hour $30 - $40 30.0 40 30
## 32 \n$13.50 an hour $13.50 13.5 NA 30
## 33 \n$35 - $55 an hour $35 - $55 35.0 55 30
## 34 \n$22 - $28 an hour $22 - $28 22.0 28 30
## 35 \n$40 - $60 an hour $40 - $60 40.0 60 30
## 36 \n$40 - $50 an hour $40 - $50 40.0 50 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 50 33.01667 55.77778 13.5 125
## 2 50 33.01667 55.77778 13.5 125
## 3 50 33.01667 55.77778 13.5 125
## 4 50 33.01667 55.77778 13.5 125
## 5 50 33.01667 55.77778 13.5 125
## 6 50 33.01667 55.77778 13.5 125
## 8 50 33.01667 55.77778 13.5 125
## 9 50 33.01667 55.77778 13.5 125
## 10 50 33.01667 55.77778 13.5 125
## 11 50 33.01667 55.77778 13.5 125
## 12 50 33.01667 55.77778 13.5 125
## 13 50 33.01667 55.77778 13.5 125
## 14 50 33.01667 55.77778 13.5 125
## 15 50 33.01667 55.77778 13.5 125
## 16 50 33.01667 55.77778 13.5 125
## 18 50 33.01667 55.77778 13.5 125
## 19 50 33.01667 55.77778 13.5 125
## 21 50 33.01667 55.77778 13.5 125
## 22 50 33.01667 55.77778 13.5 125
## 25 50 33.01667 55.77778 13.5 125
## 26 50 33.01667 55.77778 13.5 125
## 27 50 33.01667 55.77778 13.5 125
## 28 50 33.01667 55.77778 13.5 125
## 29 50 33.01667 55.77778 13.5 125
## 31 50 33.01667 55.77778 13.5 125
## 32 50 33.01667 55.77778 13.5 125
## 33 50 33.01667 55.77778 13.5 125
## 34 50 33.01667 55.77778 13.5 125
## 35 50 33.01667 55.77778 13.5 125
## 36 50 33.01667 55.77778 13.5 125
##
## [[7]]
## city state
## 1 Paterson NJ
## 2 Paterson NJ
## 3 Paterson NJ
## 4 Paterson NJ
## 5 Paterson NJ
## 6 Paterson NJ
## 7 Paterson NJ
## 8 Paterson NJ
## 9 Paterson NJ
## 10 Paterson NJ
## 11 Paterson NJ
## 12 Paterson NJ
## 13 Paterson NJ
## 14 Paterson NJ
## 15 Paterson NJ
## 16 Paterson NJ
## 17 Paterson NJ
## 18 Paterson NJ
## 19 Paterson NJ
## 20 Paterson NJ
## 21 Paterson NJ
## 22 Paterson NJ
## 23 Paterson NJ
## 24 Paterson NJ
## 25 Paterson NJ
## 26 Paterson NJ
## 27 Paterson NJ
## 28 Paterson NJ
## 29 Paterson NJ
## 30 Paterson NJ
## 31 Paterson NJ
## 32 Paterson NJ
## 33 Paterson NJ
## 34 Paterson NJ
## 35 Paterson NJ
## 36 Paterson NJ
## 37 Paterson NJ
## 38 Paterson NJ
## 39 Paterson NJ
## 40 Paterson NJ
## 41 Paterson NJ
## 42 Paterson NJ
## 43 Paterson NJ
## 44 Paterson NJ
## 45 Paterson NJ
## 46 Paterson NJ
## 47 Paterson NJ
## 48 Paterson NJ
## 49 Paterson NJ
## 50 Paterson NJ
## 51 Paterson NJ
## 52 Paterson NJ
## 53 Paterson NJ
## 54 Paterson NJ
## 55 Paterson NJ
## 56 Paterson NJ
## 57 Paterson NJ
## 58 Paterson NJ
## 59 Paterson NJ
## 60 Paterson NJ
## 61 Paterson NJ
## 62 Paterson NJ
## 63 Paterson NJ
## 64 Paterson NJ
## 65 Paterson NJ
## 66 Paterson NJ
## 67 Paterson NJ
## 68 Paterson NJ
## 69 Paterson NJ
## 70 Paterson NJ
## 71 Paterson NJ
## 72 Paterson NJ
## 73 Paterson NJ
## 74 Paterson NJ
## 75 Paterson NJ
## 76 Paterson NJ
## 77 Paterson NJ
## 78 Paterson NJ
## 79 Paterson NJ
## 80 Paterson NJ
## 81 Paterson NJ
## 82 Paterson NJ
## 83 Paterson NJ
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Licensed Massage Therapist, Independent Contractor
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist and/or Esthetician
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist - Independent Contractor
## 11 Massage Therapist Per Diem
## 12 LMT / Massage Therapist / Wellness Services Professionals
## 13 Massage Therapist - Independent Contractor
## 14 Massage Therapist, Naturopathica Chelsea
## 15 MASSAGE THERAPIST
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist, Independent Contractor
## 20 Licensed Massage Therapist
## 21 Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist (LMT)
## 24 Massage Therapist (LMT)
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist
## 29 LMT / Massage Therapist / Wellness Services Professionals
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist - Independent Contractor
## 32 Massage Therapist and/or Esthetician
## 33 Licensed Massage Therapist
## 34 Massage Therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist (LMT)
## 38 Licensed Massage Therapist
## 39 Lead Massage Therapist
## 40 Massage Therapist - Full-Time
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist Tier 2
## 43 Licensed Massage Therapist (LMT): PAID TRAINING
## 44 Licensed Massage Therapist
## 45 Massage Therapist [CUSTOMIZATION REQUIRED]
## 46 Part Time Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapist (Part-time)
## 49 Massage Therapist [Linden Signup Bonus]
## 50 NOW HIRING FOR JULY TRAINING! Assisted Stretch for Fitness P...
## 51 Massage Therapist - Part-Time
## 52 Licensed Full or Part time Massage Therapist
## 53 Stretch Technician
## 54 Licensed Massage Therapist
## 55 Massage Therapist (Luxury Health Club)
## 56 FULL TIME: Licensed Massage Therapist JC/Bayonne NJ
## 57 Lead Massage Therapist
## 58 Licensed Massage Therapist (LMT): PAID TRAINING
## 59 Licensed Massage Therapist
## 60 Prenatal Massage Therapist for Award Winning Practice
## 61 Massage Therapist Licensed in NJ
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist
## 65 Massage Therapist [Linden Signup Bonus]
## 66 Massage Therapist - Mt. Vernon, NY
## 67 Massage Therapist
## 68 NOW HIRING FOR JULY TRAINING! Assisted Stretch for Fitness P...
## 69 Licensed Full or Part time Massage Therapist
## 70 Stretch Technician
## 71 Licensed Massage Therapist
## 72 Massage Therapist (Luxury Health Club)
## 73 FULL TIME: Licensed Massage Therapist JC/Bayonne NJ
## 74 Lead Massage Therapist
## 75 Licensed Massage Therapist
## 76 Massage Therapist and/or Esthetician
## 77 Licensed Massage Therapist, Independent Contractor
## 78 Massage Therapist
## 79 Massage Therapist
## 80 Licensed Massage Therapist
## 81 Massage Therapist
## 82 Licensed Massage Therapist
## 83 Massage Therapist
## HiringAgency
## 1 Elements Massage3.6Totowa, NJ 07512
## 2 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 3 Harmony Within Massage TherapyWestwood, NJ 07675
## 4 Blackbird Yoga StudioHaworth, NJ 07641
## 5 NJ Foot and Ankle CentersOradell, NJ 07649
## 6 The Woodhouse Day SpaMontclair, NJ 07042
## 7 Massage Envy3.2Edgewater, NJ 07020
## 8 Hand and Stone Massage and Facial Spa3.0Pompton Lakes, NJ 07442
## 9 Franklin Lakes Sport & SpineFranklin Lakes, NJ 07417
## 10 Indo-Pak Massage TherapyPassaic, NJ+14 locations•Remote work available
## 11 Englewood Hospital and Medical Center4.0Englewood, NJ 07631
## 12 FitLoreNew York, NY 10065 (Upper East Side area)
## 13 StressKnotNycNew York, NY
## 14 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 15 THE URBAN MUSE4.3Denville, NJ 07834
## 16 Massage Envy3.2Edgewater, NJ 07020
## 17 NJ Foot and Ankle CentersOradell, NJ 07649
## 18 Elements Massage3.6Totowa, NJ 07512
## 19 Harmony Within Massage TherapyWestwood, NJ 07675
## 20 Blackbird Yoga StudioHaworth, NJ 07641
## 21 The Woodhouse Day SpaMontclair, NJ 07042
## 22 Massage Envy3.2Wayne, NJ 07470+26 locations
## 23 Hand and Stone Massage and Facial Spa3.0Wayne, NJ 07470
## 24 Elements3.6Montclair, NJ 07042
## 25 The Woodhouse Day Spa - Montclair & Red BankMontclair, NJ 07042
## 26 Jersey Premier Pain3.3Jersey City, NJ 07306 (Journal Square area)
## 27 Spavia Day Spa - Clark CommonsClark, NJ 07066
## 28 Deldor Day SpaTenafly, NJ 07670
## 29 FitLoreNew York, NY 10065 (Upper East Side area)
## 30 Pure Massage/Spa 23 Fitness & LifestylePompton Plains, NJ
## 31 StressKnotNycNew York, NY
## 32 Hand and Stone Massage and Facial Spa3.0Pompton Lakes, NJ 07442
## 33 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 34 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 35 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 36 Massage Heights3.1Morristown, NJ 07960
## 37 Garwood Massage EnvyGarwood, NJ 07027
## 38 Massage Heights - Morristown3.1Morristown, NJ 07960
## 39 Hand and Stone3.0Kearny, NJ 07032+1 location
## 40 Massage Envy3.2Ramsey, NJ 07446
## 41 Morris Plains Massage EnvyMorris Plains, NJ 07950
## 42 Massage Heights3.1Morristown, NJ 07960
## 43 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 44 The Center for joint and spine reliefJersey City, NJ 07302 (Downtown area)
## 45 Massage Envy3.2Jersey City, NJ 07302 (The Waterfront area)+1 location
## 46 A Good Life MassageWayne, NJ
## 47 Uscape RejuvenationPearl River, NY 10965
## 48 Massage Envy3.2Ramsey, NJ 07446
## 49 Massage Envy3.2Linden, NJ 07036
## 50 StretchLab3.8Morristown, NJ 07960
## 51 Massage Envy3.2Ramsey, NJ 07446
## 52 Massage Envy3.2Fair Lawn, NJ 07410
## 53 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 54 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 55 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 56 Hand and Stone3.0Bayonne, NJ 07002
## 57 Massage Envy3.2Rockaway, NJ 07866
## 58 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 59 StretchLab - White Plains3.8White Plains, NY 10601
## 60 Medical Massage GroupNew York, NY 10021 (Upper East Side area)
## 61 Massage Envy3.2Bayonne, NJ 07002
## 62 WTS International3.3New York, NY 10013 (SoHo area)
## 63 The Wright Fit3.6New York, NY
## 64 StretchLab3.8White Plains, NY 10601
## 65 Massage Envy3.2Linden, NJ 07036
## 66 NuSpecies Holistic Health CentersMount Vernon, NY 10550
## 67 Skin Spa New YorkNew York, NY
## 68 StretchLab3.8Morristown, NJ 07960
## 69 Massage Envy3.2Fair Lawn, NJ 07410
## 70 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 71 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 72 LA PALESTRA2.8New York, NY 10023 (Upper West Side area)
## 73 Hand and Stone3.0Bayonne, NJ 07002
## 74 Massage Envy3.2Rockaway, NJ 07866
## 75 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 76 Hand and Stone Massage and Facial Spa3.0Pompton Lakes, NJ 07442
## 77 Harmony Within Massage TherapyWestwood, NJ 07675
## 78 The Woodhouse Day SpaMontclair, NJ 07042
## 79 NJ Foot and Ankle CentersOradell, NJ 07649
## 80 Massage Envy3.2Edgewater, NJ 07020
## 81 Hand and Stone Bayonne3.0Bayonne, NJ 07002
## 82 Blackbird Yoga StudioHaworth, NJ 07641
## 83 Elements Massage3.6Totowa, NJ 07512
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 5 13.5 125 32000 1e+05
## 2 30 13.5 125 32000 1e+05
## 3 30 13.5 125 32000 1e+05
## 4 1 13.5 125 32000 1e+05
## 5 18 13.5 125 32000 1e+05
## 6 4 13.5 125 32000 1e+05
## 7 30 13.5 125 32000 1e+05
## 8 20 13.5 125 32000 1e+05
## 9 6 13.5 125 32000 1e+05
## 10 5 13.5 125 32000 1e+05
## 11 30 13.5 125 32000 1e+05
## 12 1 13.5 125 32000 1e+05
## 13 Just posted 13.5 125 32000 1e+05
## 14 Today 13.5 125 32000 1e+05
## 15 13 13.5 125 32000 1e+05
## 16 30 13.5 125 32000 1e+05
## 17 18 13.5 125 32000 1e+05
## 18 5 13.5 125 32000 1e+05
## 19 30 13.5 125 32000 1e+05
## 20 1 13.5 125 32000 1e+05
## 21 4 13.5 125 32000 1e+05
## 22 30 13.5 125 32000 1e+05
## 23 17 13.5 125 32000 1e+05
## 24 30 13.5 125 32000 1e+05
## 25 11 13.5 125 32000 1e+05
## 26 15 13.5 125 32000 1e+05
## 27 6 13.5 125 32000 1e+05
## 28 30 13.5 125 32000 1e+05
## 29 1 13.5 125 32000 1e+05
## 30 25 13.5 125 32000 1e+05
## 31 Just posted 13.5 125 32000 1e+05
## 32 20 13.5 125 32000 1e+05
## 33 30 13.5 125 32000 1e+05
## 34 30 13.5 125 32000 1e+05
## 35 8 13.5 125 32000 1e+05
## 36 18 13.5 125 32000 1e+05
## 37 5 13.5 125 32000 1e+05
## 38 17 13.5 125 32000 1e+05
## 39 30 13.5 125 32000 1e+05
## 40 7 13.5 125 32000 1e+05
## 41 7 13.5 125 32000 1e+05
## 42 12 13.5 125 32000 1e+05
## 43 20 13.5 125 32000 1e+05
## 44 11 13.5 125 32000 1e+05
## 45 14 13.5 125 32000 1e+05
## 46 30 13.5 125 32000 1e+05
## 47 26 13.5 125 32000 1e+05
## 48 21 13.5 125 32000 1e+05
## 49 30 13.5 125 32000 1e+05
## 50 7 13.5 125 32000 1e+05
## 51 7 13.5 125 32000 1e+05
## 52 30 13.5 125 32000 1e+05
## 53 6 13.5 125 32000 1e+05
## 54 30 13.5 125 32000 1e+05
## 55 30 13.5 125 32000 1e+05
## 56 30 13.5 125 32000 1e+05
## 57 14 13.5 125 32000 1e+05
## 58 20 13.5 125 32000 1e+05
## 59 6 13.5 125 32000 1e+05
## 60 30 13.5 125 32000 1e+05
## 61 14 13.5 125 32000 1e+05
## 62 30 13.5 125 32000 1e+05
## 63 30 13.5 125 32000 1e+05
## 64 30 13.5 125 32000 1e+05
## 65 30 13.5 125 32000 1e+05
## 66 30 13.5 125 32000 1e+05
## 67 30 13.5 125 32000 1e+05
## 68 7 13.5 125 32000 1e+05
## 69 30 13.5 125 32000 1e+05
## 70 6 13.5 125 32000 1e+05
## 71 30 13.5 125 32000 1e+05
## 72 30 13.5 125 32000 1e+05
## 73 30 13.5 125 32000 1e+05
## 74 14 13.5 125 32000 1e+05
## 75 30 13.5 125 32000 1e+05
## 76 20 13.5 125 32000 1e+05
## 77 30 13.5 125 32000 1e+05
## 78 4 13.5 125 32000 1e+05
## 79 18 13.5 125 32000 1e+05
## 80 30 13.5 125 32000 1e+05
## 81 30 13.5 125 32000 1e+05
## 82 1 13.5 125 32000 1e+05
## 83 5 13.5 125 32000 1e+05
New Mexico Albuquerque, Las Cruces, Rio Rancho
getIndeedJobData5pages('massage therapist', 'Albuquerque','NM')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist - Elements Massage
## 2 Massage Therapist
## 3 Albuquerque Massage Therapy Program Supervisor
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 LICENSED MASSAGE THERAPIST
## 8 Massage Therapist - Independent Contractor
## 9 Mobile Massage Therapist
## 10 MASSAGE THERAPIST (ABHYANGA) On-Call
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Massage Therapist-Massage Envy Ventura Place
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist - Independent Contractor
## 19 LICENSED MASSAGE THERAPIST
## 20 Massage Therapist - Independent Contractor
## 21 Mobile Massage Therapist
## 22 MASSAGE THERAPIST (ABHYANGA) On-Call
## 23 Massage Therapist
## 24 Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist-Massage Envy Ventura Place
## 27 Licensed Massage Therapist
## 28 Massage Therapist Full-time
## 29 Massage Therapist Part-time
## 30 LMTs
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist
## 33 Massage Therapist - Independent Contractor
## 34 LICENSED MASSAGE THERAPIST
## 35 Massage Therapist - Independent Contractor
## 36 Mobile Massage Therapist
## 37 MASSAGE THERAPIST (ABHYANGA) On-Call
## 38 Massage Therapist
## 39 Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist-Massage Envy Ventura Place
## 42 Licensed Massage Therapist
## 43 Massage Therapist Full-time
## 44 Massage Therapist Part-time
## 45 LMTs
## 46 Licensed Massage Therapist
## 47 Massage Therapist
## 48 Massage Therapist - Independent Contractor
## 49 Mobile Massage Therapist
## 50 MASSAGE THERAPIST (ABHYANGA) On-Call
## 51 Massage Therapist
## 52 Massage Therapist
## 53 Massage Therapist-Massage Envy Ventura Place
## 54 Licensed Massage Therapist
## 55 Massage Therapist Full-time
## 56 Massage Therapist Part-time
## 57 LMTs
## 58 Licensed Massage Therapist - Elements Massage
## 59 Licensed Massage Therapist
## 60 Massage Therapist
## 61 Massage Therapist - Independent Contractor
## 62 Mobile Massage Therapist
## 63 MASSAGE THERAPIST (ABHYANGA) On-Call
## 64 Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist-Massage Envy Ventura Place
## 67 Licensed Massage Therapist
## 68 Massage Therapist Full-time
## 69 Massage Therapist Part-time
## 70 LMTs
## 71 Licensed Massage Therapist - Elements Massage
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$19 - $20 an hour $19 - $20 19 20
## 2 \n$20 - $25 an hour $20 - $25 20 25
## 3 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$45 - $70 an hour $45 - $70 45 70
## 6 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$45 - $70 an hour $45 - $70 45 70
## 9 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 11 \n$45 - $70 an hour $45 - $70 45 70
## 12 \n$20 - $25 an hour $20 - $25 20 25
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$45 - $70 an hour $45 - $70 45 70
## 15 \n$19 - $20 an hour $19 - $20 19 20
## 16 \n$20 - $25 an hour $20 - $25 20 25
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$45 - $70 an hour $45 - $70 45 70
## 19 \n$19 - $20 an hour $19 - $20 19 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 70 7569.526 8975.842 19
## 2 45 70 7569.526 8975.842 19
## 3 45 70 7569.526 8975.842 19
## 4 45 70 7569.526 8975.842 19
## 5 45 70 7569.526 8975.842 19
## 6 45 70 7569.526 8975.842 19
## 7 45 70 7569.526 8975.842 19
## 8 45 70 7569.526 8975.842 19
## 9 45 70 7569.526 8975.842 19
## 10 45 70 7569.526 8975.842 19
## 11 45 70 7569.526 8975.842 19
## 12 45 70 7569.526 8975.842 19
## 13 45 70 7569.526 8975.842 19
## 14 45 70 7569.526 8975.842 19
## 15 45 70 7569.526 8975.842 19
## 16 45 70 7569.526 8975.842 19
## 17 45 70 7569.526 8975.842 19
## 18 45 70 7569.526 8975.842 19
## 19 45 70 7569.526 8975.842 19
## maximumMaxSalary
## 1 45592
## 2 45592
## 3 45592
## 4 45592
## 5 45592
## 6 45592
## 7 45592
## 8 45592
## 9 45592
## 10 45592
## 11 45592
## 12 45592
## 13 45592
## 14 45592
## 15 45592
## 16 45592
## 17 45592
## 18 45592
## 19 45592
##
## [[3]]
## date_daysAgo
## 1 9
## 2 23
## 3 30
## 4 30
## 5 30
## 6 9
## 7 24
## 8 5
## 9 30
## 10 30
## 11 22
## 12 5
## 13 15
## 14 30
## 15 30
## 16 30
## 17 30
## 18 9
## 19 24
## 20 5
## 21 30
## 22 30
## 23 22
## 24 5
## 25 15
## 26 30
## 27 30
## 28 30
## 29 30
## 30 22
## 31 30
## 32 30
## 33 9
## 34 24
## 35 5
## 36 30
## 37 30
## 38 22
## 39 5
## 40 15
## 41 30
## 42 30
## 43 30
## 44 30
## 45 22
## 46 15
## 47 23
## 48 5
## 49 30
## 50 30
## 51 22
## 52 5
## 53 30
## 54 30
## 55 30
## 56 30
## 57 22
## 58 9
## 59 15
## 60 23
## 61 5
## 62 30
## 63 30
## 64 22
## 65 5
## 66 30
## 67 30
## 68 30
## 69 30
## 70 22
## 71 9
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 2 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 3 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 4 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 5 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 6 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 7 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 8 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 9 Indo-Pak Massage TherapyAlbuquerque, NM
## 10 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 11 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 12 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 13 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 14 Massage Envy3.2Albuquerque, NM 87122
## 15 Massage Envy3.2Albuquerque, NM 87122
## 16 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 17 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 18 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 19 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 20 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 21 Indo-Pak Massage TherapyAlbuquerque, NM
## 22 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 23 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 24 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 25 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 26 Massage Envy3.2Albuquerque, NM 87122
## 27 Massage Envy3.2Albuquerque, NM 87122
## 28 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 29 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 30 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 31 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 32 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 33 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 34 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 35 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 36 Indo-Pak Massage TherapyAlbuquerque, NM
## 37 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 38 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 39 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 40 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 41 Massage Envy3.2Albuquerque, NM 87122
## 42 Massage Envy3.2Albuquerque, NM 87122
## 43 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 44 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 45 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 46 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 47 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 48 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 49 Indo-Pak Massage TherapyAlbuquerque, NM
## 50 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 51 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 52 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 53 Massage Envy3.2Albuquerque, NM 87122
## 54 Massage Envy3.2Albuquerque, NM 87122
## 55 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 56 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 57 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 58 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 59 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 60 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 61 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 62 Indo-Pak Massage TherapyAlbuquerque, NM
## 63 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 64 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 65 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 66 Massage Envy3.2Albuquerque, NM 87122
## 67 Massage Envy3.2Albuquerque, NM 87122
## 68 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 69 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 70 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 71 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 6 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 9 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 39493 45592 39493 45592 39493
## 6 39493 45592 39493 45592 39493
## 9 39493 45592 39493 45592 39493
## maximumMaxSalary
## 3 45592
## 6 45592
## 9 45592
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$19 - $20 an hour $19 - $20 19 20 20
## 2 \n$20 - $25 an hour $20 - $25 20 25 20
## 5 \n$45 - $70 an hour $45 - $70 45 70 20
## 8 \n$45 - $70 an hour $45 - $70 45 70 20
## 11 \n$45 - $70 an hour $45 - $70 45 70 20
## 12 \n$20 - $25 an hour $20 - $25 20 25 20
## 14 \n$45 - $70 an hour $45 - $70 45 70 20
## 15 \n$19 - $20 an hour $19 - $20 19 20 20
## 16 \n$20 - $25 an hour $20 - $25 20 25 20
## 18 \n$45 - $70 an hour $45 - $70 45 70 20
## 19 \n$19 - $20 an hour $19 - $20 19 20 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 25 31.09091 44.09091 19 70
## 2 25 31.09091 44.09091 19 70
## 5 25 31.09091 44.09091 19 70
## 8 25 31.09091 44.09091 19 70
## 11 25 31.09091 44.09091 19 70
## 12 25 31.09091 44.09091 19 70
## 14 25 31.09091 44.09091 19 70
## 15 25 31.09091 44.09091 19 70
## 16 25 31.09091 44.09091 19 70
## 18 25 31.09091 44.09091 19 70
## 19 25 31.09091 44.09091 19 70
##
## [[7]]
## city state jobTitle
## 1 Albuquerque NM Licensed Massage Therapist - Elements Massage
## 2 Albuquerque NM Massage Therapist
## 3 Albuquerque NM Albuquerque Massage Therapy Program Supervisor
## 4 Albuquerque NM Licensed Massage Therapist
## 5 Albuquerque NM Licensed Massage Therapist
## 6 Albuquerque NM Massage Therapist - Independent Contractor
## 7 Albuquerque NM LICENSED MASSAGE THERAPIST
## 8 Albuquerque NM Massage Therapist - Independent Contractor
## 9 Albuquerque NM Mobile Massage Therapist
## 10 Albuquerque NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 11 Albuquerque NM Massage Therapist
## 12 Albuquerque NM Massage Therapist
## 13 Albuquerque NM Licensed Massage Therapist
## 14 Albuquerque NM Massage Therapist-Massage Envy Ventura Place
## 15 Albuquerque NM Licensed Massage Therapist
## 16 Albuquerque NM Licensed Massage Therapist
## 17 Albuquerque NM Licensed Massage Therapist
## 18 Albuquerque NM Massage Therapist - Independent Contractor
## 19 Albuquerque NM LICENSED MASSAGE THERAPIST
## 20 Albuquerque NM Massage Therapist - Independent Contractor
## 21 Albuquerque NM Mobile Massage Therapist
## 22 Albuquerque NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 23 Albuquerque NM Massage Therapist
## 24 Albuquerque NM Massage Therapist
## 25 Albuquerque NM Licensed Massage Therapist
## 26 Albuquerque NM Massage Therapist-Massage Envy Ventura Place
## 27 Albuquerque NM Licensed Massage Therapist
## 28 Albuquerque NM Massage Therapist Full-time
## 29 Albuquerque NM Massage Therapist Part-time
## 30 Albuquerque NM LMTs
## 31 Albuquerque NM Licensed Massage Therapist
## 32 Albuquerque NM Licensed Massage Therapist
## 33 Albuquerque NM Massage Therapist - Independent Contractor
## 34 Albuquerque NM LICENSED MASSAGE THERAPIST
## 35 Albuquerque NM Massage Therapist - Independent Contractor
## 36 Albuquerque NM Mobile Massage Therapist
## 37 Albuquerque NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 38 Albuquerque NM Massage Therapist
## 39 Albuquerque NM Massage Therapist
## 40 Albuquerque NM Licensed Massage Therapist
## 41 Albuquerque NM Massage Therapist-Massage Envy Ventura Place
## 42 Albuquerque NM Licensed Massage Therapist
## 43 Albuquerque NM Massage Therapist Full-time
## 44 Albuquerque NM Massage Therapist Part-time
## 45 Albuquerque NM LMTs
## 46 Albuquerque NM Licensed Massage Therapist
## 47 Albuquerque NM Massage Therapist
## 48 Albuquerque NM Massage Therapist - Independent Contractor
## 49 Albuquerque NM Mobile Massage Therapist
## 50 Albuquerque NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 51 Albuquerque NM Massage Therapist
## 52 Albuquerque NM Massage Therapist
## 53 Albuquerque NM Massage Therapist-Massage Envy Ventura Place
## 54 Albuquerque NM Licensed Massage Therapist
## 55 Albuquerque NM Massage Therapist Full-time
## 56 Albuquerque NM Massage Therapist Part-time
## 57 Albuquerque NM LMTs
## 58 Albuquerque NM Licensed Massage Therapist - Elements Massage
## 59 Albuquerque NM Licensed Massage Therapist
## 60 Albuquerque NM Massage Therapist
## 61 Albuquerque NM Massage Therapist - Independent Contractor
## 62 Albuquerque NM Mobile Massage Therapist
## 63 Albuquerque NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 64 Albuquerque NM Massage Therapist
## 65 Albuquerque NM Massage Therapist
## 66 Albuquerque NM Massage Therapist-Massage Envy Ventura Place
## 67 Albuquerque NM Licensed Massage Therapist
## 68 Albuquerque NM Massage Therapist Full-time
## 69 Albuquerque NM Massage Therapist Part-time
## 70 Albuquerque NM LMTs
## 71 Albuquerque NM Licensed Massage Therapist - Elements Massage
## HiringAgency
## 1 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 2 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 3 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 4 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 5 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 6 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 7 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 8 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 9 Indo-Pak Massage TherapyAlbuquerque, NM
## 10 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 11 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 12 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 13 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 14 Massage Envy3.2Albuquerque, NM 87122
## 15 Massage Envy3.2Albuquerque, NM 87122
## 16 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 17 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 18 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 19 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 20 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 21 Indo-Pak Massage TherapyAlbuquerque, NM
## 22 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 23 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 24 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 25 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 26 Massage Envy3.2Albuquerque, NM 87122
## 27 Massage Envy3.2Albuquerque, NM 87122
## 28 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 29 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 30 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 31 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 32 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 33 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 34 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 35 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 36 Indo-Pak Massage TherapyAlbuquerque, NM
## 37 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 38 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 39 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 40 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 41 Massage Envy3.2Albuquerque, NM 87122
## 42 Massage Envy3.2Albuquerque, NM 87122
## 43 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 44 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 45 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 46 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 47 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 48 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 49 Indo-Pak Massage TherapyAlbuquerque, NM
## 50 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 51 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 52 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 53 Massage Envy3.2Albuquerque, NM 87122
## 54 Massage Envy3.2Albuquerque, NM 87122
## 55 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 56 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 57 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 58 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 59 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 60 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 61 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 62 Indo-Pak Massage TherapyAlbuquerque, NM
## 63 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 64 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 65 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)+1 location
## 66 Massage Envy3.2Albuquerque, NM 87122
## 67 Massage Envy3.2Albuquerque, NM 87122
## 68 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 69 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 70 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 71 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 9 19 70 39493 45592
## 2 23 19 70 39493 45592
## 3 30 19 70 39493 45592
## 4 30 19 70 39493 45592
## 5 30 19 70 39493 45592
## 6 9 19 70 39493 45592
## 7 24 19 70 39493 45592
## 8 5 19 70 39493 45592
## 9 30 19 70 39493 45592
## 10 30 19 70 39493 45592
## 11 22 19 70 39493 45592
## 12 5 19 70 39493 45592
## 13 15 19 70 39493 45592
## 14 30 19 70 39493 45592
## 15 30 19 70 39493 45592
## 16 30 19 70 39493 45592
## 17 30 19 70 39493 45592
## 18 9 19 70 39493 45592
## 19 24 19 70 39493 45592
## 20 5 19 70 39493 45592
## 21 30 19 70 39493 45592
## 22 30 19 70 39493 45592
## 23 22 19 70 39493 45592
## 24 5 19 70 39493 45592
## 25 15 19 70 39493 45592
## 26 30 19 70 39493 45592
## 27 30 19 70 39493 45592
## 28 30 19 70 39493 45592
## 29 30 19 70 39493 45592
## 30 22 19 70 39493 45592
## 31 30 19 70 39493 45592
## 32 30 19 70 39493 45592
## 33 9 19 70 39493 45592
## 34 24 19 70 39493 45592
## 35 5 19 70 39493 45592
## 36 30 19 70 39493 45592
## 37 30 19 70 39493 45592
## 38 22 19 70 39493 45592
## 39 5 19 70 39493 45592
## 40 15 19 70 39493 45592
## 41 30 19 70 39493 45592
## 42 30 19 70 39493 45592
## 43 30 19 70 39493 45592
## 44 30 19 70 39493 45592
## 45 22 19 70 39493 45592
## 46 15 19 70 39493 45592
## 47 23 19 70 39493 45592
## 48 5 19 70 39493 45592
## 49 30 19 70 39493 45592
## 50 30 19 70 39493 45592
## 51 22 19 70 39493 45592
## 52 5 19 70 39493 45592
## 53 30 19 70 39493 45592
## 54 30 19 70 39493 45592
## 55 30 19 70 39493 45592
## 56 30 19 70 39493 45592
## 57 22 19 70 39493 45592
## 58 9 19 70 39493 45592
## 59 15 19 70 39493 45592
## 60 23 19 70 39493 45592
## 61 5 19 70 39493 45592
## 62 30 19 70 39493 45592
## 63 30 19 70 39493 45592
## 64 22 19 70 39493 45592
## 65 5 19 70 39493 45592
## 66 30 19 70 39493 45592
## 67 30 19 70 39493 45592
## 68 30 19 70 39493 45592
## 69 30 19 70 39493 45592
## 70 22 19 70 39493 45592
## 71 9 19 70 39493 45592
getIndeedJobData5pages('massage therapist', 'Las Cruces','NM')
## Warning in getIndeedJobData5pages("massage therapist", "Las Cruces", "NM"): NAs
## introduced by coercion
## Warning in max(hourly$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Las Cruces", "NM"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licenced Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapis
## 5 Licenced Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapis
## 9 Licenced Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapis
## 12 Licensed Massage Therapist
## 13 Licenced Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapis
## 17 Licenced Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapis
## 20 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 1 \n$15 an hour $15 15 NA 15 15
## 2 \n$15 an hour $15 15 NA 15 15
## 3 \n$15 an hour $15 15 NA 15 15
## 4 \n$15 an hour $15 15 NA 15 15
## 5 \n$15 an hour $15 15 NA 15 15
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 15 15 15 15
## 2 15 15 15 15
## 3 15 15 15 15
## 4 15 15 15 15
## 5 15 15 15 15
##
## [[3]]
## date_daysAgo
## 1 Today
## 2 4
## 3 30
## 4 30
## 5 Today
## 6 4
## 7 30
## 8 30
## 9 Today
## 10 4
## 11 30
## 12 30
## 13 Today
## 14 4
## 15 30
## 16 30
## 17 Today
## 18 4
## 19 30
## 20 30
##
## [[4]]
## HiringAgency
## 1 Smith WellnessLas Cruces, NM 88011
## 2 Massage Envy Spa3.2Las Cruces, NM 88001
## 3 Millennium Health & WellnessLas Cruces, NM 88011
## 4 Massage Envy3.2Las Cruces, NM 88011
## 5 Smith WellnessLas Cruces, NM 88011
## 6 Massage Envy Spa3.2Las Cruces, NM 88001
## 7 Millennium Health & WellnessLas Cruces, NM 88011
## 8 Massage Envy3.2Las Cruces, NM 88011
## 9 Smith WellnessLas Cruces, NM 88011
## 10 Massage Envy Spa3.2Las Cruces, NM 88001
## 11 Massage Envy3.2Las Cruces, NM 88011
## 12 Millennium Health & WellnessLas Cruces, NM 88011
## 13 Smith WellnessLas Cruces, NM 88011
## 14 Massage Envy Spa3.2Las Cruces, NM 88001
## 15 Millennium Health & WellnessLas Cruces, NM 88011
## 16 Massage Envy3.2Las Cruces, NM 88011
## 17 Smith WellnessLas Cruces, NM 88011
## 18 Massage Envy Spa3.2Las Cruces, NM 88001
## 19 Massage Envy3.2Las Cruces, NM 88011
## 20 Millennium Health & WellnessLas Cruces, NM 88011
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 1 \n$15 an hour $15 15 NA 15 NA
## 2 \n$15 an hour $15 15 NA 15 NA
## 3 \n$15 an hour $15 15 NA 15 NA
## 4 \n$15 an hour $15 15 NA 15 NA
## 5 \n$15 an hour $15 15 NA 15 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 15 NaN 15 -Inf
## 2 15 NaN 15 -Inf
## 3 15 NaN 15 -Inf
## 4 15 NaN 15 -Inf
## 5 15 NaN 15 -Inf
##
## [[7]]
## city state jobTitle
## 1 Las Cruces NM Licenced Massage Therapist
## 2 Las Cruces NM Licensed Massage Therapist
## 3 Las Cruces NM Licensed Massage Therapist
## 4 Las Cruces NM Massage Therapis
## 5 Las Cruces NM Licenced Massage Therapist
## 6 Las Cruces NM Licensed Massage Therapist
## 7 Las Cruces NM Licensed Massage Therapist
## 8 Las Cruces NM Massage Therapis
## 9 Las Cruces NM Licenced Massage Therapist
## 10 Las Cruces NM Licensed Massage Therapist
## 11 Las Cruces NM Massage Therapis
## 12 Las Cruces NM Licensed Massage Therapist
## 13 Las Cruces NM Licenced Massage Therapist
## 14 Las Cruces NM Licensed Massage Therapist
## 15 Las Cruces NM Licensed Massage Therapist
## 16 Las Cruces NM Massage Therapis
## 17 Las Cruces NM Licenced Massage Therapist
## 18 Las Cruces NM Licensed Massage Therapist
## 19 Las Cruces NM Massage Therapis
## 20 Las Cruces NM Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Smith WellnessLas Cruces, NM 88011 Today
## 2 Massage Envy Spa3.2Las Cruces, NM 88001 4
## 3 Millennium Health & WellnessLas Cruces, NM 88011 30
## 4 Massage Envy3.2Las Cruces, NM 88011 30
## 5 Smith WellnessLas Cruces, NM 88011 Today
## 6 Massage Envy Spa3.2Las Cruces, NM 88001 4
## 7 Millennium Health & WellnessLas Cruces, NM 88011 30
## 8 Massage Envy3.2Las Cruces, NM 88011 30
## 9 Smith WellnessLas Cruces, NM 88011 Today
## 10 Massage Envy Spa3.2Las Cruces, NM 88001 4
## 11 Massage Envy3.2Las Cruces, NM 88011 30
## 12 Millennium Health & WellnessLas Cruces, NM 88011 30
## 13 Smith WellnessLas Cruces, NM 88011 Today
## 14 Massage Envy Spa3.2Las Cruces, NM 88001 4
## 15 Millennium Health & WellnessLas Cruces, NM 88011 30
## 16 Massage Envy3.2Las Cruces, NM 88011 30
## 17 Smith WellnessLas Cruces, NM 88011 Today
## 18 Massage Envy Spa3.2Las Cruces, NM 88001 4
## 19 Massage Envy3.2Las Cruces, NM 88011 30
## 20 Millennium Health & WellnessLas Cruces, NM 88011 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 15 15 NA NA
## 2 15 15 NA NA
## 3 15 15 NA NA
## 4 15 15 NA NA
## 5 15 15 NA NA
## 6 15 15 NA NA
## 7 15 15 NA NA
## 8 15 15 NA NA
## 9 15 15 NA NA
## 10 15 15 NA NA
## 11 15 15 NA NA
## 12 15 15 NA NA
## 13 15 15 NA NA
## 14 15 15 NA NA
## 15 15 15 NA NA
## 16 15 15 NA NA
## 17 15 15 NA NA
## 18 15 15 NA NA
## 19 15 15 NA NA
## 20 15 15 NA NA
getIndeedJobData5pages('massage therapist', 'Rio Rancho','NM')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist - Elements Massage
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapist Rio Rancho
## 5 Albuquerque Massage Therapy Program Supervisor
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist - Independent Contractor
## 10 LICENSED MASSAGE THERAPIST
## 11 MASSAGE THERAPIST (ABHYANGA) On-Call
## 12 Massage Therapist - Independent Contractor
## 13 LICENSED MASSAGE THERAPIST
## 14 MASSAGE THERAPIST (ABHYANGA) On-Call
## 15 Massage Therapist
## 16 Mobile Massage Therapist
## 17 Massage Therapist-Massage Envy Ventura Place
## 18 Licensed Massage Therapist
## 19 Massage Therapist Full-time
## 20 Massage Therapist Part-time
## 21 LMTs
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist - Elements Massage
## 25 Albuquerque Massage Therapy Program Supervisor
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist - Independent Contractor
## 29 Massage Therapist - Independent Contractor
## 30 LICENSED MASSAGE THERAPIST
## 31 MASSAGE THERAPIST (ABHYANGA) On-Call
## 32 Massage Therapist
## 33 Mobile Massage Therapist
## 34 Licensed Massage Therapist
## 35 Massage Therapist-Massage Envy Ventura Place
## 36 Licensed Massage Therapist
## 37 Massage Therapist Full-time
## 38 Massage Therapist Part-time
## 39 LMTs
## 40 Albuquerque Massage Therapy Program Supervisor
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist - Independent Contractor
## 44 Massage Therapist - Independent Contractor
## 45 LICENSED MASSAGE THERAPIST
## 46 MASSAGE THERAPIST (ABHYANGA) On-Call
## 47 Massage Therapist
## 48 Mobile Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapist-Massage Envy Ventura Place
## 51 Massage Therapist Full-time
## 52 Licensed Massage Therapist
## 53 Massage Therapist Part-time
## 54 LMTs
## 55 Albuquerque Massage Therapy Program Supervisor
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Massage Therapist - Independent Contractor
## 59 Massage Therapist - Independent Contractor
## 60 LICENSED MASSAGE THERAPIST
## 61 MASSAGE THERAPIST (ABHYANGA) On-Call
## 62 Massage Therapist
## 63 Mobile Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist-Massage Envy Ventura Place
## 66 Massage Therapist Full-time
## 67 Licensed Massage Therapist
## 68 Massage Therapist Part-time
## 69 LMTs
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$19 - $20 an hour $19 - $20 19 20
## 2 \n$20 - $25 an hour $20 - $25 20 25
## 3 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$45 - $70 an hour $45 - $70 45 70
## 7 \n$20 - $25 an hour $20 - $25 20 25
## 8 \n$19 - $20 an hour $19 - $20 19 20
## 9 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 11 \n$45 - $70 an hour $45 - $70 45 70
## 12 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$45 - $70 an hour $45 - $70 45 70
## 15 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 16 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 17 \n$45 - $70 an hour $45 - $70 45 70
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5000 5000 10778.24 12528.47 19
## 2 5000 5000 10778.24 12528.47 19
## 3 5000 5000 10778.24 12528.47 19
## 4 5000 5000 10778.24 12528.47 19
## 5 5000 5000 10778.24 12528.47 19
## 6 5000 5000 10778.24 12528.47 19
## 7 5000 5000 10778.24 12528.47 19
## 8 5000 5000 10778.24 12528.47 19
## 9 5000 5000 10778.24 12528.47 19
## 10 5000 5000 10778.24 12528.47 19
## 11 5000 5000 10778.24 12528.47 19
## 12 5000 5000 10778.24 12528.47 19
## 13 5000 5000 10778.24 12528.47 19
## 14 5000 5000 10778.24 12528.47 19
## 15 5000 5000 10778.24 12528.47 19
## 16 5000 5000 10778.24 12528.47 19
## 17 5000 5000 10778.24 12528.47 19
## maximumMaxSalary
## 1 45592
## 2 45592
## 3 45592
## 4 45592
## 5 45592
## 6 45592
## 7 45592
## 8 45592
## 9 45592
## 10 45592
## 11 45592
## 12 45592
## 13 45592
## 14 45592
## 15 45592
## 16 45592
## 17 45592
##
## [[3]]
## date_daysAgo
## 1 9
## 2 23
## 3 15
## 4 30
## 5 30
## 6 30
## 7 30
## 8 9
## 9 5
## 10 24
## 11 30
## 12 5
## 13 24
## 14 30
## 15 22
## 16 30
## 17 30
## 18 30
## 19 30
## 20 30
## 21 22
## 22 23
## 23 15
## 24 9
## 25 30
## 26 30
## 27 30
## 28 9
## 29 5
## 30 24
## 31 30
## 32 22
## 33 30
## 34 15
## 35 30
## 36 30
## 37 30
## 38 30
## 39 22
## 40 30
## 41 30
## 42 30
## 43 9
## 44 5
## 45 24
## 46 30
## 47 22
## 48 30
## 49 15
## 50 30
## 51 30
## 52 30
## 53 30
## 54 22
## 55 30
## 56 30
## 57 30
## 58 9
## 59 5
## 60 24
## 61 30
## 62 22
## 63 30
## 64 15
## 65 30
## 66 30
## 67 30
## 68 30
## 69 22
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 2 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 3 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 4 Massage Envy3.2Rio Rancho, NM 87124+1 location
## 5 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 6 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 7 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 8 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 9 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 10 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 11 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 12 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 13 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 14 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 15 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 16 Indo-Pak Massage TherapyAlbuquerque, NM
## 17 Massage Envy3.2Albuquerque, NM 87122
## 18 Massage Envy3.2Albuquerque, NM 87122
## 19 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 20 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 21 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 22 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 23 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 24 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 25 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 26 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 27 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 28 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 29 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 30 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 31 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 32 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 33 Indo-Pak Massage TherapyAlbuquerque, NM
## 34 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 35 Massage Envy3.2Albuquerque, NM 87122
## 36 Massage Envy3.2Albuquerque, NM 87122
## 37 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 38 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 39 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 40 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 41 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 42 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 43 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 44 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 45 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 46 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 47 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 48 Indo-Pak Massage TherapyAlbuquerque, NM
## 49 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 50 Massage Envy3.2Albuquerque, NM 87122
## 51 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 52 Massage Envy3.2Albuquerque, NM 87122
## 53 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 54 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 55 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 56 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 57 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 58 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 59 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 60 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 61 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 62 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 63 Indo-Pak Massage TherapyAlbuquerque, NM
## 64 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 65 Massage Envy3.2Albuquerque, NM 87122
## 66 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 67 Massage Envy3.2Albuquerque, NM 87122
## 68 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 69 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 9 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 12 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## 15 \n$39,493 - $45,592 a year $39493 - $45592 39493 45592
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 39493 45592 39493 45592 39493
## 9 39493 45592 39493 45592 39493
## 12 39493 45592 39493 45592 39493
## 15 39493 45592 39493 45592 39493
## maximumMaxSalary
## 3 45592
## 9 45592
## 12 45592
## 15 45592
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$19 - $20 an hour $19 - $20 19 20 32.5
## 2 \n$20 - $25 an hour $20 - $25 20 25 32.5
## 6 \n$45 - $70 an hour $45 - $70 45 70 32.5
## 7 \n$20 - $25 an hour $20 - $25 20 25 32.5
## 8 \n$19 - $20 an hour $19 - $20 19 20 32.5
## 11 \n$45 - $70 an hour $45 - $70 45 70 32.5
## 14 \n$45 - $70 an hour $45 - $70 45 70 32.5
## 17 \n$45 - $70 an hour $45 - $70 45 70 32.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 47.5 32.25 46.25 19 70
## 2 47.5 32.25 46.25 19 70
## 6 47.5 32.25 46.25 19 70
## 7 47.5 32.25 46.25 19 70
## 8 47.5 32.25 46.25 19 70
## 11 47.5 32.25 46.25 19 70
## 14 47.5 32.25 46.25 19 70
## 17 47.5 32.25 46.25 19 70
##
## [[7]]
## city state jobTitle
## 1 Rio Rancho NM Licensed Massage Therapist - Elements Massage
## 2 Rio Rancho NM Massage Therapist
## 3 Rio Rancho NM Licensed Massage Therapist
## 4 Rio Rancho NM Massage Therapist Rio Rancho
## 5 Rio Rancho NM Albuquerque Massage Therapy Program Supervisor
## 6 Rio Rancho NM Licensed Massage Therapist
## 7 Rio Rancho NM Licensed Massage Therapist
## 8 Rio Rancho NM Massage Therapist - Independent Contractor
## 9 Rio Rancho NM Massage Therapist - Independent Contractor
## 10 Rio Rancho NM LICENSED MASSAGE THERAPIST
## 11 Rio Rancho NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 12 Rio Rancho NM Massage Therapist - Independent Contractor
## 13 Rio Rancho NM LICENSED MASSAGE THERAPIST
## 14 Rio Rancho NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 15 Rio Rancho NM Massage Therapist
## 16 Rio Rancho NM Mobile Massage Therapist
## 17 Rio Rancho NM Massage Therapist-Massage Envy Ventura Place
## 18 Rio Rancho NM Licensed Massage Therapist
## 19 Rio Rancho NM Massage Therapist Full-time
## 20 Rio Rancho NM Massage Therapist Part-time
## 21 Rio Rancho NM LMTs
## 22 Rio Rancho NM Massage Therapist
## 23 Rio Rancho NM Licensed Massage Therapist
## 24 Rio Rancho NM Licensed Massage Therapist - Elements Massage
## 25 Rio Rancho NM Albuquerque Massage Therapy Program Supervisor
## 26 Rio Rancho NM Licensed Massage Therapist
## 27 Rio Rancho NM Licensed Massage Therapist
## 28 Rio Rancho NM Massage Therapist - Independent Contractor
## 29 Rio Rancho NM Massage Therapist - Independent Contractor
## 30 Rio Rancho NM LICENSED MASSAGE THERAPIST
## 31 Rio Rancho NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 32 Rio Rancho NM Massage Therapist
## 33 Rio Rancho NM Mobile Massage Therapist
## 34 Rio Rancho NM Licensed Massage Therapist
## 35 Rio Rancho NM Massage Therapist-Massage Envy Ventura Place
## 36 Rio Rancho NM Licensed Massage Therapist
## 37 Rio Rancho NM Massage Therapist Full-time
## 38 Rio Rancho NM Massage Therapist Part-time
## 39 Rio Rancho NM LMTs
## 40 Rio Rancho NM Albuquerque Massage Therapy Program Supervisor
## 41 Rio Rancho NM Licensed Massage Therapist
## 42 Rio Rancho NM Licensed Massage Therapist
## 43 Rio Rancho NM Massage Therapist - Independent Contractor
## 44 Rio Rancho NM Massage Therapist - Independent Contractor
## 45 Rio Rancho NM LICENSED MASSAGE THERAPIST
## 46 Rio Rancho NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 47 Rio Rancho NM Massage Therapist
## 48 Rio Rancho NM Mobile Massage Therapist
## 49 Rio Rancho NM Licensed Massage Therapist
## 50 Rio Rancho NM Massage Therapist-Massage Envy Ventura Place
## 51 Rio Rancho NM Massage Therapist Full-time
## 52 Rio Rancho NM Licensed Massage Therapist
## 53 Rio Rancho NM Massage Therapist Part-time
## 54 Rio Rancho NM LMTs
## 55 Rio Rancho NM Albuquerque Massage Therapy Program Supervisor
## 56 Rio Rancho NM Licensed Massage Therapist
## 57 Rio Rancho NM Licensed Massage Therapist
## 58 Rio Rancho NM Massage Therapist - Independent Contractor
## 59 Rio Rancho NM Massage Therapist - Independent Contractor
## 60 Rio Rancho NM LICENSED MASSAGE THERAPIST
## 61 Rio Rancho NM MASSAGE THERAPIST (ABHYANGA) On-Call
## 62 Rio Rancho NM Massage Therapist
## 63 Rio Rancho NM Mobile Massage Therapist
## 64 Rio Rancho NM Licensed Massage Therapist
## 65 Rio Rancho NM Massage Therapist-Massage Envy Ventura Place
## 66 Rio Rancho NM Massage Therapist Full-time
## 67 Rio Rancho NM Licensed Massage Therapist
## 68 Rio Rancho NM Massage Therapist Part-time
## 69 Rio Rancho NM LMTs
## HiringAgency
## 1 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 2 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 3 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 4 Massage Envy3.2Rio Rancho, NM 87124+1 location
## 5 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 6 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 7 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 8 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 9 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 10 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 11 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 12 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 13 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 14 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 15 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 16 Indo-Pak Massage TherapyAlbuquerque, NM
## 17 Massage Envy3.2Albuquerque, NM 87122
## 18 Massage Envy3.2Albuquerque, NM 87122
## 19 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 20 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 21 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 22 Body and Mind Wellness CenterAlbuquerque, NM 87110 (Uptown area)
## 23 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 24 Elements Massage3.6Albuquerque, NM 87122 (Countrywood area)
## 25 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 26 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 27 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 28 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 29 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 30 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 31 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 32 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 33 Indo-Pak Massage TherapyAlbuquerque, NM
## 34 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 35 Massage Envy3.2Albuquerque, NM 87122
## 36 Massage Envy3.2Albuquerque, NM 87122
## 37 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 38 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 39 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 40 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 41 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 42 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 43 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 44 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 45 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 46 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 47 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 48 Indo-Pak Massage TherapyAlbuquerque, NM
## 49 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 50 Massage Envy3.2Albuquerque, NM 87122
## 51 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 52 Massage Envy3.2Albuquerque, NM 87122
## 53 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 54 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 55 IntelliTec College3.1Albuquerque, NM 87109 (Academy Acres North area)
## 56 Elements3.6Albuquerque, NM 87122 (Countrywood area)
## 57 Apollo Chiropractic Health & Wellness, LLCAlbuquerque, NM 87120 (Taylor Ranch area)
## 58 ZenMassageAlbuquerque, NM 87110 (Uptown area)
## 59 Indo-Pak Massage TherapyAlbuquerque, NM•Remote work available
## 60 The remedy day spa5.0Albuquerque, NM 87106 (University Hts area)
## 61 THE AYURVEDIC INSTITUTE3.3Albuquerque, NM 87112 (Enchanted Park area)
## 62 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## 63 Indo-Pak Massage TherapyAlbuquerque, NM
## 64 Patty's Salon and Day SpaAlbuquerque, NM 87108 (Fair West area)
## 65 Massage Envy3.2Albuquerque, NM 87122
## 66 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 67 Massage Envy3.2Albuquerque, NM 87122
## 68 Massage Envy3.2Albuquerque, NM 87120 (Taylor Ranch area)
## 69 The Back Porch Day SpaAlbuquerque, NM 87112 (North Eastern area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 9 19 70 39493 45592
## 2 23 19 70 39493 45592
## 3 15 19 70 39493 45592
## 4 30 19 70 39493 45592
## 5 30 19 70 39493 45592
## 6 30 19 70 39493 45592
## 7 30 19 70 39493 45592
## 8 9 19 70 39493 45592
## 9 5 19 70 39493 45592
## 10 24 19 70 39493 45592
## 11 30 19 70 39493 45592
## 12 5 19 70 39493 45592
## 13 24 19 70 39493 45592
## 14 30 19 70 39493 45592
## 15 22 19 70 39493 45592
## 16 30 19 70 39493 45592
## 17 30 19 70 39493 45592
## 18 30 19 70 39493 45592
## 19 30 19 70 39493 45592
## 20 30 19 70 39493 45592
## 21 22 19 70 39493 45592
## 22 23 19 70 39493 45592
## 23 15 19 70 39493 45592
## 24 9 19 70 39493 45592
## 25 30 19 70 39493 45592
## 26 30 19 70 39493 45592
## 27 30 19 70 39493 45592
## 28 9 19 70 39493 45592
## 29 5 19 70 39493 45592
## 30 24 19 70 39493 45592
## 31 30 19 70 39493 45592
## 32 22 19 70 39493 45592
## 33 30 19 70 39493 45592
## 34 15 19 70 39493 45592
## 35 30 19 70 39493 45592
## 36 30 19 70 39493 45592
## 37 30 19 70 39493 45592
## 38 30 19 70 39493 45592
## 39 22 19 70 39493 45592
## 40 30 19 70 39493 45592
## 41 30 19 70 39493 45592
## 42 30 19 70 39493 45592
## 43 9 19 70 39493 45592
## 44 5 19 70 39493 45592
## 45 24 19 70 39493 45592
## 46 30 19 70 39493 45592
## 47 22 19 70 39493 45592
## 48 30 19 70 39493 45592
## 49 15 19 70 39493 45592
## 50 30 19 70 39493 45592
## 51 30 19 70 39493 45592
## 52 30 19 70 39493 45592
## 53 30 19 70 39493 45592
## 54 22 19 70 39493 45592
## 55 30 19 70 39493 45592
## 56 30 19 70 39493 45592
## 57 30 19 70 39493 45592
## 58 9 19 70 39493 45592
## 59 5 19 70 39493 45592
## 60 24 19 70 39493 45592
## 61 30 19 70 39493 45592
## 62 22 19 70 39493 45592
## 63 30 19 70 39493 45592
## 64 15 19 70 39493 45592
## 65 30 19 70 39493 45592
## 66 30 19 70 39493 45592
## 67 30 19 70 39493 45592
## 68 30 19 70 39493 45592
## 69 22 19 70 39493 45592
New York New York, Buffalo, Rochester
getIndeedJobData5pages('massage therapist', 'New York','NY')
## Warning in getIndeedJobData5pages("massage therapist", "New York", "NY"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "New York", "NY"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT): PAID TRAINING
## 3 Massage Therapist - Independent Contractor
## 4 Massage Therapist, Naturopathica Chelsea
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Massage Therapist - Independent Contractor
## 8 Medical Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist
## 14 LMT / Massage Therapist / Wellness Services Professionals
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist | Bliss Spa (UNCAPPED COMMISSIONS...
## 17 Massage Therapist Manhattan
## 18 Stretch Therapist / Fitness Professional / Personal Trainer...
## 19 Stretch Therapist / Fitness Professional / Personal Trainer...
## 20 DUAL LICENSED ESTHETICIAN & MASSAGE THERAPIST
## 21 Licensed Massage Therapists
## 22 Lead Massage Therapist
## 23 Licensed Massage Therapist
## 24 Experienced Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist (LMT)
## 28 Massage Therapist, Naturopathica Chelsea
## 29 Massage Therapist - Independent Contractor
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT): PAID TRAINING
## 32 LMT / Massage Therapist / Wellness Services Professionals
## 33 Lead Massage Therapist
## 34 Licensed Massage Therapist
## 35 Experienced Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 NY Licensed Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Licensed Massage Therapists
## 40 NYS Licensed Massage Therapist - Fashion District
## 41 Licensed Massage Therapist
## 42 Physical Therapist Assistant, Massage Therapist
## 43 NY Licensed Massage Therapist
## 44 Licensed Massage Therapist | Bliss Spa (UNCAPPED COMMISSIONS...
## 45 Massage Therapist Manhattan
## 46 Stretch Therapist / Fitness Professional / Personal Trainer...
## 47 Stretch Therapist / Fitness Professional / Personal Trainer...
## 48 DUAL LICENSED ESTHETICIAN & MASSAGE THERAPIST
## 49 Licensed Massage Therapists
## 50 Lead Massage Therapist
## 51 Licensed Massage Therapist
## 52 Experienced Licensed Massage Therapist
## 53 Stretch Technician
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapists
## 56 NYS Licensed Massage Therapist - Fashion District
## 57 Physical Therapist Assistant, Massage Therapist
## 58 NY Licensed Massage Therapist
## 59 Licensed Massage Therapist | Bliss Spa (UNCAPPED COMMISSIONS...
## 60 Massage Therapist Manhattan
## 61 Stretch Therapist / Fitness Professional / Personal Trainer...
## 62 Stretch Therapist / Fitness Professional / Personal Trainer...
## 63 DUAL LICENSED ESTHETICIAN & MASSAGE THERAPIST
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapists
## 66 Lead Massage Therapist
## 67 Experienced Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$40 - $80 an hour $40 - $80 40 80
## 2 \n$90 - $125 an hour $90 - $125 90 125
## 3 \n$22 - $81 an hour $22 - $81 22 81
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$60 - $65 an hour $60 - $65 60 65
## 6 \n$50 - $90 an hour $50 - $90 50 90
## 7 \n$22 - $80 an hour $22 - $80 22 80
## 8 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 9 \nUp to $32 an hour $32 32 NA
## 10 \n$25 - $30 an hour $25 - $30 25 30
## 11 \n$22 - $81 an hour $22 - $81 22 81
## 12 \n$90 - $125 an hour $90 - $125 90 125
## 13 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 14 \n$40 - $80 an hour $40 - $80 40 80
## 15 \n$22 - $80 an hour $22 - $80 22 80
## 16 \nUp to $32 an hour $32 32 NA
## 17 \n$25 - $30 an hour $25 - $30 25 30
## 18 \nUp to $32 an hour $32 32 NA
## 19 \n$25 - $30 an hour $25 - $30 25 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 32 65 4506.789 7388.743 22
## 2 32 65 4506.789 7388.743 22
## 3 32 65 4506.789 7388.743 22
## 4 32 65 4506.789 7388.743 22
## 5 32 65 4506.789 7388.743 22
## 6 32 65 4506.789 7388.743 22
## 7 32 65 4506.789 7388.743 22
## 8 32 65 4506.789 7388.743 22
## 9 32 65 4506.789 7388.743 22
## 10 32 65 4506.789 7388.743 22
## 11 32 65 4506.789 7388.743 22
## 12 32 65 4506.789 7388.743 22
## 13 32 65 4506.789 7388.743 22
## 14 32 65 4506.789 7388.743 22
## 15 32 65 4506.789 7388.743 22
## 16 32 65 4506.789 7388.743 22
## 17 32 65 4506.789 7388.743 22
## 18 32 65 4506.789 7388.743 22
## 19 32 65 4506.789 7388.743 22
## maximumMaxSalary
## 1 80000
## 2 80000
## 3 80000
## 4 80000
## 5 80000
## 6 80000
## 7 80000
## 8 80000
## 9 80000
## 10 80000
## 11 80000
## 12 80000
## 13 80000
## 14 80000
## 15 80000
## 16 80000
## 17 80000
## 18 80000
## 19 80000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 20
## 3 Just posted
## 4 Today
## 5 24
## 6 30
## 7 5
## 8 9
## 9 30
## 10 30
## 11 30
## 12 30
## 13 30
## 14 1
## 15 8
## 16 6
## 17 30
## 18 30
## 19 30
## 20 7
## 21 27
## 22 30
## 23 30
## 24 30
## 25 24
## 26 30
## 27 30
## 28 Today
## 29 Just posted
## 30 8
## 31 20
## 32 1
## 33 30
## 34 30
## 35 30
## 36 30
## 37 Today
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 Today
## 44 6
## 45 30
## 46 30
## 47 30
## 48 7
## 49 27
## 50 30
## 51 30
## 52 30
## 53 6
## 54 30
## 55 30
## 56 30
## 57 30
## 58 Today
## 59 6
## 60 30
## 61 30
## 62 30
## 63 7
## 64 30
## 65 27
## 66 30
## 67 30
##
## [[4]]
## HiringAgency
## 1 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 2 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 3 StressKnotNycNew York, NY
## 4 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 5 Soothe3.7Queens, NY
## 6 Massage Envy of BaysideBayside, NY 11361
## 7 Indo-Pak Massage TherapyNew York, NY+5 locations•Remote work available
## 8 Kindness Unlimited Therapy ServicesQueens, NY
## 9 Skin Spa New YorkNew York, NY
## 10 Nail Kitchen llcBrooklyn, NY 11249 (Chelsea area)
## 11 WTS International3.3New York, NY 10013 (SoHo area)
## 12 The Wright Fit3.6New York, NY
## 13 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 14 FitLoreNew York, NY 10065 (Upper East Side area)
## 15 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 16 One Spa World3.8New York, NY 10019 (Midtown area)
## 17 Massage Envy3.2New York, NY 10065 (Upper East Side area)+3 locations
## 18 LYMBRNew York, NY 10028 (Upper East Side area)
## 19 LYMBRNew York, NY 10113 (Chelsea area)
## 20 Temple Concierge SpaNew York, NY 10019 (Columbus Circle area)
## 21 Remedi SpaStaten Island, NY
## 22 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 23 Hudson Medical GroupNew York, NY
## 24 PRATIMA Ayurvedic SpaNew York, NY
## 25 Soothe3.7Queens, NY
## 26 Massage Envy of Forest HillsQueens, NY
## 27 Massage Envy of BaysideBayside, NY 11361
## 28 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 29 StressKnotNycNew York, NY
## 30 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 31 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 32 FitLoreNew York, NY 10065 (Upper East Side area)
## 33 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 34 Hudson Medical GroupNew York, NY
## 35 PRATIMA Ayurvedic SpaNew York, NY
## 36 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 37 Hand and Stone Spa3.0New York, NY 10261
## 38 Massage Envy of BaysideBayside, NY 11361
## 39 Medwell Spa and Yoga StudioNew York, NY
## 40 Skin Spa New YorkNew York, NY 10018 (Clinton area)
## 41 Massage Envy of Forest HillsQueens, NY
## 42 UNI Health Medical PCBrooklyn, NY 11210
## 43 Hand and Stone Spa3.0New York, NY 10261
## 44 One Spa World3.8New York, NY 10019 (Midtown area)
## 45 Massage Envy3.2New York, NY 10065 (Upper East Side area)+3 locations
## 46 LYMBRNew York, NY 10028 (Upper East Side area)
## 47 LYMBRNew York, NY 10113 (Chelsea area)
## 48 Temple Concierge SpaNew York, NY 10019 (Columbus Circle area)
## 49 Remedi SpaStaten Island, NY
## 50 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 51 Hudson Medical GroupNew York, NY
## 52 PRATIMA Ayurvedic SpaNew York, NY
## 53 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 54 Massage Envy of Forest HillsQueens, NY
## 55 Medwell Spa and Yoga StudioNew York, NY
## 56 Skin Spa New YorkNew York, NY 10018 (Clinton area)
## 57 UNI Health Medical PCBrooklyn, NY 11210
## 58 Hand and Stone Spa3.0New York, NY 10261
## 59 One Spa World3.8New York, NY 10019 (Midtown area)
## 60 Massage Envy3.2New York, NY 10065 (Upper East Side area)+3 locations
## 61 LYMBRNew York, NY 10028 (Upper East Side area)
## 62 LYMBRNew York, NY 10113 (Chelsea area)
## 63 Temple Concierge SpaNew York, NY 10019 (Columbus Circle area)
## 64 Hudson Medical GroupNew York, NY
## 65 Remedi SpaStaten Island, NY
## 66 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 67 PRATIMA Ayurvedic SpaNew York, NY
##
## [[5]]
## Salary salary minSalary maxSalary
## 8 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## 13 \n$40,000 - $80,000 a year $40000 - $80000 40000 80000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 8 40000 80000 40000 80000 40000
## 13 40000 80000 40000 80000 40000
## maximumMaxSalary
## 8 80000
## 13 80000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$40 - $80 an hour $40 - $80 40 80 32
## 2 \n$90 - $125 an hour $90 - $125 90 125 32
## 3 \n$22 - $81 an hour $22 - $81 22 81 32
## 5 \n$60 - $65 an hour $60 - $65 60 65 32
## 6 \n$50 - $90 an hour $50 - $90 50 90 32
## 7 \n$22 - $80 an hour $22 - $80 22 80 32
## 9 \nUp to $32 an hour $32 32 NA 32
## 10 \n$25 - $30 an hour $25 - $30 25 30 32
## 11 \n$22 - $81 an hour $22 - $81 22 81 32
## 12 \n$90 - $125 an hour $90 - $125 90 125 32
## 14 \n$40 - $80 an hour $40 - $80 40 80 32
## 15 \n$22 - $80 an hour $22 - $80 22 80 32
## 16 \nUp to $32 an hour $32 32 NA 32
## 17 \n$25 - $30 an hour $25 - $30 25 30 32
## 18 \nUp to $32 an hour $32 32 NA 32
## 19 \n$25 - $30 an hour $25 - $30 25 30 32
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 80 39.3125 75.15385 22 125
## 2 80 39.3125 75.15385 22 125
## 3 80 39.3125 75.15385 22 125
## 5 80 39.3125 75.15385 22 125
## 6 80 39.3125 75.15385 22 125
## 7 80 39.3125 75.15385 22 125
## 9 80 39.3125 75.15385 22 125
## 10 80 39.3125 75.15385 22 125
## 11 80 39.3125 75.15385 22 125
## 12 80 39.3125 75.15385 22 125
## 14 80 39.3125 75.15385 22 125
## 15 80 39.3125 75.15385 22 125
## 16 80 39.3125 75.15385 22 125
## 17 80 39.3125 75.15385 22 125
## 18 80 39.3125 75.15385 22 125
## 19 80 39.3125 75.15385 22 125
##
## [[7]]
## city state
## 1 New York NY
## 2 New York NY
## 3 New York NY
## 4 New York NY
## 5 New York NY
## 6 New York NY
## 7 New York NY
## 8 New York NY
## 9 New York NY
## 10 New York NY
## 11 New York NY
## 12 New York NY
## 13 New York NY
## 14 New York NY
## 15 New York NY
## 16 New York NY
## 17 New York NY
## 18 New York NY
## 19 New York NY
## 20 New York NY
## 21 New York NY
## 22 New York NY
## 23 New York NY
## 24 New York NY
## 25 New York NY
## 26 New York NY
## 27 New York NY
## 28 New York NY
## 29 New York NY
## 30 New York NY
## 31 New York NY
## 32 New York NY
## 33 New York NY
## 34 New York NY
## 35 New York NY
## 36 New York NY
## 37 New York NY
## 38 New York NY
## 39 New York NY
## 40 New York NY
## 41 New York NY
## 42 New York NY
## 43 New York NY
## 44 New York NY
## 45 New York NY
## 46 New York NY
## 47 New York NY
## 48 New York NY
## 49 New York NY
## 50 New York NY
## 51 New York NY
## 52 New York NY
## 53 New York NY
## 54 New York NY
## 55 New York NY
## 56 New York NY
## 57 New York NY
## 58 New York NY
## 59 New York NY
## 60 New York NY
## 61 New York NY
## 62 New York NY
## 63 New York NY
## 64 New York NY
## 65 New York NY
## 66 New York NY
## 67 New York NY
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT): PAID TRAINING
## 3 Massage Therapist - Independent Contractor
## 4 Massage Therapist, Naturopathica Chelsea
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist (LMT)
## 7 Massage Therapist - Independent Contractor
## 8 Medical Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist
## 14 LMT / Massage Therapist / Wellness Services Professionals
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist | Bliss Spa (UNCAPPED COMMISSIONS...
## 17 Massage Therapist Manhattan
## 18 Stretch Therapist / Fitness Professional / Personal Trainer...
## 19 Stretch Therapist / Fitness Professional / Personal Trainer...
## 20 DUAL LICENSED ESTHETICIAN & MASSAGE THERAPIST
## 21 Licensed Massage Therapists
## 22 Lead Massage Therapist
## 23 Licensed Massage Therapist
## 24 Experienced Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist (LMT)
## 28 Massage Therapist, Naturopathica Chelsea
## 29 Massage Therapist - Independent Contractor
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (LMT): PAID TRAINING
## 32 LMT / Massage Therapist / Wellness Services Professionals
## 33 Lead Massage Therapist
## 34 Licensed Massage Therapist
## 35 Experienced Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 NY Licensed Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Licensed Massage Therapists
## 40 NYS Licensed Massage Therapist - Fashion District
## 41 Licensed Massage Therapist
## 42 Physical Therapist Assistant, Massage Therapist
## 43 NY Licensed Massage Therapist
## 44 Licensed Massage Therapist | Bliss Spa (UNCAPPED COMMISSIONS...
## 45 Massage Therapist Manhattan
## 46 Stretch Therapist / Fitness Professional / Personal Trainer...
## 47 Stretch Therapist / Fitness Professional / Personal Trainer...
## 48 DUAL LICENSED ESTHETICIAN & MASSAGE THERAPIST
## 49 Licensed Massage Therapists
## 50 Lead Massage Therapist
## 51 Licensed Massage Therapist
## 52 Experienced Licensed Massage Therapist
## 53 Stretch Technician
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapists
## 56 NYS Licensed Massage Therapist - Fashion District
## 57 Physical Therapist Assistant, Massage Therapist
## 58 NY Licensed Massage Therapist
## 59 Licensed Massage Therapist | Bliss Spa (UNCAPPED COMMISSIONS...
## 60 Massage Therapist Manhattan
## 61 Stretch Therapist / Fitness Professional / Personal Trainer...
## 62 Stretch Therapist / Fitness Professional / Personal Trainer...
## 63 DUAL LICENSED ESTHETICIAN & MASSAGE THERAPIST
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapists
## 66 Lead Massage Therapist
## 67 Experienced Licensed Massage Therapist
## HiringAgency
## 1 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 2 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 3 StressKnotNycNew York, NY
## 4 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 5 Soothe3.7Queens, NY
## 6 Massage Envy of BaysideBayside, NY 11361
## 7 Indo-Pak Massage TherapyNew York, NY+5 locations•Remote work available
## 8 Kindness Unlimited Therapy ServicesQueens, NY
## 9 Skin Spa New YorkNew York, NY
## 10 Nail Kitchen llcBrooklyn, NY 11249 (Chelsea area)
## 11 WTS International3.3New York, NY 10013 (SoHo area)
## 12 The Wright Fit3.6New York, NY
## 13 Manhattan Total Health3.6New York, NY 10017 (Turtle Bay area)
## 14 FitLoreNew York, NY 10065 (Upper East Side area)
## 15 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 16 One Spa World3.8New York, NY 10019 (Midtown area)
## 17 Massage Envy3.2New York, NY 10065 (Upper East Side area)+3 locations
## 18 LYMBRNew York, NY 10028 (Upper East Side area)
## 19 LYMBRNew York, NY 10113 (Chelsea area)
## 20 Temple Concierge SpaNew York, NY 10019 (Columbus Circle area)
## 21 Remedi SpaStaten Island, NY
## 22 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 23 Hudson Medical GroupNew York, NY
## 24 PRATIMA Ayurvedic SpaNew York, NY
## 25 Soothe3.7Queens, NY
## 26 Massage Envy of Forest HillsQueens, NY
## 27 Massage Envy of BaysideBayside, NY 11361
## 28 NaturopathicaNew York, NY 10001 (Flatiron District area)
## 29 StressKnotNycNew York, NY
## 30 Aire Ancient BathsNew York, NY 10013 (Tribeca area)
## 31 A Bathhouse1.5Brooklyn, NY 11249 (Chelsea area)
## 32 FitLoreNew York, NY 10065 (Upper East Side area)
## 33 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 34 Hudson Medical GroupNew York, NY
## 35 PRATIMA Ayurvedic SpaNew York, NY
## 36 New York Health & Racquet ClubNew York, NY 10022 (Midtown area)
## 37 Hand and Stone Spa3.0New York, NY 10261
## 38 Massage Envy of BaysideBayside, NY 11361
## 39 Medwell Spa and Yoga StudioNew York, NY
## 40 Skin Spa New YorkNew York, NY 10018 (Clinton area)
## 41 Massage Envy of Forest HillsQueens, NY
## 42 UNI Health Medical PCBrooklyn, NY 11210
## 43 Hand and Stone Spa3.0New York, NY 10261
## 44 One Spa World3.8New York, NY 10019 (Midtown area)
## 45 Massage Envy3.2New York, NY 10065 (Upper East Side area)+3 locations
## 46 LYMBRNew York, NY 10028 (Upper East Side area)
## 47 LYMBRNew York, NY 10113 (Chelsea area)
## 48 Temple Concierge SpaNew York, NY 10019 (Columbus Circle area)
## 49 Remedi SpaStaten Island, NY
## 50 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 51 Hudson Medical GroupNew York, NY
## 52 PRATIMA Ayurvedic SpaNew York, NY
## 53 Restore Hyper WellnessNew York, NY 10021 (Upper East Side area)
## 54 Massage Envy of Forest HillsQueens, NY
## 55 Medwell Spa and Yoga StudioNew York, NY
## 56 Skin Spa New YorkNew York, NY 10018 (Clinton area)
## 57 UNI Health Medical PCBrooklyn, NY 11210
## 58 Hand and Stone Spa3.0New York, NY 10261
## 59 One Spa World3.8New York, NY 10019 (Midtown area)
## 60 Massage Envy3.2New York, NY 10065 (Upper East Side area)+3 locations
## 61 LYMBRNew York, NY 10028 (Upper East Side area)
## 62 LYMBRNew York, NY 10113 (Chelsea area)
## 63 Temple Concierge SpaNew York, NY 10019 (Columbus Circle area)
## 64 Hudson Medical GroupNew York, NY
## 65 Remedi SpaStaten Island, NY
## 66 Hand and Stone3.0Staten Island, NY 10309 (Woodrow area)
## 67 PRATIMA Ayurvedic SpaNew York, NY
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 22 125 40000 80000
## 2 20 22 125 40000 80000
## 3 Just posted 22 125 40000 80000
## 4 Today 22 125 40000 80000
## 5 24 22 125 40000 80000
## 6 30 22 125 40000 80000
## 7 5 22 125 40000 80000
## 8 9 22 125 40000 80000
## 9 30 22 125 40000 80000
## 10 30 22 125 40000 80000
## 11 30 22 125 40000 80000
## 12 30 22 125 40000 80000
## 13 30 22 125 40000 80000
## 14 1 22 125 40000 80000
## 15 8 22 125 40000 80000
## 16 6 22 125 40000 80000
## 17 30 22 125 40000 80000
## 18 30 22 125 40000 80000
## 19 30 22 125 40000 80000
## 20 7 22 125 40000 80000
## 21 27 22 125 40000 80000
## 22 30 22 125 40000 80000
## 23 30 22 125 40000 80000
## 24 30 22 125 40000 80000
## 25 24 22 125 40000 80000
## 26 30 22 125 40000 80000
## 27 30 22 125 40000 80000
## 28 Today 22 125 40000 80000
## 29 Just posted 22 125 40000 80000
## 30 8 22 125 40000 80000
## 31 20 22 125 40000 80000
## 32 1 22 125 40000 80000
## 33 30 22 125 40000 80000
## 34 30 22 125 40000 80000
## 35 30 22 125 40000 80000
## 36 30 22 125 40000 80000
## 37 Today 22 125 40000 80000
## 38 30 22 125 40000 80000
## 39 30 22 125 40000 80000
## 40 30 22 125 40000 80000
## 41 30 22 125 40000 80000
## 42 30 22 125 40000 80000
## 43 Today 22 125 40000 80000
## 44 6 22 125 40000 80000
## 45 30 22 125 40000 80000
## 46 30 22 125 40000 80000
## 47 30 22 125 40000 80000
## 48 7 22 125 40000 80000
## 49 27 22 125 40000 80000
## 50 30 22 125 40000 80000
## 51 30 22 125 40000 80000
## 52 30 22 125 40000 80000
## 53 6 22 125 40000 80000
## 54 30 22 125 40000 80000
## 55 30 22 125 40000 80000
## 56 30 22 125 40000 80000
## 57 30 22 125 40000 80000
## 58 Today 22 125 40000 80000
## 59 6 22 125 40000 80000
## 60 30 22 125 40000 80000
## 61 30 22 125 40000 80000
## 62 30 22 125 40000 80000
## 63 7 22 125 40000 80000
## 64 30 22 125 40000 80000
## 65 27 22 125 40000 80000
## 66 30 22 125 40000 80000
## 67 30 22 125 40000 80000
getIndeedJobData5pages('massage therapist', 'Buffalo','NY')
## Warning in getIndeedJobData5pages("massage therapist", "Buffalo", "NY"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Buffalo", "NY"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Buffalo", "NY"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist - Independent Contractor
## 3 Licensed Massage Therapist (LMT)
## 4 SIGN ON BONUS** Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist LMT
## 7 Massage Therapist SCH
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist - Independent Contractor
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 NYS Licensed/Registered/Insured Massage Therapist
## 15 NYS Licensed/Registered/Insured Massage Therapist
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist
## 18 Massage Therapist SCH
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist - Independent Contractor
## 22 Massage Therapist
## 23 Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapy
## 26 Licensed Massage Therapist
## 27 SIGN ON BONUS** Licensed Massage Therapist
## 28 Massage Therapist - Independent Contractor
## 29 Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 NYS Licensed/Registered/Insured Massage Therapist
## 32 Licensed Massage Therapist (LMT)
## 33 SIGN ON BONUS** Licensed Massage Therapist
## 34 Licensed Massage Therapist LMT
## 35 Massage Therapist SCH
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist (LMT)
## 38 Licensed Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 Massage Therapist
## 41 Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapy
## 44 Massage Therapist SCH
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist (LMT)
## 47 Massage Therapist - Independent Contractor
## 48 Massage Therapist
## 49 Massage Therapist
## 50 Licensed Massage Therapist
## 51 Massage Therapy
## 52 Licensed Massage Therapist
## 53 SIGN ON BONUS** Licensed Massage Therapist
## 54 Massage Therapist
## 55 Massage Therapist - Independent Contractor
## 56 NYS Licensed/Registered/Insured Massage Therapist
## 57 Licensed Massage Therapist (LMT)
## 58 Massage Therapist SCH
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist (LMT)
## 61 Massage Therapist - Independent Contractor
## 62 Massage Therapist
## 63 Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapy
## 66 Licensed Massage Therapist
## 67 SIGN ON BONUS** Licensed Massage Therapist
## 68 Massage Therapist
## 69 Massage Therapist - Independent Contractor
## 70 NYS Licensed/Registered/Insured Massage Therapist
## 71 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$28 - $35 an hour $28 - $35 28.0 35
## 2 \n$25 - $30 an hour $25 - $30 25.0 30
## 3 \n$25 - $40 an hour $25 - $40 25.0 40
## 4 \n$32,000 a year $32000 32000.0 NA
## 5 \n$12 - $55 an hour $12 - $55 12.0 55
## 6 \n$20 - $30 an hour $20 - $30 20.0 30
## 7 \n$24.50 an hour $24.50 24.5 NA
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 9 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 10 \n$32,000 a year $32000 32000.0 NA
## 11 \n$17 - $18 an hour $17 - $18 17.0 18
## 12 \n$25 - $40 an hour $25 - $40 25.0 40
## 13 \n$28 - $35 an hour $28 - $35 28.0 35
## 14 \n$20 - $30 an hour $20 - $30 20.0 30
## 15 \n$24.50 an hour $24.50 24.5 NA
## 16 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 17 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 18 \n$32,000 a year $32000 32000.0 NA
## 19 \n$17 - $18 an hour $17 - $18 17.0 18
## 20 \n$20 - $30 an hour $20 - $30 20.0 30
## 21 \n$32,000 a year $32000 32000.0 NA
## 22 \n$25 - $30 an hour $25 - $30 25.0 30
## 23 \n$28 - $35 an hour $28 - $35 28.0 35
## 24 \n$25 - $30 an hour $25 - $30 25.0 30
## 25 \n$25 - $40 an hour $25 - $40 25.0 40
## 26 \n$12 - $55 an hour $12 - $55 12.0 55
## 27 \n$20 - $30 an hour $20 - $30 20.0 30
## 28 \n$24.50 an hour $24.50 24.5 NA
## 29 \n$32,000 a year $32000 32000.0 NA
## 30 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 31 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 32 \n$32,000 a year $32000 32000.0 NA
## 33 \n$17 - $18 an hour $17 - $18 17.0 18
## 34 \n$20 - $30 an hour $20 - $30 20.0 30
## 35 \n$20 - $30 an hour $20 - $30 20.0 30
## 36 \n$24.50 an hour $24.50 24.5 NA
## 37 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 38 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 39 \n$32,000 a year $32000 32000.0 NA
## 40 \n$17 - $18 an hour $17 - $18 17.0 18
## 41 \n$20 - $30 an hour $20 - $30 20.0 30
## 42 \n$32,000 a year $32000 32000.0 NA
## 43 \n$28 - $35 an hour $28 - $35 28.0 35
## 44 \n$25 - $30 an hour $25 - $30 25.0 30
## 45 \n$25 - $40 an hour $25 - $40 25.0 40
## 46 \n$20 - $30 an hour $20 - $30 20.0 30
## 47 \n$24.50 an hour $24.50 24.5 NA
## 48 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 49 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 50 \n$32,000 a year $32000 32000.0 NA
## 51 \n$17 - $18 an hour $17 - $18 17.0 18
## 52 \n$20 - $30 an hour $20 - $30 20.0 30
## 53 \n$32,000 a year $32000 32000.0 NA
## 54 \n$28 - $35 an hour $28 - $35 28.0 35
## 55 \n$25 - $30 an hour $25 - $30 25.0 30
## 56 \n$25 - $40 an hour $25 - $40 25.0 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 30 9300.027 8575.222 12
## 2 25 30 9300.027 8575.222 12
## 3 25 30 9300.027 8575.222 12
## 4 25 30 9300.027 8575.222 12
## 5 25 30 9300.027 8575.222 12
## 6 25 30 9300.027 8575.222 12
## 7 25 30 9300.027 8575.222 12
## 8 25 30 9300.027 8575.222 12
## 9 25 30 9300.027 8575.222 12
## 10 25 30 9300.027 8575.222 12
## 11 25 30 9300.027 8575.222 12
## 12 25 30 9300.027 8575.222 12
## 13 25 30 9300.027 8575.222 12
## 14 25 30 9300.027 8575.222 12
## 15 25 30 9300.027 8575.222 12
## 16 25 30 9300.027 8575.222 12
## 17 25 30 9300.027 8575.222 12
## 18 25 30 9300.027 8575.222 12
## 19 25 30 9300.027 8575.222 12
## 20 25 30 9300.027 8575.222 12
## 21 25 30 9300.027 8575.222 12
## 22 25 30 9300.027 8575.222 12
## 23 25 30 9300.027 8575.222 12
## 24 25 30 9300.027 8575.222 12
## 25 25 30 9300.027 8575.222 12
## 26 25 30 9300.027 8575.222 12
## 27 25 30 9300.027 8575.222 12
## 28 25 30 9300.027 8575.222 12
## 29 25 30 9300.027 8575.222 12
## 30 25 30 9300.027 8575.222 12
## 31 25 30 9300.027 8575.222 12
## 32 25 30 9300.027 8575.222 12
## 33 25 30 9300.027 8575.222 12
## 34 25 30 9300.027 8575.222 12
## 35 25 30 9300.027 8575.222 12
## 36 25 30 9300.027 8575.222 12
## 37 25 30 9300.027 8575.222 12
## 38 25 30 9300.027 8575.222 12
## 39 25 30 9300.027 8575.222 12
## 40 25 30 9300.027 8575.222 12
## 41 25 30 9300.027 8575.222 12
## 42 25 30 9300.027 8575.222 12
## 43 25 30 9300.027 8575.222 12
## 44 25 30 9300.027 8575.222 12
## 45 25 30 9300.027 8575.222 12
## 46 25 30 9300.027 8575.222 12
## 47 25 30 9300.027 8575.222 12
## 48 25 30 9300.027 8575.222 12
## 49 25 30 9300.027 8575.222 12
## 50 25 30 9300.027 8575.222 12
## 51 25 30 9300.027 8575.222 12
## 52 25 30 9300.027 8575.222 12
## 53 25 30 9300.027 8575.222 12
## 54 25 30 9300.027 8575.222 12
## 55 25 30 9300.027 8575.222 12
## 56 25 30 9300.027 8575.222 12
## maximumMaxSalary
## 1 50000
## 2 50000
## 3 50000
## 4 50000
## 5 50000
## 6 50000
## 7 50000
## 8 50000
## 9 50000
## 10 50000
## 11 50000
## 12 50000
## 13 50000
## 14 50000
## 15 50000
## 16 50000
## 17 50000
## 18 50000
## 19 50000
## 20 50000
## 21 50000
## 22 50000
## 23 50000
## 24 50000
## 25 50000
## 26 50000
## 27 50000
## 28 50000
## 29 50000
## 30 50000
## 31 50000
## 32 50000
## 33 50000
## 34 50000
## 35 50000
## 36 50000
## 37 50000
## 38 50000
## 39 50000
## 40 50000
## 41 50000
## 42 50000
## 43 50000
## 44 50000
## 45 50000
## 46 50000
## 47 50000
## 48 50000
## 49 50000
## 50 50000
## 51 50000
## 52 50000
## 53 50000
## 54 50000
## 55 50000
## 56 50000
##
## [[3]]
## date_daysAgo
## 1 4
## 2 Today
## 3 30
## 4 30
## 5 30
## 6 Just posted
## 7 30
## 8 10
## 9 8
## 10 15
## 11 7
## 12 30
## 13 21
## 14 3
## 15 3
## 16 30
## 17 4
## 18 30
## 19 10
## 20 8
## 21 15
## 22 7
## 23 30
## 24 21
## 25 5
## 26 30
## 27 30
## 28 Today
## 29 4
## 30 Today
## 31 3
## 32 30
## 33 30
## 34 Just posted
## 35 30
## 36 10
## 37 8
## 38 30
## 39 15
## 40 7
## 41 30
## 42 21
## 43 5
## 44 30
## 45 10
## 46 8
## 47 15
## 48 7
## 49 30
## 50 21
## 51 5
## 52 30
## 53 30
## 54 4
## 55 Today
## 56 3
## 57 30
## 58 30
## 59 10
## 60 8
## 61 15
## 62 7
## 63 30
## 64 21
## 65 5
## 66 30
## 67 30
## 68 4
## 69 Today
## 70 3
## 71 30
##
## [[4]]
## HiringAgency
## 1 Excuria Salon and SpaWilliamsville, NY 14221
## 2 Christopher Chiropractic Center llpWilliamsville, NY 14221
## 3 Peak Performance Chiropractic & WellnessBuffalo, NY 14217
## 4 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area)
## 5 Elements Massage East Amherst3.6East Amherst, NY
## 6 The W SpaClarence Center, NY 14032
## 7 CHS3.6Buffalo, NY
## 8 Bowman ChiropracticAmherst, NY 14228
## 9 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations
## 10 Indo-Pak Massage TherapyBuffalo, NY•Remote work available
## 11 Massage Envy3.2Tonawanda, NY 14150+3 locations
## 12 Elements3.6East Amherst, NY 14051
## 13 Universal ChiropracticWest Seneca, NY 14224
## 14 Buffalo Holistic CenterKenmore, NY 14217
## 15 Buffalo Holistic CenterKenmore, NY 14217
## 16 Peak Performance Chiropractic & WellnessBuffalo, NY 14217
## 17 Excuria Salon and SpaWilliamsville, NY 14221
## 18 CHS3.6Buffalo, NY
## 19 Bowman ChiropracticAmherst, NY 14228
## 20 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations
## 21 Indo-Pak Massage TherapyBuffalo, NY•Remote work available
## 22 Massage Envy3.2Tonawanda, NY 14150+3 locations
## 23 Elements3.6East Amherst, NY 14051
## 24 Universal ChiropracticWest Seneca, NY 14224
## 25 Samana Salt SpaLewiston, NY 14092
## 26 Elements Massage East Amherst3.6East Amherst, NY
## 27 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area)
## 28 Christopher Chiropractic Center llpWilliamsville, NY 14221
## 29 Excuria Salon and SpaWilliamsville, NY 14221
## 30 Christopher Chiropractic Center llpWilliamsville, NY 14221
## 31 Buffalo Holistic CenterKenmore, NY 14217
## 32 Peak Performance Chiropractic & WellnessBuffalo, NY 14217
## 33 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area)
## 34 The W SpaClarence Center, NY 14032
## 35 CHS3.6Buffalo, NY
## 36 Bowman ChiropracticAmherst, NY 14228
## 37 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations
## 38 Elements Massage East Amherst3.6East Amherst, NY
## 39 Indo-Pak Massage TherapyBuffalo, NY•Remote work available
## 40 Massage Envy3.2Tonawanda, NY 14150+3 locations
## 41 Elements3.6East Amherst, NY 14051
## 42 Universal ChiropracticWest Seneca, NY 14224
## 43 Samana Salt SpaLewiston, NY 14092
## 44 CHS3.6Buffalo, NY
## 45 Bowman ChiropracticAmherst, NY 14228
## 46 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations
## 47 Indo-Pak Massage TherapyBuffalo, NY•Remote work available
## 48 Massage Envy3.2Tonawanda, NY 14150+3 locations
## 49 Elements3.6East Amherst, NY 14051
## 50 Universal ChiropracticWest Seneca, NY 14224
## 51 Samana Salt SpaLewiston, NY 14092
## 52 Elements Massage East Amherst3.6East Amherst, NY
## 53 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area)
## 54 Excuria Salon and SpaWilliamsville, NY 14221
## 55 Christopher Chiropractic Center llpWilliamsville, NY 14221
## 56 Buffalo Holistic CenterKenmore, NY 14217
## 57 Peak Performance Chiropractic & WellnessBuffalo, NY 14217
## 58 CHS3.6Buffalo, NY
## 59 Bowman ChiropracticAmherst, NY 14228
## 60 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations
## 61 Indo-Pak Massage TherapyBuffalo, NY•Remote work available
## 62 Massage Envy3.2Tonawanda, NY 14150+3 locations
## 63 Elements3.6East Amherst, NY 14051
## 64 Universal ChiropracticWest Seneca, NY 14224
## 65 Samana Salt SpaLewiston, NY 14092
## 66 Elements Massage East Amherst3.6East Amherst, NY
## 67 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area)
## 68 Excuria Salon and SpaWilliamsville, NY 14221
## 69 Christopher Chiropractic Center llpWilliamsville, NY 14221
## 70 Buffalo Holistic CenterKenmore, NY 14217
## 71 Peak Performance Chiropractic & WellnessBuffalo, NY 14217
##
## [[5]]
## Salary salary minSalary maxSalary
## 4 \n$32,000 a year $32000 32000 NA
## 9 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 10 \n$32,000 a year $32000 32000 NA
## 17 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 18 \n$32,000 a year $32000 32000 NA
## 21 \n$32,000 a year $32000 32000 NA
## 29 \n$32,000 a year $32000 32000 NA
## 31 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 32 \n$32,000 a year $32000 32000 NA
## 38 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 39 \n$32,000 a year $32000 32000 NA
## 42 \n$32,000 a year $32000 32000 NA
## 49 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 50 \n$32,000 a year $32000 32000 NA
## 53 \n$32,000 a year $32000 32000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 4 32000 50000 33000 50000 32000
## 9 32000 50000 33000 50000 32000
## 10 32000 50000 33000 50000 32000
## 17 32000 50000 33000 50000 32000
## 18 32000 50000 33000 50000 32000
## 21 32000 50000 33000 50000 32000
## 29 32000 50000 33000 50000 32000
## 31 32000 50000 33000 50000 32000
## 32 32000 50000 33000 50000 32000
## 38 32000 50000 33000 50000 32000
## 39 32000 50000 33000 50000 32000
## 42 32000 50000 33000 50000 32000
## 49 32000 50000 33000 50000 32000
## 50 32000 50000 33000 50000 32000
## 53 32000 50000 33000 50000 32000
## maximumMaxSalary
## 4 50000
## 9 50000
## 10 50000
## 17 50000
## 18 50000
## 21 50000
## 29 50000
## 31 50000
## 32 50000
## 38 50000
## 39 50000
## 42 50000
## 49 50000
## 50 50000
## 53 50000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$28 - $35 an hour $28 - $35 28.0 35 24.5
## 2 \n$25 - $30 an hour $25 - $30 25.0 30 24.5
## 3 \n$25 - $40 an hour $25 - $40 25.0 40 24.5
## 5 \n$12 - $55 an hour $12 - $55 12.0 55 24.5
## 6 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 7 \n$24.50 an hour $24.50 24.5 NA 24.5
## 11 \n$17 - $18 an hour $17 - $18 17.0 18 24.5
## 12 \n$25 - $40 an hour $25 - $40 25.0 40 24.5
## 13 \n$28 - $35 an hour $28 - $35 28.0 35 24.5
## 14 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 15 \n$24.50 an hour $24.50 24.5 NA 24.5
## 19 \n$17 - $18 an hour $17 - $18 17.0 18 24.5
## 20 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 22 \n$25 - $30 an hour $25 - $30 25.0 30 24.5
## 23 \n$28 - $35 an hour $28 - $35 28.0 35 24.5
## 24 \n$25 - $30 an hour $25 - $30 25.0 30 24.5
## 25 \n$25 - $40 an hour $25 - $40 25.0 40 24.5
## 26 \n$12 - $55 an hour $12 - $55 12.0 55 24.5
## 27 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 28 \n$24.50 an hour $24.50 24.5 NA 24.5
## 33 \n$17 - $18 an hour $17 - $18 17.0 18 24.5
## 34 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 35 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 36 \n$24.50 an hour $24.50 24.5 NA 24.5
## 40 \n$17 - $18 an hour $17 - $18 17.0 18 24.5
## 41 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 43 \n$28 - $35 an hour $28 - $35 28.0 35 24.5
## 44 \n$25 - $30 an hour $25 - $30 25.0 30 24.5
## 45 \n$25 - $40 an hour $25 - $40 25.0 40 24.5
## 46 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 47 \n$24.50 an hour $24.50 24.5 NA 24.5
## 51 \n$17 - $18 an hour $17 - $18 17.0 18 24.5
## 52 \n$20 - $30 an hour $20 - $30 20.0 30 24.5
## 54 \n$28 - $35 an hour $28 - $35 28.0 35 24.5
## 55 \n$25 - $30 an hour $25 - $30 25.0 30 24.5
## 56 \n$25 - $40 an hour $25 - $40 25.0 40 24.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 22.26389 32.09677 12 55
## 2 30 22.26389 32.09677 12 55
## 3 30 22.26389 32.09677 12 55
## 5 30 22.26389 32.09677 12 55
## 6 30 22.26389 32.09677 12 55
## 7 30 22.26389 32.09677 12 55
## 11 30 22.26389 32.09677 12 55
## 12 30 22.26389 32.09677 12 55
## 13 30 22.26389 32.09677 12 55
## 14 30 22.26389 32.09677 12 55
## 15 30 22.26389 32.09677 12 55
## 19 30 22.26389 32.09677 12 55
## 20 30 22.26389 32.09677 12 55
## 22 30 22.26389 32.09677 12 55
## 23 30 22.26389 32.09677 12 55
## 24 30 22.26389 32.09677 12 55
## 25 30 22.26389 32.09677 12 55
## 26 30 22.26389 32.09677 12 55
## 27 30 22.26389 32.09677 12 55
## 28 30 22.26389 32.09677 12 55
## 33 30 22.26389 32.09677 12 55
## 34 30 22.26389 32.09677 12 55
## 35 30 22.26389 32.09677 12 55
## 36 30 22.26389 32.09677 12 55
## 40 30 22.26389 32.09677 12 55
## 41 30 22.26389 32.09677 12 55
## 43 30 22.26389 32.09677 12 55
## 44 30 22.26389 32.09677 12 55
## 45 30 22.26389 32.09677 12 55
## 46 30 22.26389 32.09677 12 55
## 47 30 22.26389 32.09677 12 55
## 51 30 22.26389 32.09677 12 55
## 52 30 22.26389 32.09677 12 55
## 54 30 22.26389 32.09677 12 55
## 55 30 22.26389 32.09677 12 55
## 56 30 22.26389 32.09677 12 55
##
## [[7]]
## city state jobTitle
## 1 Buffalo NY Massage Therapist
## 2 Buffalo NY Massage Therapist - Independent Contractor
## 3 Buffalo NY Licensed Massage Therapist (LMT)
## 4 Buffalo NY SIGN ON BONUS** Licensed Massage Therapist
## 5 Buffalo NY Licensed Massage Therapist
## 6 Buffalo NY Licensed Massage Therapist LMT
## 7 Buffalo NY Massage Therapist SCH
## 8 Buffalo NY Licensed Massage Therapist
## 9 Buffalo NY Licensed Massage Therapist (LMT)
## 10 Buffalo NY Massage Therapist - Independent Contractor
## 11 Buffalo NY Massage Therapist
## 12 Buffalo NY Massage Therapist
## 13 Buffalo NY Licensed Massage Therapist
## 14 Buffalo NY NYS Licensed/Registered/Insured Massage Therapist
## 15 Buffalo NY NYS Licensed/Registered/Insured Massage Therapist
## 16 Buffalo NY Licensed Massage Therapist (LMT)
## 17 Buffalo NY Massage Therapist
## 18 Buffalo NY Massage Therapist SCH
## 19 Buffalo NY Licensed Massage Therapist
## 20 Buffalo NY Licensed Massage Therapist (LMT)
## 21 Buffalo NY Massage Therapist - Independent Contractor
## 22 Buffalo NY Massage Therapist
## 23 Buffalo NY Massage Therapist
## 24 Buffalo NY Licensed Massage Therapist
## 25 Buffalo NY Massage Therapy
## 26 Buffalo NY Licensed Massage Therapist
## 27 Buffalo NY SIGN ON BONUS** Licensed Massage Therapist
## 28 Buffalo NY Massage Therapist - Independent Contractor
## 29 Buffalo NY Massage Therapist
## 30 Buffalo NY Massage Therapist - Independent Contractor
## 31 Buffalo NY NYS Licensed/Registered/Insured Massage Therapist
## 32 Buffalo NY Licensed Massage Therapist (LMT)
## 33 Buffalo NY SIGN ON BONUS** Licensed Massage Therapist
## 34 Buffalo NY Licensed Massage Therapist LMT
## 35 Buffalo NY Massage Therapist SCH
## 36 Buffalo NY Licensed Massage Therapist
## 37 Buffalo NY Licensed Massage Therapist (LMT)
## 38 Buffalo NY Licensed Massage Therapist
## 39 Buffalo NY Massage Therapist - Independent Contractor
## 40 Buffalo NY Massage Therapist
## 41 Buffalo NY Massage Therapist
## 42 Buffalo NY Licensed Massage Therapist
## 43 Buffalo NY Massage Therapy
## 44 Buffalo NY Massage Therapist SCH
## 45 Buffalo NY Licensed Massage Therapist
## 46 Buffalo NY Licensed Massage Therapist (LMT)
## 47 Buffalo NY Massage Therapist - Independent Contractor
## 48 Buffalo NY Massage Therapist
## 49 Buffalo NY Massage Therapist
## 50 Buffalo NY Licensed Massage Therapist
## 51 Buffalo NY Massage Therapy
## 52 Buffalo NY Licensed Massage Therapist
## 53 Buffalo NY SIGN ON BONUS** Licensed Massage Therapist
## 54 Buffalo NY Massage Therapist
## 55 Buffalo NY Massage Therapist - Independent Contractor
## 56 Buffalo NY NYS Licensed/Registered/Insured Massage Therapist
## 57 Buffalo NY Licensed Massage Therapist (LMT)
## 58 Buffalo NY Massage Therapist SCH
## 59 Buffalo NY Licensed Massage Therapist
## 60 Buffalo NY Licensed Massage Therapist (LMT)
## 61 Buffalo NY Massage Therapist - Independent Contractor
## 62 Buffalo NY Massage Therapist
## 63 Buffalo NY Massage Therapist
## 64 Buffalo NY Licensed Massage Therapist
## 65 Buffalo NY Massage Therapy
## 66 Buffalo NY Licensed Massage Therapist
## 67 Buffalo NY SIGN ON BONUS** Licensed Massage Therapist
## 68 Buffalo NY Massage Therapist
## 69 Buffalo NY Massage Therapist - Independent Contractor
## 70 Buffalo NY NYS Licensed/Registered/Insured Massage Therapist
## 71 Buffalo NY Licensed Massage Therapist (LMT)
## HiringAgency date_daysAgo
## 1 Excuria Salon and SpaWilliamsville, NY 14221 4
## 2 Christopher Chiropractic Center llpWilliamsville, NY 14221 Today
## 3 Peak Performance Chiropractic & WellnessBuffalo, NY 14217 30
## 4 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area) 30
## 5 Elements Massage East Amherst3.6East Amherst, NY 30
## 6 The W SpaClarence Center, NY 14032 Just posted
## 7 CHS3.6Buffalo, NY 30
## 8 Bowman ChiropracticAmherst, NY 14228 10
## 9 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations 8
## 10 Indo-Pak Massage TherapyBuffalo, NY•Remote work available 15
## 11 Massage Envy3.2Tonawanda, NY 14150+3 locations 7
## 12 Elements3.6East Amherst, NY 14051 30
## 13 Universal ChiropracticWest Seneca, NY 14224 21
## 14 Buffalo Holistic CenterKenmore, NY 14217 3
## 15 Buffalo Holistic CenterKenmore, NY 14217 3
## 16 Peak Performance Chiropractic & WellnessBuffalo, NY 14217 30
## 17 Excuria Salon and SpaWilliamsville, NY 14221 4
## 18 CHS3.6Buffalo, NY 30
## 19 Bowman ChiropracticAmherst, NY 14228 10
## 20 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations 8
## 21 Indo-Pak Massage TherapyBuffalo, NY•Remote work available 15
## 22 Massage Envy3.2Tonawanda, NY 14150+3 locations 7
## 23 Elements3.6East Amherst, NY 14051 30
## 24 Universal ChiropracticWest Seneca, NY 14224 21
## 25 Samana Salt SpaLewiston, NY 14092 5
## 26 Elements Massage East Amherst3.6East Amherst, NY 30
## 27 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area) 30
## 28 Christopher Chiropractic Center llpWilliamsville, NY 14221 Today
## 29 Excuria Salon and SpaWilliamsville, NY 14221 4
## 30 Christopher Chiropractic Center llpWilliamsville, NY 14221 Today
## 31 Buffalo Holistic CenterKenmore, NY 14217 3
## 32 Peak Performance Chiropractic & WellnessBuffalo, NY 14217 30
## 33 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area) 30
## 34 The W SpaClarence Center, NY 14032 Just posted
## 35 CHS3.6Buffalo, NY 30
## 36 Bowman ChiropracticAmherst, NY 14228 10
## 37 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations 8
## 38 Elements Massage East Amherst3.6East Amherst, NY 30
## 39 Indo-Pak Massage TherapyBuffalo, NY•Remote work available 15
## 40 Massage Envy3.2Tonawanda, NY 14150+3 locations 7
## 41 Elements3.6East Amherst, NY 14051 30
## 42 Universal ChiropracticWest Seneca, NY 14224 21
## 43 Samana Salt SpaLewiston, NY 14092 5
## 44 CHS3.6Buffalo, NY 30
## 45 Bowman ChiropracticAmherst, NY 14228 10
## 46 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations 8
## 47 Indo-Pak Massage TherapyBuffalo, NY•Remote work available 15
## 48 Massage Envy3.2Tonawanda, NY 14150+3 locations 7
## 49 Elements3.6East Amherst, NY 14051 30
## 50 Universal ChiropracticWest Seneca, NY 14224 21
## 51 Samana Salt SpaLewiston, NY 14092 5
## 52 Elements Massage East Amherst3.6East Amherst, NY 30
## 53 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area) 30
## 54 Excuria Salon and SpaWilliamsville, NY 14221 4
## 55 Christopher Chiropractic Center llpWilliamsville, NY 14221 Today
## 56 Buffalo Holistic CenterKenmore, NY 14217 3
## 57 Peak Performance Chiropractic & WellnessBuffalo, NY 14217 30
## 58 CHS3.6Buffalo, NY 30
## 59 Bowman ChiropracticAmherst, NY 14228 10
## 60 Notaro Chiropractic4.0Williamsville, NY 14221+3 locations 8
## 61 Indo-Pak Massage TherapyBuffalo, NY•Remote work available 15
## 62 Massage Envy3.2Tonawanda, NY 14150+3 locations 7
## 63 Elements3.6East Amherst, NY 14051 30
## 64 Universal ChiropracticWest Seneca, NY 14224 21
## 65 Samana Salt SpaLewiston, NY 14092 5
## 66 Elements Massage East Amherst3.6East Amherst, NY 30
## 67 Massage Therapeutic ArtsBuffalo, NY 14201 (Allen area) 30
## 68 Excuria Salon and SpaWilliamsville, NY 14221 4
## 69 Christopher Chiropractic Center llpWilliamsville, NY 14221 Today
## 70 Buffalo Holistic CenterKenmore, NY 14217 3
## 71 Peak Performance Chiropractic & WellnessBuffalo, NY 14217 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 12 55 32000 50000
## 2 12 55 32000 50000
## 3 12 55 32000 50000
## 4 12 55 32000 50000
## 5 12 55 32000 50000
## 6 12 55 32000 50000
## 7 12 55 32000 50000
## 8 12 55 32000 50000
## 9 12 55 32000 50000
## 10 12 55 32000 50000
## 11 12 55 32000 50000
## 12 12 55 32000 50000
## 13 12 55 32000 50000
## 14 12 55 32000 50000
## 15 12 55 32000 50000
## 16 12 55 32000 50000
## 17 12 55 32000 50000
## 18 12 55 32000 50000
## 19 12 55 32000 50000
## 20 12 55 32000 50000
## 21 12 55 32000 50000
## 22 12 55 32000 50000
## 23 12 55 32000 50000
## 24 12 55 32000 50000
## 25 12 55 32000 50000
## 26 12 55 32000 50000
## 27 12 55 32000 50000
## 28 12 55 32000 50000
## 29 12 55 32000 50000
## 30 12 55 32000 50000
## 31 12 55 32000 50000
## 32 12 55 32000 50000
## 33 12 55 32000 50000
## 34 12 55 32000 50000
## 35 12 55 32000 50000
## 36 12 55 32000 50000
## 37 12 55 32000 50000
## 38 12 55 32000 50000
## 39 12 55 32000 50000
## 40 12 55 32000 50000
## 41 12 55 32000 50000
## 42 12 55 32000 50000
## 43 12 55 32000 50000
## 44 12 55 32000 50000
## 45 12 55 32000 50000
## 46 12 55 32000 50000
## 47 12 55 32000 50000
## 48 12 55 32000 50000
## 49 12 55 32000 50000
## 50 12 55 32000 50000
## 51 12 55 32000 50000
## 52 12 55 32000 50000
## 53 12 55 32000 50000
## 54 12 55 32000 50000
## 55 12 55 32000 50000
## 56 12 55 32000 50000
## 57 12 55 32000 50000
## 58 12 55 32000 50000
## 59 12 55 32000 50000
## 60 12 55 32000 50000
## 61 12 55 32000 50000
## 62 12 55 32000 50000
## 63 12 55 32000 50000
## 64 12 55 32000 50000
## 65 12 55 32000 50000
## 66 12 55 32000 50000
## 67 12 55 32000 50000
## 68 12 55 32000 50000
## 69 12 55 32000 50000
## 70 12 55 32000 50000
## 71 12 55 32000 50000
getIndeedJobData5pages('massage therapist', 'Rochester','NY')
## Warning in getIndeedJobData5pages("massage therapist", "Rochester", "NY"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Rochester", "NY"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Salon Massage Therapist
## 3 NYS Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Spa Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Stretch Service Provider
## 9 Massage Therapist - Independent Contractor
## 10 Salon Massage Therapist
## 11 NYS Licensed Massage Therapist
## 12 Licensed Massage Therapist
## 13 Spa Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Stretch Service Provider
## 17 Massage Therapist - Independent Contractor
## 18 Salon Massage Therapist
## 19 NYS Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Spa Massage Therapist
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Stretch Service Provider
## 25 Massage Therapist - Independent Contractor
## 26 Salon Massage Therapist
## 27 NYS Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Spa Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Stretch Service Provider
## 33 Massage Therapist - Independent Contractor
## 34 Salon Massage Therapist
## 35 NYS Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Spa Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist
## 40 Stretch Service Provider
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 3 \nUp to $50,000 a year $50000 50000 NA
## 4 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 7 \nUp to $50,000 a year $50000 50000 NA
## 8 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 11 \nUp to $50,000 a year $50000 50000 NA
## 12 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 15 \nUp to $50,000 a year $50000 50000 NA
## 16 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 19 \nUp to $50,000 a year $50000 50000 NA
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 40000 45000 33750 37428.57 5000
## 2 40000 45000 33750 37428.57 5000
## 3 40000 45000 33750 37428.57 5000
## 4 40000 45000 33750 37428.57 5000
## 5 40000 45000 33750 37428.57 5000
## 6 40000 45000 33750 37428.57 5000
## 7 40000 45000 33750 37428.57 5000
## 8 40000 45000 33750 37428.57 5000
## 9 40000 45000 33750 37428.57 5000
## 10 40000 45000 33750 37428.57 5000
## 11 40000 45000 33750 37428.57 5000
## 12 40000 45000 33750 37428.57 5000
## 13 40000 45000 33750 37428.57 5000
## 14 40000 45000 33750 37428.57 5000
## 15 40000 45000 33750 37428.57 5000
## 16 40000 45000 33750 37428.57 5000
## 17 40000 45000 33750 37428.57 5000
## 18 40000 45000 33750 37428.57 5000
## 19 40000 45000 33750 37428.57 5000
## 20 40000 45000 33750 37428.57 5000
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
##
## [[3]]
## date_daysAgo
## 1 15
## 2 30
## 3 30
## 4 12
## 5 19
## 6 11
## 7 30
## 8 11
## 9 15
## 10 30
## 11 30
## 12 12
## 13 19
## 14 11
## 15 30
## 16 11
## 17 15
## 18 30
## 19 30
## 20 12
## 21 19
## 22 11
## 23 30
## 24 11
## 25 15
## 26 30
## 27 30
## 28 12
## 29 19
## 30 11
## 31 30
## 32 11
## 33 15
## 34 30
## 35 30
## 36 12
## 37 19
## 38 11
## 39 30
## 40 11
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyRochester, NY•Remote work available
## 2 JCPenney3.7Greece, NY 14626
## 3 AE SPA ANDREA ESTHETICSRochester, NY 14618
## 4 Massage Envy3.2Greece, NY 14626+1 location
## 5 Woodcliff Hotel & Spa3.1Fairport, NY 14450
## 6 Massage Envy3.2Webster, NY 14580+3 locations
## 7 Hand and Stone3.0Webster, NY 14580
## 8 Massage Envy3.2Webster, NY 14580
## 9 Indo-Pak Massage TherapyRochester, NY•Remote work available
## 10 JCPenney3.7Greece, NY 14626
## 11 AE SPA ANDREA ESTHETICSRochester, NY 14618
## 12 Massage Envy3.2Greece, NY 14626+1 location
## 13 Woodcliff Hotel & Spa3.1Fairport, NY 14450
## 14 Massage Envy3.2Webster, NY 14580+3 locations
## 15 Hand and Stone3.0Webster, NY 14580
## 16 Massage Envy3.2Webster, NY 14580
## 17 Indo-Pak Massage TherapyRochester, NY•Remote work available
## 18 JCPenney3.7Greece, NY 14626
## 19 AE SPA ANDREA ESTHETICSRochester, NY 14618
## 20 Massage Envy3.2Greece, NY 14626+1 location
## 21 Woodcliff Hotel & Spa3.1Fairport, NY 14450
## 22 Massage Envy3.2Webster, NY 14580+3 locations
## 23 Hand and Stone3.0Webster, NY 14580
## 24 Massage Envy3.2Webster, NY 14580
## 25 Indo-Pak Massage TherapyRochester, NY•Remote work available
## 26 JCPenney3.7Greece, NY 14626
## 27 AE SPA ANDREA ESTHETICSRochester, NY 14618
## 28 Massage Envy3.2Greece, NY 14626+1 location
## 29 Woodcliff Hotel & Spa3.1Fairport, NY 14450
## 30 Massage Envy3.2Webster, NY 14580+3 locations
## 31 Hand and Stone3.0Webster, NY 14580
## 32 Massage Envy3.2Webster, NY 14580
## 33 Indo-Pak Massage TherapyRochester, NY•Remote work available
## 34 JCPenney3.7Greece, NY 14626
## 35 AE SPA ANDREA ESTHETICSRochester, NY 14618
## 36 Massage Envy3.2Greece, NY 14626+1 location
## 37 Woodcliff Hotel & Spa3.1Fairport, NY 14450
## 38 Massage Envy3.2Webster, NY 14580+3 locations
## 39 Hand and Stone3.0Webster, NY 14580
## 40 Massage Envy3.2Webster, NY 14580
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 3 \nUp to $50,000 a year $50000 50000 NA
## 4 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 6 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 7 \nUp to $50,000 a year $50000 50000 NA
## 8 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 10 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 11 \nUp to $50,000 a year $50000 50000 NA
## 12 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 14 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 15 \nUp to $50,000 a year $50000 50000 NA
## 16 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 18 \n$35,000 - $55,000 a year ++ $35000 - $55000 35000 55000
## 19 \nUp to $50,000 a year $50000 50000 NA
## 20 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 45000 57500 43333.33 57500 35000
## 3 45000 57500 43333.33 57500 35000
## 4 45000 57500 43333.33 57500 35000
## 6 45000 57500 43333.33 57500 35000
## 7 45000 57500 43333.33 57500 35000
## 8 45000 57500 43333.33 57500 35000
## 10 45000 57500 43333.33 57500 35000
## 11 45000 57500 43333.33 57500 35000
## 12 45000 57500 43333.33 57500 35000
## 14 45000 57500 43333.33 57500 35000
## 15 45000 57500 43333.33 57500 35000
## 16 45000 57500 43333.33 57500 35000
## 18 45000 57500 43333.33 57500 35000
## 19 45000 57500 43333.33 57500 35000
## 20 45000 57500 43333.33 57500 35000
## maximumMaxSalary
## 2 60000
## 3 60000
## 4 60000
## 6 60000
## 7 60000
## 8 60000
## 10 60000
## 11 60000
## 12 60000
## 14 60000
## 15 60000
## 16 60000
## 18 60000
## 19 60000
## 20 60000
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Rochester NY Massage Therapist - Independent Contractor
## 2 Rochester NY Salon Massage Therapist
## 3 Rochester NY NYS Licensed Massage Therapist
## 4 Rochester NY Licensed Massage Therapist
## 5 Rochester NY Spa Massage Therapist
## 6 Rochester NY Massage Therapist
## 7 Rochester NY Licensed Massage Therapist
## 8 Rochester NY Stretch Service Provider
## 9 Rochester NY Massage Therapist - Independent Contractor
## 10 Rochester NY Salon Massage Therapist
## 11 Rochester NY NYS Licensed Massage Therapist
## 12 Rochester NY Licensed Massage Therapist
## 13 Rochester NY Spa Massage Therapist
## 14 Rochester NY Massage Therapist
## 15 Rochester NY Licensed Massage Therapist
## 16 Rochester NY Stretch Service Provider
## 17 Rochester NY Massage Therapist - Independent Contractor
## 18 Rochester NY Salon Massage Therapist
## 19 Rochester NY NYS Licensed Massage Therapist
## 20 Rochester NY Licensed Massage Therapist
## 21 Rochester NY Spa Massage Therapist
## 22 Rochester NY Massage Therapist
## 23 Rochester NY Licensed Massage Therapist
## 24 Rochester NY Stretch Service Provider
## 25 Rochester NY Massage Therapist - Independent Contractor
## 26 Rochester NY Salon Massage Therapist
## 27 Rochester NY NYS Licensed Massage Therapist
## 28 Rochester NY Licensed Massage Therapist
## 29 Rochester NY Spa Massage Therapist
## 30 Rochester NY Massage Therapist
## 31 Rochester NY Licensed Massage Therapist
## 32 Rochester NY Stretch Service Provider
## 33 Rochester NY Massage Therapist - Independent Contractor
## 34 Rochester NY Salon Massage Therapist
## 35 Rochester NY NYS Licensed Massage Therapist
## 36 Rochester NY Licensed Massage Therapist
## 37 Rochester NY Spa Massage Therapist
## 38 Rochester NY Massage Therapist
## 39 Rochester NY Licensed Massage Therapist
## 40 Rochester NY Stretch Service Provider
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyRochester, NY•Remote work available 15
## 2 JCPenney3.7Greece, NY 14626 30
## 3 AE SPA ANDREA ESTHETICSRochester, NY 14618 30
## 4 Massage Envy3.2Greece, NY 14626+1 location 12
## 5 Woodcliff Hotel & Spa3.1Fairport, NY 14450 19
## 6 Massage Envy3.2Webster, NY 14580+3 locations 11
## 7 Hand and Stone3.0Webster, NY 14580 30
## 8 Massage Envy3.2Webster, NY 14580 11
## 9 Indo-Pak Massage TherapyRochester, NY•Remote work available 15
## 10 JCPenney3.7Greece, NY 14626 30
## 11 AE SPA ANDREA ESTHETICSRochester, NY 14618 30
## 12 Massage Envy3.2Greece, NY 14626+1 location 12
## 13 Woodcliff Hotel & Spa3.1Fairport, NY 14450 19
## 14 Massage Envy3.2Webster, NY 14580+3 locations 11
## 15 Hand and Stone3.0Webster, NY 14580 30
## 16 Massage Envy3.2Webster, NY 14580 11
## 17 Indo-Pak Massage TherapyRochester, NY•Remote work available 15
## 18 JCPenney3.7Greece, NY 14626 30
## 19 AE SPA ANDREA ESTHETICSRochester, NY 14618 30
## 20 Massage Envy3.2Greece, NY 14626+1 location 12
## 21 Woodcliff Hotel & Spa3.1Fairport, NY 14450 19
## 22 Massage Envy3.2Webster, NY 14580+3 locations 11
## 23 Hand and Stone3.0Webster, NY 14580 30
## 24 Massage Envy3.2Webster, NY 14580 11
## 25 Indo-Pak Massage TherapyRochester, NY•Remote work available 15
## 26 JCPenney3.7Greece, NY 14626 30
## 27 AE SPA ANDREA ESTHETICSRochester, NY 14618 30
## 28 Massage Envy3.2Greece, NY 14626+1 location 12
## 29 Woodcliff Hotel & Spa3.1Fairport, NY 14450 19
## 30 Massage Envy3.2Webster, NY 14580+3 locations 11
## 31 Hand and Stone3.0Webster, NY 14580 30
## 32 Massage Envy3.2Webster, NY 14580 11
## 33 Indo-Pak Massage TherapyRochester, NY•Remote work available 15
## 34 JCPenney3.7Greece, NY 14626 30
## 35 AE SPA ANDREA ESTHETICSRochester, NY 14618 30
## 36 Massage Envy3.2Greece, NY 14626+1 location 12
## 37 Woodcliff Hotel & Spa3.1Fairport, NY 14450 19
## 38 Massage Envy3.2Webster, NY 14580+3 locations 11
## 39 Hand and Stone3.0Webster, NY 14580 30
## 40 Massage Envy3.2Webster, NY 14580 11
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA 35000 60000
## 2 NA NA 35000 60000
## 3 NA NA 35000 60000
## 4 NA NA 35000 60000
## 5 NA NA 35000 60000
## 6 NA NA 35000 60000
## 7 NA NA 35000 60000
## 8 NA NA 35000 60000
## 9 NA NA 35000 60000
## 10 NA NA 35000 60000
## 11 NA NA 35000 60000
## 12 NA NA 35000 60000
## 13 NA NA 35000 60000
## 14 NA NA 35000 60000
## 15 NA NA 35000 60000
## 16 NA NA 35000 60000
## 17 NA NA 35000 60000
## 18 NA NA 35000 60000
## 19 NA NA 35000 60000
## 20 NA NA 35000 60000
## 21 NA NA 35000 60000
## 22 NA NA 35000 60000
## 23 NA NA 35000 60000
## 24 NA NA 35000 60000
## 25 NA NA 35000 60000
## 26 NA NA 35000 60000
## 27 NA NA 35000 60000
## 28 NA NA 35000 60000
## 29 NA NA 35000 60000
## 30 NA NA 35000 60000
## 31 NA NA 35000 60000
## 32 NA NA 35000 60000
## 33 NA NA 35000 60000
## 34 NA NA 35000 60000
## 35 NA NA 35000 60000
## 36 NA NA 35000 60000
## 37 NA NA 35000 60000
## 38 NA NA 35000 60000
## 39 NA NA 35000 60000
## 40 NA NA 35000 60000
North Carolina Charlotte, Raleigh, Greensboro
getIndeedJobData5pages('massage therapist', 'Charlotte','NC')
## Warning in getIndeedJobData5pages("massage therapist", "Charlotte", "NC"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Charlotte", "NC"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Massage Therapist – Gastonia $25 - $45 an hour
## 6 Massage Therapist
## 7 Licensed Massage Therapist *Sign On Bonus!*
## 8 Licensed Massage Therapist - NO SELLING! Great Pay & Bonus
## 9 LifeSpa Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Licensed Massage Therapist, Independent Contractor
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist, Independent Contractor
## 15 Massage Therapist
## 16 Stretch Professional- Yoga, Massage Therapist, Personal Trai...
## 17 Massage Therapist – South Park $25 - $45 an hour
## 18 Licensed Massage Therapist
## 19 Massage Therapist - Full-Time
## 20 Massage Therapist – Gastonia $25 - $45 an hour
## 21 Licensed Massage Therapist
## 22 Flexologist (Stretch Professional)
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist *Sign On Bonus!*
## 27 Massage Therapist, Massage Envy Rivergate
## 28 Physical Therapy Assistants&Aspiring Physical Therapists- St...
## 29 Massage Therapist - Gastonia $25-$45 an Hour
## 30 Massage Therapist [CUSTOMIZATION REQUIRED]
## 31 Licensed Massage Therapists - Mooresville NC
## 32 Massage Therapist - PT [Flexible Schedule]
## 33 Massage Therapist - Part-Time
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist – South Park $25 - $45 an hour
## 39 Massage Therapist – Gastonia $25 - $45 an hour
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Massage Therapist, Massage Envy Rivergate
## 43 Physical Therapy Assistants&Aspiring Physical Therapists- St...
## 44 Massage Therapist - Gastonia $25-$45 an Hour
## 45 Massage Therapist [CUSTOMIZATION REQUIRED]
## 46 Licensed Massage Therapists - Mooresville NC
## 47 Massage Therapist - PT [Flexible Schedule]
## 48 Massage Therapist - Part-Time
## 49 Dual Licensed Therapist - Massage and Skincare
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist *Sign On Bonus!*
## 52 Massage Therapist
## 53 Licensed Massage Therapist *Sign On Bonus!*
## 54 Licensed Massage Therapist
## 55 Massage Therapist
## 56 Licensed Massage Therapist (LMT)
## 57 Massage Therapist – Gastonia $25 - $45 an hour
## 58 Massage Therapist
## 59 Massage Therapist – South Park $25 - $45 an hour
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Massage Therapist - Full Time - FAST GROWING LOCATION
## 63 Licensed Massage Therapist - FAST GROWING LOCATION
## 64 Dual Licensed Therapist - Massage & Skincare
## 65 Licensed Massage Therapist
## 66 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 67 Licensed Massage Therapists Needed - Full & Part Time (Moore...
## 68 Total Body Stretch Service Provider
## 69 Licensed Massage Therapist - NO SELLING! Great Pay & Bonus
## 70 Licensed Massage Therapist, Independent Contractor
## 71 Massage Therapist, Massage Envy Rivergate
## 72 Physical Therapy Assistants&Aspiring Physical Therapists- St...
## 73 Massage Therapist - Gastonia $25-$45 an Hour
## 74 Massage Therapist [CUSTOMIZATION REQUIRED]
## 75 Licensed Massage Therapists - Mooresville NC
## 76 Massage Therapist - PT [Flexible Schedule]
## 77 Massage Therapist - Part-Time
## 78 Dual Licensed Therapist - Massage and Skincare
## 79 Massage Therapist - Full Time - FAST GROWING LOCATION
## 80 Licensed Massage Therapist - FAST GROWING LOCATION
## 81 Dual Licensed Therapist - Massage & Skincare
## 82 Licensed Massage Therapist
## 83 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 84 Licensed Massage Therapists Needed - Full & Part Time (Moore...
## 85 Total Body Stretch Service Provider
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25 - $30 an hour $25 - $30 25 30
## 2 \n$25 - $40 an hour $25 - $40 25 40
## 3 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 4 \n$25 - $40 an hour $25 - $40 25 40
## 5 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 6 \n$30 - $60 an hour $30 - $60 30 60
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$45 - $60 an hour $45 - $60 45 60
## 9 \n$30 - $45 an hour $30 - $45 30 45
## 10 \n$22 - $29 an hour $22 - $29 22 29
## 11 \n$23 - $27 an hour $23 - $27 23 27
## 12 \n$35 - $69 an hour $35 - $69 35 69
## 13 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 14 \n$43 an hour $43 43 NA
## 15 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 16 \n$35,000 - $60,000 a year ++ $35000 - $60000 35000 60000
## 17 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 18 \n$25 - $45 an hour $25 - $45 25 45
## 19 \n$25 - $40 an hour $25 - $40 25 40
## 20 \n$25 - $40 an hour $25 - $40 25 40
## 21 \n$25 - $40 an hour $25 - $40 25 40
## 22 \n$25 - $30 an hour $25 - $30 25 30
## 23 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 24 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 25 \n$35,000 - $60,000 a year ++ $35000 - $60000 35000 60000
## 26 \n$25 - $45 an hour $25 - $45 25 45
## 27 \n$25 - $40 an hour $25 - $40 25 40
## 28 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 29 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 30 \n$25 - $40 an hour $25 - $40 25 40
## 31 \n$25 - $40 an hour $25 - $40 25 40
## 32 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 33 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 34 \n$25 - $30 an hour $25 - $30 25 30
## 35 \n$25 - $40 an hour $25 - $40 25 40
## 36 \n$30 - $60 an hour $30 - $60 30 60
## 37 \n$32 - $35 an hour $32 - $35 32 35
## 38 \n$25 - $45 an hour $25 - $45 25 45
## 39 \n$25 - $40 an hour $25 - $40 25 40
## 40 \n$25 - $40 an hour $25 - $40 25 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 40 13400.38 15608.42 22
## 2 30 40 13400.38 15608.42 22
## 3 30 40 13400.38 15608.42 22
## 4 30 40 13400.38 15608.42 22
## 5 30 40 13400.38 15608.42 22
## 6 30 40 13400.38 15608.42 22
## 7 30 40 13400.38 15608.42 22
## 8 30 40 13400.38 15608.42 22
## 9 30 40 13400.38 15608.42 22
## 10 30 40 13400.38 15608.42 22
## 11 30 40 13400.38 15608.42 22
## 12 30 40 13400.38 15608.42 22
## 13 30 40 13400.38 15608.42 22
## 14 30 40 13400.38 15608.42 22
## 15 30 40 13400.38 15608.42 22
## 16 30 40 13400.38 15608.42 22
## 17 30 40 13400.38 15608.42 22
## 18 30 40 13400.38 15608.42 22
## 19 30 40 13400.38 15608.42 22
## 20 30 40 13400.38 15608.42 22
## 21 30 40 13400.38 15608.42 22
## 22 30 40 13400.38 15608.42 22
## 23 30 40 13400.38 15608.42 22
## 24 30 40 13400.38 15608.42 22
## 25 30 40 13400.38 15608.42 22
## 26 30 40 13400.38 15608.42 22
## 27 30 40 13400.38 15608.42 22
## 28 30 40 13400.38 15608.42 22
## 29 30 40 13400.38 15608.42 22
## 30 30 40 13400.38 15608.42 22
## 31 30 40 13400.38 15608.42 22
## 32 30 40 13400.38 15608.42 22
## 33 30 40 13400.38 15608.42 22
## 34 30 40 13400.38 15608.42 22
## 35 30 40 13400.38 15608.42 22
## 36 30 40 13400.38 15608.42 22
## 37 30 40 13400.38 15608.42 22
## 38 30 40 13400.38 15608.42 22
## 39 30 40 13400.38 15608.42 22
## 40 30 40 13400.38 15608.42 22
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
## 31 60000
## 32 60000
## 33 60000
## 34 60000
## 35 60000
## 36 60000
## 37 60000
## 38 60000
## 39 60000
## 40 60000
##
## [[3]]
## date_daysAgo
## 1 25
## 2 Today
## 3 30
## 4 24
## 5 30
## 6 13
## 7 20
## 8 Just posted
## 9 8
## 10 5
## 11 19
## 12 29
## 13 30
## 14 Just posted
## 15 30
## 16 30
## 17 30
## 18 10
## 19 30
## 20 30
## 21 30
## 22 30
## 23 28
## 24 24
## 25 23
## 26 20
## 27 30
## 28 30
## 29 30
## 30 30
## 31 10
## 32 30
## 33 30
## 34 30
## 35 13
## 36 10
## 37 Today
## 38 30
## 39 30
## 40 28
## 41 23
## 42 30
## 43 30
## 44 30
## 45 30
## 46 10
## 47 30
## 48 30
## 49 30
## 50 24
## 51 20
## 52 25
## 53 20
## 54 24
## 55 13
## 56 30
## 57 30
## 58 25
## 59 30
## 60 Today
## 61 10
## 62 30
## 63 30
## 64 30
## 65 30
## 66 30
## 67 10
## 68 30
## 69 Just posted
## 70 21
## 71 30
## 72 30
## 73 30
## 74 30
## 75 10
## 76 30
## 77 30
## 78 30
## 79 30
## 80 30
## 81 30
## 82 30
## 83 30
## 84 10
## 85 30
##
## [[4]]
## HiringAgency
## 1 VociMedSpaCharlotte, NC 28277 (Piper Glen Estates area)
## 2 100% Chiropractic4.0Cornelius, NC 28031
## 3 Urbana Spa - South Charlotte3.0Charlotte, NC 28226 (Carmel area)
## 4 Soothe3.7Charlotte, NC
## 5 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 6 haring chiropracticClover, SC 29710
## 7 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 8 Zen Massage Huntersville / CorneliusHuntersville, NC 28078
## 9 Life Time3.6Charlotte, NC
## 10 Indo-Pak Massage TherapyCharlotte, NC•Remote work available
## 11 Building Bodies LLCCharlotte, NC
## 12 Hands & Hearts StaffingCharlotte, NC
## 13 Elements3.6Charlotte, NC 28210 (Beverly Woods area)
## 14 Natural Bliss Body StudioHarrisburg, NC 28075
## 15 Charlotte BodyworksCharlotte, NC 28273 (Yorkshire area)
## 16 StretchLab3.8Charlotte, NC
## 17 ME Devco DBA Massage Envy3.2Charlotte, NC 28211
## 18 Hand & Stone - SouthPark3.0Charlotte, NC 28211
## 19 Massage Envy3.2Matthews, NC 28105
## 20 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 21 Massage Heights3.1Charlotte, NC 28203 (Dilworth area)+2 locations
## 22 StretchLab3.8Charlotte, NC+1 location
## 23 Massage Heights - Charlotte3.1Matthews, NC 28105+1 location
## 24 Soothe3.7Charlotte, NC
## 25 Hand & Stone - MooresvilleMooresville, NC 28117
## 26 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 27 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)
## 28 StretchLab3.8Charlotte, NC
## 29 Massage Envy3.2Gastonia, NC 28054
## 30 Massage Envy3.2Waxhaw, NC 28173
## 31 Zen Massage MooresvilleMooresville, NC 28117
## 32 Massage Envy3.2Indian Trail, NC 28079
## 33 Massage Envy3.2Matthews, NC 28105
## 34 Urbana Spa - South Charlotte3.0Charlotte, NC 28226 (Carmel area)
## 35 haring chiropracticClover, SC 29710
## 36 Hand & Stone - SouthPark3.0Charlotte, NC 28211
## 37 100% Chiropractic4.0Cornelius, NC 28031
## 38 ME Devco DBA Massage Envy3.2Charlotte, NC 28211
## 39 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 40 Massage Heights - Charlotte3.1Matthews, NC 28105+1 location
## 41 Hand & Stone - MooresvilleMooresville, NC 28117
## 42 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)
## 43 StretchLab3.8Charlotte, NC
## 44 Massage Envy3.2Gastonia, NC 28054
## 45 Massage Envy3.2Waxhaw, NC 28173
## 46 Zen Massage MooresvilleMooresville, NC 28117
## 47 Massage Envy3.2Indian Trail, NC 28079
## 48 Massage Envy3.2Matthews, NC 28105
## 49 Massage Heights3.1Matthews, NC 28105+1 location
## 50 Soothe3.7Charlotte, NC
## 51 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 52 VociMedSpaCharlotte, NC 28277 (Piper Glen Estates area)
## 53 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 54 Soothe3.7Charlotte, NC
## 55 haring chiropracticClover, SC 29710
## 56 Urbana Spa - South Charlotte3.0Charlotte, NC 28226 (Carmel area)
## 57 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 58 VociMedSpaCharlotte, NC 28277 (Piper Glen Estates area)
## 59 ME Devco DBA Massage Envy3.2Charlotte, NC 28211
## 60 100% Chiropractic4.0Cornelius, NC 28031
## 61 Hand & Stone - SouthPark3.0Charlotte, NC 28211
## 62 Massage Envy3.2Indian Trail, NC 28079
## 63 Massage Envy3.2Indian Trail, NC 28079
## 64 Massage Heights3.1Charlotte, NC 28211 (Cotswold area)
## 65 Oasis Dentistry2.8Concord, NC 28027
## 66 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)+1 location
## 67 Zen Massage MooresvilleMooresville, NC 28117
## 68 Massage Envy3.2Mooresville, NC 28117
## 69 Zen Massage Huntersville / CorneliusHuntersville, NC 28078
## 70 Lifeworks on lake normanMooresville, NC 28117
## 71 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)
## 72 StretchLab3.8Charlotte, NC
## 73 Massage Envy3.2Gastonia, NC 28054
## 74 Massage Envy3.2Waxhaw, NC 28173
## 75 Zen Massage MooresvilleMooresville, NC 28117
## 76 Massage Envy3.2Indian Trail, NC 28079
## 77 Massage Envy3.2Matthews, NC 28105
## 78 Massage Heights3.1Matthews, NC 28105+1 location
## 79 Massage Envy3.2Indian Trail, NC 28079
## 80 Massage Envy3.2Indian Trail, NC 28079
## 81 Massage Heights3.1Charlotte, NC 28211 (Cotswold area)
## 82 Oasis Dentistry2.8Concord, NC 28027
## 83 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)+1 location
## 84 Zen Massage MooresvilleMooresville, NC 28117
## 85 Massage Envy3.2Mooresville, NC 28117
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 5 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 13 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 15 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 16 \n$35,000 - $60,000 a year ++ $35000 - $60000 35000 60000
## 17 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 23 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 24 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 25 \n$35,000 - $60,000 a year ++ $35000 - $60000 35000 60000
## 28 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 29 \n$40,000 - $50,000 a year $40000 - $50000 40000 50000
## 32 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## 33 \n$42,900 - $52,000 a year $42900 - $52000 42900 52000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 42900 52000 40792.31 52615.38 35000
## 5 42900 52000 40792.31 52615.38 35000
## 13 42900 52000 40792.31 52615.38 35000
## 15 42900 52000 40792.31 52615.38 35000
## 16 42900 52000 40792.31 52615.38 35000
## 17 42900 52000 40792.31 52615.38 35000
## 23 42900 52000 40792.31 52615.38 35000
## 24 42900 52000 40792.31 52615.38 35000
## 25 42900 52000 40792.31 52615.38 35000
## 28 42900 52000 40792.31 52615.38 35000
## 29 42900 52000 40792.31 52615.38 35000
## 32 42900 52000 40792.31 52615.38 35000
## 33 42900 52000 40792.31 52615.38 35000
## maximumMaxSalary
## 3 60000
## 5 60000
## 13 60000
## 15 60000
## 16 60000
## 17 60000
## 23 60000
## 24 60000
## 25 60000
## 28 60000
## 29 60000
## 32 60000
## 33 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$25 - $30 an hour $25 - $30 25 30 25
## 2 \n$25 - $40 an hour $25 - $40 25 40 25
## 4 \n$25 - $40 an hour $25 - $40 25 40 25
## 6 \n$30 - $60 an hour $30 - $60 30 60 25
## 8 \n$45 - $60 an hour $45 - $60 45 60 25
## 9 \n$30 - $45 an hour $30 - $45 30 45 25
## 10 \n$22 - $29 an hour $22 - $29 22 29 25
## 11 \n$23 - $27 an hour $23 - $27 23 27 25
## 12 \n$35 - $69 an hour $35 - $69 35 69 25
## 14 \n$43 an hour $43 43 NA 25
## 18 \n$25 - $45 an hour $25 - $45 25 45 25
## 19 \n$25 - $40 an hour $25 - $40 25 40 25
## 20 \n$25 - $40 an hour $25 - $40 25 40 25
## 21 \n$25 - $40 an hour $25 - $40 25 40 25
## 22 \n$25 - $30 an hour $25 - $30 25 30 25
## 26 \n$25 - $45 an hour $25 - $45 25 45 25
## 27 \n$25 - $40 an hour $25 - $40 25 40 25
## 30 \n$25 - $40 an hour $25 - $40 25 40 25
## 31 \n$25 - $40 an hour $25 - $40 25 40 25
## 34 \n$25 - $30 an hour $25 - $30 25 30 25
## 35 \n$25 - $40 an hour $25 - $40 25 40 25
## 36 \n$30 - $60 an hour $30 - $60 30 60 25
## 37 \n$32 - $35 an hour $32 - $35 32 35 25
## 38 \n$25 - $45 an hour $25 - $45 25 45 25
## 39 \n$25 - $40 an hour $25 - $40 25 40 25
## 40 \n$25 - $40 an hour $25 - $40 25 40 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 27.5 42 22 69
## 2 40 27.5 42 22 69
## 4 40 27.5 42 22 69
## 6 40 27.5 42 22 69
## 8 40 27.5 42 22 69
## 9 40 27.5 42 22 69
## 10 40 27.5 42 22 69
## 11 40 27.5 42 22 69
## 12 40 27.5 42 22 69
## 14 40 27.5 42 22 69
## 18 40 27.5 42 22 69
## 19 40 27.5 42 22 69
## 20 40 27.5 42 22 69
## 21 40 27.5 42 22 69
## 22 40 27.5 42 22 69
## 26 40 27.5 42 22 69
## 27 40 27.5 42 22 69
## 30 40 27.5 42 22 69
## 31 40 27.5 42 22 69
## 34 40 27.5 42 22 69
## 35 40 27.5 42 22 69
## 36 40 27.5 42 22 69
## 37 40 27.5 42 22 69
## 38 40 27.5 42 22 69
## 39 40 27.5 42 22 69
## 40 40 27.5 42 22 69
##
## [[7]]
## city state
## 1 Charlotte NC
## 2 Charlotte NC
## 3 Charlotte NC
## 4 Charlotte NC
## 5 Charlotte NC
## 6 Charlotte NC
## 7 Charlotte NC
## 8 Charlotte NC
## 9 Charlotte NC
## 10 Charlotte NC
## 11 Charlotte NC
## 12 Charlotte NC
## 13 Charlotte NC
## 14 Charlotte NC
## 15 Charlotte NC
## 16 Charlotte NC
## 17 Charlotte NC
## 18 Charlotte NC
## 19 Charlotte NC
## 20 Charlotte NC
## 21 Charlotte NC
## 22 Charlotte NC
## 23 Charlotte NC
## 24 Charlotte NC
## 25 Charlotte NC
## 26 Charlotte NC
## 27 Charlotte NC
## 28 Charlotte NC
## 29 Charlotte NC
## 30 Charlotte NC
## 31 Charlotte NC
## 32 Charlotte NC
## 33 Charlotte NC
## 34 Charlotte NC
## 35 Charlotte NC
## 36 Charlotte NC
## 37 Charlotte NC
## 38 Charlotte NC
## 39 Charlotte NC
## 40 Charlotte NC
## 41 Charlotte NC
## 42 Charlotte NC
## 43 Charlotte NC
## 44 Charlotte NC
## 45 Charlotte NC
## 46 Charlotte NC
## 47 Charlotte NC
## 48 Charlotte NC
## 49 Charlotte NC
## 50 Charlotte NC
## 51 Charlotte NC
## 52 Charlotte NC
## 53 Charlotte NC
## 54 Charlotte NC
## 55 Charlotte NC
## 56 Charlotte NC
## 57 Charlotte NC
## 58 Charlotte NC
## 59 Charlotte NC
## 60 Charlotte NC
## 61 Charlotte NC
## 62 Charlotte NC
## 63 Charlotte NC
## 64 Charlotte NC
## 65 Charlotte NC
## 66 Charlotte NC
## 67 Charlotte NC
## 68 Charlotte NC
## 69 Charlotte NC
## 70 Charlotte NC
## 71 Charlotte NC
## 72 Charlotte NC
## 73 Charlotte NC
## 74 Charlotte NC
## 75 Charlotte NC
## 76 Charlotte NC
## 77 Charlotte NC
## 78 Charlotte NC
## 79 Charlotte NC
## 80 Charlotte NC
## 81 Charlotte NC
## 82 Charlotte NC
## 83 Charlotte NC
## 84 Charlotte NC
## 85 Charlotte NC
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist
## 5 Massage Therapist – Gastonia $25 - $45 an hour
## 6 Massage Therapist
## 7 Licensed Massage Therapist *Sign On Bonus!*
## 8 Licensed Massage Therapist - NO SELLING! Great Pay & Bonus
## 9 LifeSpa Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Licensed Massage Therapist, Independent Contractor
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist, Independent Contractor
## 15 Massage Therapist
## 16 Stretch Professional- Yoga, Massage Therapist, Personal Trai...
## 17 Massage Therapist – South Park $25 - $45 an hour
## 18 Licensed Massage Therapist
## 19 Massage Therapist - Full-Time
## 20 Massage Therapist – Gastonia $25 - $45 an hour
## 21 Licensed Massage Therapist
## 22 Flexologist (Stretch Professional)
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist *Sign On Bonus!*
## 27 Massage Therapist, Massage Envy Rivergate
## 28 Physical Therapy Assistants&Aspiring Physical Therapists- St...
## 29 Massage Therapist - Gastonia $25-$45 an Hour
## 30 Massage Therapist [CUSTOMIZATION REQUIRED]
## 31 Licensed Massage Therapists - Mooresville NC
## 32 Massage Therapist - PT [Flexible Schedule]
## 33 Massage Therapist - Part-Time
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist – South Park $25 - $45 an hour
## 39 Massage Therapist – Gastonia $25 - $45 an hour
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Massage Therapist, Massage Envy Rivergate
## 43 Physical Therapy Assistants&Aspiring Physical Therapists- St...
## 44 Massage Therapist - Gastonia $25-$45 an Hour
## 45 Massage Therapist [CUSTOMIZATION REQUIRED]
## 46 Licensed Massage Therapists - Mooresville NC
## 47 Massage Therapist - PT [Flexible Schedule]
## 48 Massage Therapist - Part-Time
## 49 Dual Licensed Therapist - Massage and Skincare
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist *Sign On Bonus!*
## 52 Massage Therapist
## 53 Licensed Massage Therapist *Sign On Bonus!*
## 54 Licensed Massage Therapist
## 55 Massage Therapist
## 56 Licensed Massage Therapist (LMT)
## 57 Massage Therapist – Gastonia $25 - $45 an hour
## 58 Massage Therapist
## 59 Massage Therapist – South Park $25 - $45 an hour
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Massage Therapist - Full Time - FAST GROWING LOCATION
## 63 Licensed Massage Therapist - FAST GROWING LOCATION
## 64 Dual Licensed Therapist - Massage & Skincare
## 65 Licensed Massage Therapist
## 66 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 67 Licensed Massage Therapists Needed - Full & Part Time (Moore...
## 68 Total Body Stretch Service Provider
## 69 Licensed Massage Therapist - NO SELLING! Great Pay & Bonus
## 70 Licensed Massage Therapist, Independent Contractor
## 71 Massage Therapist, Massage Envy Rivergate
## 72 Physical Therapy Assistants&Aspiring Physical Therapists- St...
## 73 Massage Therapist - Gastonia $25-$45 an Hour
## 74 Massage Therapist [CUSTOMIZATION REQUIRED]
## 75 Licensed Massage Therapists - Mooresville NC
## 76 Massage Therapist - PT [Flexible Schedule]
## 77 Massage Therapist - Part-Time
## 78 Dual Licensed Therapist - Massage and Skincare
## 79 Massage Therapist - Full Time - FAST GROWING LOCATION
## 80 Licensed Massage Therapist - FAST GROWING LOCATION
## 81 Dual Licensed Therapist - Massage & Skincare
## 82 Licensed Massage Therapist
## 83 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 84 Licensed Massage Therapists Needed - Full & Part Time (Moore...
## 85 Total Body Stretch Service Provider
## HiringAgency
## 1 VociMedSpaCharlotte, NC 28277 (Piper Glen Estates area)
## 2 100% Chiropractic4.0Cornelius, NC 28031
## 3 Urbana Spa - South Charlotte3.0Charlotte, NC 28226 (Carmel area)
## 4 Soothe3.7Charlotte, NC
## 5 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 6 haring chiropracticClover, SC 29710
## 7 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 8 Zen Massage Huntersville / CorneliusHuntersville, NC 28078
## 9 Life Time3.6Charlotte, NC
## 10 Indo-Pak Massage TherapyCharlotte, NC•Remote work available
## 11 Building Bodies LLCCharlotte, NC
## 12 Hands & Hearts StaffingCharlotte, NC
## 13 Elements3.6Charlotte, NC 28210 (Beverly Woods area)
## 14 Natural Bliss Body StudioHarrisburg, NC 28075
## 15 Charlotte BodyworksCharlotte, NC 28273 (Yorkshire area)
## 16 StretchLab3.8Charlotte, NC
## 17 ME Devco DBA Massage Envy3.2Charlotte, NC 28211
## 18 Hand & Stone - SouthPark3.0Charlotte, NC 28211
## 19 Massage Envy3.2Matthews, NC 28105
## 20 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 21 Massage Heights3.1Charlotte, NC 28203 (Dilworth area)+2 locations
## 22 StretchLab3.8Charlotte, NC+1 location
## 23 Massage Heights - Charlotte3.1Matthews, NC 28105+1 location
## 24 Soothe3.7Charlotte, NC
## 25 Hand & Stone - MooresvilleMooresville, NC 28117
## 26 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 27 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)
## 28 StretchLab3.8Charlotte, NC
## 29 Massage Envy3.2Gastonia, NC 28054
## 30 Massage Envy3.2Waxhaw, NC 28173
## 31 Zen Massage MooresvilleMooresville, NC 28117
## 32 Massage Envy3.2Indian Trail, NC 28079
## 33 Massage Envy3.2Matthews, NC 28105
## 34 Urbana Spa - South Charlotte3.0Charlotte, NC 28226 (Carmel area)
## 35 haring chiropracticClover, SC 29710
## 36 Hand & Stone - SouthPark3.0Charlotte, NC 28211
## 37 100% Chiropractic4.0Cornelius, NC 28031
## 38 ME Devco DBA Massage Envy3.2Charlotte, NC 28211
## 39 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 40 Massage Heights - Charlotte3.1Matthews, NC 28105+1 location
## 41 Hand & Stone - MooresvilleMooresville, NC 28117
## 42 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)
## 43 StretchLab3.8Charlotte, NC
## 44 Massage Envy3.2Gastonia, NC 28054
## 45 Massage Envy3.2Waxhaw, NC 28173
## 46 Zen Massage MooresvilleMooresville, NC 28117
## 47 Massage Envy3.2Indian Trail, NC 28079
## 48 Massage Envy3.2Matthews, NC 28105
## 49 Massage Heights3.1Matthews, NC 28105+1 location
## 50 Soothe3.7Charlotte, NC
## 51 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 52 VociMedSpaCharlotte, NC 28277 (Piper Glen Estates area)
## 53 Massage Heights Jetton Village3.1Cornelius, NC 28031
## 54 Soothe3.7Charlotte, NC
## 55 haring chiropracticClover, SC 29710
## 56 Urbana Spa - South Charlotte3.0Charlotte, NC 28226 (Carmel area)
## 57 ME Devco DBA Massage Envy3.2Gastonia, NC 28054
## 58 VociMedSpaCharlotte, NC 28277 (Piper Glen Estates area)
## 59 ME Devco DBA Massage Envy3.2Charlotte, NC 28211
## 60 100% Chiropractic4.0Cornelius, NC 28031
## 61 Hand & Stone - SouthPark3.0Charlotte, NC 28211
## 62 Massage Envy3.2Indian Trail, NC 28079
## 63 Massage Envy3.2Indian Trail, NC 28079
## 64 Massage Heights3.1Charlotte, NC 28211 (Cotswold area)
## 65 Oasis Dentistry2.8Concord, NC 28027
## 66 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)+1 location
## 67 Zen Massage MooresvilleMooresville, NC 28117
## 68 Massage Envy3.2Mooresville, NC 28117
## 69 Zen Massage Huntersville / CorneliusHuntersville, NC 28078
## 70 Lifeworks on lake normanMooresville, NC 28117
## 71 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)
## 72 StretchLab3.8Charlotte, NC
## 73 Massage Envy3.2Gastonia, NC 28054
## 74 Massage Envy3.2Waxhaw, NC 28173
## 75 Zen Massage MooresvilleMooresville, NC 28117
## 76 Massage Envy3.2Indian Trail, NC 28079
## 77 Massage Envy3.2Matthews, NC 28105
## 78 Massage Heights3.1Matthews, NC 28105+1 location
## 79 Massage Envy3.2Indian Trail, NC 28079
## 80 Massage Envy3.2Indian Trail, NC 28079
## 81 Massage Heights3.1Charlotte, NC 28211 (Cotswold area)
## 82 Oasis Dentistry2.8Concord, NC 28027
## 83 Massage Envy3.2Charlotte, NC 28273 (Yorkshire area)+1 location
## 84 Zen Massage MooresvilleMooresville, NC 28117
## 85 Massage Envy3.2Mooresville, NC 28117
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 25 22 69 35000 60000
## 2 Today 22 69 35000 60000
## 3 30 22 69 35000 60000
## 4 24 22 69 35000 60000
## 5 30 22 69 35000 60000
## 6 13 22 69 35000 60000
## 7 20 22 69 35000 60000
## 8 Just posted 22 69 35000 60000
## 9 8 22 69 35000 60000
## 10 5 22 69 35000 60000
## 11 19 22 69 35000 60000
## 12 29 22 69 35000 60000
## 13 30 22 69 35000 60000
## 14 Just posted 22 69 35000 60000
## 15 30 22 69 35000 60000
## 16 30 22 69 35000 60000
## 17 30 22 69 35000 60000
## 18 10 22 69 35000 60000
## 19 30 22 69 35000 60000
## 20 30 22 69 35000 60000
## 21 30 22 69 35000 60000
## 22 30 22 69 35000 60000
## 23 28 22 69 35000 60000
## 24 24 22 69 35000 60000
## 25 23 22 69 35000 60000
## 26 20 22 69 35000 60000
## 27 30 22 69 35000 60000
## 28 30 22 69 35000 60000
## 29 30 22 69 35000 60000
## 30 30 22 69 35000 60000
## 31 10 22 69 35000 60000
## 32 30 22 69 35000 60000
## 33 30 22 69 35000 60000
## 34 30 22 69 35000 60000
## 35 13 22 69 35000 60000
## 36 10 22 69 35000 60000
## 37 Today 22 69 35000 60000
## 38 30 22 69 35000 60000
## 39 30 22 69 35000 60000
## 40 28 22 69 35000 60000
## 41 23 22 69 35000 60000
## 42 30 22 69 35000 60000
## 43 30 22 69 35000 60000
## 44 30 22 69 35000 60000
## 45 30 22 69 35000 60000
## 46 10 22 69 35000 60000
## 47 30 22 69 35000 60000
## 48 30 22 69 35000 60000
## 49 30 22 69 35000 60000
## 50 24 22 69 35000 60000
## 51 20 22 69 35000 60000
## 52 25 22 69 35000 60000
## 53 20 22 69 35000 60000
## 54 24 22 69 35000 60000
## 55 13 22 69 35000 60000
## 56 30 22 69 35000 60000
## 57 30 22 69 35000 60000
## 58 25 22 69 35000 60000
## 59 30 22 69 35000 60000
## 60 Today 22 69 35000 60000
## 61 10 22 69 35000 60000
## 62 30 22 69 35000 60000
## 63 30 22 69 35000 60000
## 64 30 22 69 35000 60000
## 65 30 22 69 35000 60000
## 66 30 22 69 35000 60000
## 67 10 22 69 35000 60000
## 68 30 22 69 35000 60000
## 69 Just posted 22 69 35000 60000
## 70 21 22 69 35000 60000
## 71 30 22 69 35000 60000
## 72 30 22 69 35000 60000
## 73 30 22 69 35000 60000
## 74 30 22 69 35000 60000
## 75 10 22 69 35000 60000
## 76 30 22 69 35000 60000
## 77 30 22 69 35000 60000
## 78 30 22 69 35000 60000
## 79 30 22 69 35000 60000
## 80 30 22 69 35000 60000
## 81 30 22 69 35000 60000
## 82 30 22 69 35000 60000
## 83 30 22 69 35000 60000
## 84 10 22 69 35000 60000
## 85 30 22 69 35000 60000
getIndeedJobData5pages('massage therapist', 'Raleigh','NC')
## Warning in getIndeedJobData5pages("massage therapist", "Raleigh", "NC"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Raleigh", "NC"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT) Full or Part time, *Signing...
## 2 Licensed Massage Therapist
## 3 FT/PT Massage Therapist at Sukho Thai Massage Raleigh ($25-$...
## 4 Massage Therapist - Join Our Spa Family (15 mins between cli...
## 5 The Cypress - Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 WakeMed NORTH - Massage Therapist
## 9 RDU- Licensed Massage Therapist-$60-93/hour: Corporation and...
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist - Independent Contractor
## 15 Join our Amazing Team! Licensed Massage Therapist (LMT)
## 16 Licensed Massage Therapist (LMT), *SIGNING BONUS* Part or Fu...
## 17 Licensed Massage Therapist
## 18 Join our Amazing Team! Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist (LMT), *SIGNING BONUS* Part or Fu...
## 20 Licensed Massage Therapist (LMT) Full or Part time, *Signing...
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist
## 25 Massage Therapist- Full or Part Time (Raleigh, NC)
## 26 Massage Therapist
## 27 Mobile Massage Therapist
## 28 Licensed Massage Therapist
## 29 FT/PT Licensed Massage Therapist
## 30 Part-time Massage Therapist
## 31 Massage Therapist - Join Our Spa Family (15 mins between cli...
## 32 FT/PT Massage Therapist at Sukho Thai Massage Raleigh ($25-$...
## 33 massage therapist
## 34 Massage Therapists - Flexible Work Schedule Full Time
## 35 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 36 Independent Contractor (Medical) Esthetician, Makeup Artist,...
## 37 Mobile Massage Therapist
## 38 Licensed Massage Therapist
## 39 FT/PT Licensed Massage Therapist
## 40 Part-time Massage Therapist
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations!
## 44 Flexologist (Stretch Professional)
## 45 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations! Fle...
## 46 Licensed Massage Therapist (LMBT)
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist- Great Bonus
## 49 Massage Therapists - Flexible Work Schedule Full Time
## 50 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 51 Independent Contractor (Medical) Esthetician, Makeup Artist,...
## 52 Mobile Massage Therapist
## 53 Licensed Massage Therapist
## 54 FT/PT Licensed Massage Therapist
## 55 Part-time Massage Therapist
## 56 Licensed Massage Therapist
## 57 Massage Therapist
## 58 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations!
## 59 Flexologist (Stretch Professional)
## 60 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations! Fle...
## 61 Licensed Massage Therapist (LMBT)
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist- Great Bonus
## 64 Massage Therapists - Flexible Work Schedule Full Time
## 65 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 66 Independent Contractor (Medical) Esthetician, Makeup Artist,...
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25 - $30 an hour $25 - $30 25 30
## 2 \n$35 - $50 an hour $35 - $50 35 50
## 3 \n$60 - $93 an hour $60 - $93 60 93
## 4 \n$30 - $45 an hour $30 - $45 30 45
## 5 \n$18 - $21 an hour $18 - $21 18 21
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$27 - $45 an hour $27 - $45 27 45
## 8 \n$27 - $45 an hour $27 - $45 27 45
## 9 \n$24 an hour $24 24 NA
## 10 \n$45 - $70 an hour $45 - $70 45 70
## 11 \n$16 - $26 an hour $16 - $26 16 26
## 12 \n$700 - $950 a week $700 - $950 a week 700 NA
## 13 \n$26 - $30 an hour $26 - $30 26 30
## 14 \n$35 - $50 an hour $35 - $50 35 50
## 15 \n$25 - $30 an hour $25 - $30 25 30
## 16 \n$30 - $45 an hour $30 - $45 30 45
## 17 \nFrom $18 an hour $18 18 NA
## 18 \n$2,900 - $5,900 a month $2900 - $5900 2900 5900
## 19 \n$45 - $70 an hour $45 - $70 45 70
## 20 \n$16 - $26 an hour $16 - $26 16 26
## 21 \n$700 - $950 a week $700 - $950 a week 700 NA
## 22 \n$26 - $30 an hour $26 - $30 26 30
## 23 \n$15,000 - $60,000 a year $15000 - $60000 15000 60000
## 24 \n$700 - $950 a week $700 - $950 a week 700 NA
## 25 \n$700 - $950 a week $700 - $950 a week 700 NA
## 26 \n$30 - $40 an hour $30 - $40 30 40
## 27 \nFrom $18 an hour $18 18 NA
## 28 \n$2,900 - $5,900 a month $2900 - $5900 2900 5900
## 29 \n$45 - $70 an hour $45 - $70 45 70
## 30 \n$16 - $26 an hour $16 - $26 16 26
## 31 \n$700 - $950 a week $700 - $950 a week 700 NA
## 32 \n$26 - $30 an hour $26 - $30 26 30
## 33 \n$15,000 - $60,000 a year $15000 - $60000 15000 60000
## 34 \n$700 - $950 a week $700 - $950 a week 700 NA
## 35 \n$700 - $950 a week $700 - $950 a week 700 NA
## 36 \n$30 - $40 an hour $30 - $40 30 40
## 37 \nFrom $18 an hour $18 18 NA
## 38 \n$2,900 - $5,900 a month $2900 - $5900 2900 5900
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 32.5 45 1297.658 3075.738 16
## 2 32.5 45 1297.658 3075.738 16
## 3 32.5 45 1297.658 3075.738 16
## 4 32.5 45 1297.658 3075.738 16
## 5 32.5 45 1297.658 3075.738 16
## 6 32.5 45 1297.658 3075.738 16
## 7 32.5 45 1297.658 3075.738 16
## 8 32.5 45 1297.658 3075.738 16
## 9 32.5 45 1297.658 3075.738 16
## 10 32.5 45 1297.658 3075.738 16
## 11 32.5 45 1297.658 3075.738 16
## 12 32.5 45 1297.658 3075.738 16
## 13 32.5 45 1297.658 3075.738 16
## 14 32.5 45 1297.658 3075.738 16
## 15 32.5 45 1297.658 3075.738 16
## 16 32.5 45 1297.658 3075.738 16
## 17 32.5 45 1297.658 3075.738 16
## 18 32.5 45 1297.658 3075.738 16
## 19 32.5 45 1297.658 3075.738 16
## 20 32.5 45 1297.658 3075.738 16
## 21 32.5 45 1297.658 3075.738 16
## 22 32.5 45 1297.658 3075.738 16
## 23 32.5 45 1297.658 3075.738 16
## 24 32.5 45 1297.658 3075.738 16
## 25 32.5 45 1297.658 3075.738 16
## 26 32.5 45 1297.658 3075.738 16
## 27 32.5 45 1297.658 3075.738 16
## 28 32.5 45 1297.658 3075.738 16
## 29 32.5 45 1297.658 3075.738 16
## 30 32.5 45 1297.658 3075.738 16
## 31 32.5 45 1297.658 3075.738 16
## 32 32.5 45 1297.658 3075.738 16
## 33 32.5 45 1297.658 3075.738 16
## 34 32.5 45 1297.658 3075.738 16
## 35 32.5 45 1297.658 3075.738 16
## 36 32.5 45 1297.658 3075.738 16
## 37 32.5 45 1297.658 3075.738 16
## 38 32.5 45 1297.658 3075.738 16
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
## 31 60000
## 32 60000
## 33 60000
## 34 60000
## 35 60000
## 36 60000
## 37 60000
## 38 60000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 6
## 3 25
## 4 30
## 5 30
## 6 30
## 7 Just posted
## 8 30
## 9 Today
## 10 13
## 11 14
## 12 30
## 13 30
## 14 5
## 15 30
## 16 30
## 17 6
## 18 30
## 19 30
## 20 30
## 21 6
## 22 7
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 30
## 29 4
## 30 29
## 31 30
## 32 25
## 33 30
## 34 30
## 35 30
## 36 30
## 37 30
## 38 30
## 39 4
## 40 29
## 41 30
## 42 17
## 43 30
## 44 30
## 45 30
## 46 30
## 47 30
## 48 27
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 4
## 55 29
## 56 30
## 57 17
## 58 30
## 59 30
## 60 30
## 61 30
## 62 30
## 63 27
## 64 30
## 65 30
## 66 30
##
## [[4]]
## HiringAgency
## 1 MassageLuXe3.0Apex, NC 27502
## 2 Holistic Vitality CenterRaleigh-Durham, NC
## 3 Lighthouse Lab Services5.0Raleigh, NC
## 4 Hand and Stone Massage and Facial Spa Cameron Village3.0Raleigh, NC (Hillsborough area)
## 5 Skin Sense2.4Raleigh, NC (North Raleigh area)
## 6 Skin Sense2.4Raleigh, NC 27615 (North Raleigh area)
## 7 Massage Envy3.2Raleigh, NC 27612 (Northwest Raleigh area)+7 locations
## 8 Skin Sense2.4Raleigh, NC (North Raleigh area)
## 9 Spa Utopia (Luxury - On-demand Spa)2.0Raleigh-Durham, NC
## 10 Hands & Hearts StaffingRaleigh-Durham, NC
## 11 Triangle Spine CenterRaleigh, NC 27617 (Northwest Raleigh area)
## 12 Life Time3.6Raleigh, NC
## 13 Synergy Face & BodyRaleigh, NC
## 14 Indo-Pak Massage TherapyRaleigh, NC+1 location•Remote work available
## 15 LaVida Massage3.7Raleigh-Durham, NC
## 16 MassageLuXe3.0Raleigh, NC 27613 (North Raleigh area)
## 17 Holistic Vitality CenterRaleigh-Durham, NC
## 18 LaVida Massage3.7Raleigh-Durham, NC
## 19 MassageLuXe3.0Raleigh, NC 27613 (North Raleigh area)
## 20 MassageLuXe3.0Apex, NC 27502
## 21 BODY RESTORATION massage & bodyworkHolly Springs, NC 27540
## 22 Hand & Stone - Fuquay VarinaFuquay-Varina, NC 27526
## 23 Hand and Stone3.0Raleigh, NC 27605 (Hillsborough area)+3 locations
## 24 Structure House4.3Durham, NC 27705
## 25 The NOW, LLCRaleigh, NC 27609 (Falls Of Neuse area)
## 26 Plus One Health Management3.8Durham, NC
## 27 Indo-Pak Massage TherapyCary, NC
## 28 Gorgeous Glam LLCSmithfield, NC 27577
## 29 Massage Envy3.2Durham, NC 27713+1 location
## 30 Case Chiropractic, Inc.Apex, NC 27502
## 31 Hand and Stone Massage and Facial Spa Cameron Village3.0Raleigh, NC (Hillsborough area)
## 32 Lighthouse Lab Services5.0Raleigh, NC
## 33 Wellville Massage & Healing ArtsDurham, NC 27707 (Tuscaloosa-Lakewood area)
## 34 Massage Envy3.2Wake Forest, NC 27587
## 35 Massage Envy3.2Raleigh, NC 27613 (Northwest Raleigh area)+1 location
## 36 FAB StudioWake Forest, NC 27587
## 37 Indo-Pak Massage TherapyCary, NC
## 38 Gorgeous Glam LLCSmithfield, NC 27577
## 39 Massage Envy3.2Durham, NC 27713+1 location
## 40 Case Chiropractic, Inc.Apex, NC 27502
## 41 Tranquillity SpaAngier, NC 27501
## 42 Serasana Holly SpringsHolly Springs, NC 27540
## 43 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 44 AMO Investment Holdings, LLC dba/Stretch LabCary, NC 27518+1 location
## 45 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 46 Hand & Stone Massage and Facial Spa3.0Raleigh-Durham, NC
## 47 Massage Destination3.5Wake Forest, NC 27587
## 48 ECNR Massage and Facial Store No 7 LLCApex, NC 27502
## 49 Massage Envy3.2Wake Forest, NC 27587
## 50 Massage Envy3.2Raleigh, NC 27613 (Northwest Raleigh area)+1 location
## 51 FAB StudioWake Forest, NC 27587
## 52 Indo-Pak Massage TherapyCary, NC
## 53 Gorgeous Glam LLCSmithfield, NC 27577
## 54 Massage Envy3.2Durham, NC 27713+1 location
## 55 Case Chiropractic, Inc.Apex, NC 27502
## 56 Tranquillity SpaAngier, NC 27501
## 57 Serasana Holly SpringsHolly Springs, NC 27540
## 58 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 59 AMO Investment Holdings, LLC dba/Stretch LabCary, NC 27518+1 location
## 60 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 61 Hand & Stone Massage and Facial Spa3.0Raleigh-Durham, NC
## 62 Massage Destination3.5Wake Forest, NC 27587
## 63 ECNR Massage and Facial Store No 7 LLCApex, NC 27502
## 64 Massage Envy3.2Wake Forest, NC 27587
## 65 Massage Envy3.2Raleigh, NC 27613 (Northwest Raleigh area)+1 location
## 66 FAB StudioWake Forest, NC 27587
##
## [[5]]
## Salary salary minSalary maxSalary
## 23 \n$15,000 - $60,000 a year $15000 - $60000 15000 60000
## 33 \n$15,000 - $60,000 a year $15000 - $60000 15000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 23 15000 60000 15000 60000 15000
## 33 15000 60000 15000 60000 15000
## maximumMaxSalary
## 23 60000
## 33 60000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$25 - $30 an hour $25 - $30 25 30 26
## 2 \n$35 - $50 an hour $35 - $50 35 50 26
## 3 \n$60 - $93 an hour $60 - $93 60 93 26
## 4 \n$30 - $45 an hour $30 - $45 30 45 26
## 5 \n$18 - $21 an hour $18 - $21 18 21 26
## 7 \n$27 - $45 an hour $27 - $45 27 45 26
## 8 \n$27 - $45 an hour $27 - $45 27 45 26
## 9 \n$24 an hour $24 24 NA 26
## 10 \n$45 - $70 an hour $45 - $70 45 70 26
## 11 \n$16 - $26 an hour $16 - $26 16 26 26
## 13 \n$26 - $30 an hour $26 - $30 26 30 26
## 14 \n$35 - $50 an hour $35 - $50 35 50 26
## 15 \n$25 - $30 an hour $25 - $30 25 30 26
## 16 \n$30 - $45 an hour $30 - $45 30 45 26
## 17 \nFrom $18 an hour $18 18 NA 26
## 19 \n$45 - $70 an hour $45 - $70 45 70 26
## 20 \n$16 - $26 an hour $16 - $26 16 26 26
## 22 \n$26 - $30 an hour $26 - $30 26 30 26
## 26 \n$30 - $40 an hour $30 - $40 30 40 26
## 27 \nFrom $18 an hour $18 18 NA 26
## 29 \n$45 - $70 an hour $45 - $70 45 70 26
## 30 \n$16 - $26 an hour $16 - $26 16 26 26
## 32 \n$26 - $30 an hour $26 - $30 26 30 26
## 36 \n$30 - $40 an hour $30 - $40 30 40 26
## 37 \nFrom $18 an hour $18 18 NA 26
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 28.44 43.42857 16 93
## 2 40 28.44 43.42857 16 93
## 3 40 28.44 43.42857 16 93
## 4 40 28.44 43.42857 16 93
## 5 40 28.44 43.42857 16 93
## 7 40 28.44 43.42857 16 93
## 8 40 28.44 43.42857 16 93
## 9 40 28.44 43.42857 16 93
## 10 40 28.44 43.42857 16 93
## 11 40 28.44 43.42857 16 93
## 13 40 28.44 43.42857 16 93
## 14 40 28.44 43.42857 16 93
## 15 40 28.44 43.42857 16 93
## 16 40 28.44 43.42857 16 93
## 17 40 28.44 43.42857 16 93
## 19 40 28.44 43.42857 16 93
## 20 40 28.44 43.42857 16 93
## 22 40 28.44 43.42857 16 93
## 26 40 28.44 43.42857 16 93
## 27 40 28.44 43.42857 16 93
## 29 40 28.44 43.42857 16 93
## 30 40 28.44 43.42857 16 93
## 32 40 28.44 43.42857 16 93
## 36 40 28.44 43.42857 16 93
## 37 40 28.44 43.42857 16 93
##
## [[7]]
## city state
## 1 Raleigh NC
## 2 Raleigh NC
## 3 Raleigh NC
## 4 Raleigh NC
## 5 Raleigh NC
## 6 Raleigh NC
## 7 Raleigh NC
## 8 Raleigh NC
## 9 Raleigh NC
## 10 Raleigh NC
## 11 Raleigh NC
## 12 Raleigh NC
## 13 Raleigh NC
## 14 Raleigh NC
## 15 Raleigh NC
## 16 Raleigh NC
## 17 Raleigh NC
## 18 Raleigh NC
## 19 Raleigh NC
## 20 Raleigh NC
## 21 Raleigh NC
## 22 Raleigh NC
## 23 Raleigh NC
## 24 Raleigh NC
## 25 Raleigh NC
## 26 Raleigh NC
## 27 Raleigh NC
## 28 Raleigh NC
## 29 Raleigh NC
## 30 Raleigh NC
## 31 Raleigh NC
## 32 Raleigh NC
## 33 Raleigh NC
## 34 Raleigh NC
## 35 Raleigh NC
## 36 Raleigh NC
## 37 Raleigh NC
## 38 Raleigh NC
## 39 Raleigh NC
## 40 Raleigh NC
## 41 Raleigh NC
## 42 Raleigh NC
## 43 Raleigh NC
## 44 Raleigh NC
## 45 Raleigh NC
## 46 Raleigh NC
## 47 Raleigh NC
## 48 Raleigh NC
## 49 Raleigh NC
## 50 Raleigh NC
## 51 Raleigh NC
## 52 Raleigh NC
## 53 Raleigh NC
## 54 Raleigh NC
## 55 Raleigh NC
## 56 Raleigh NC
## 57 Raleigh NC
## 58 Raleigh NC
## 59 Raleigh NC
## 60 Raleigh NC
## 61 Raleigh NC
## 62 Raleigh NC
## 63 Raleigh NC
## 64 Raleigh NC
## 65 Raleigh NC
## 66 Raleigh NC
## jobTitle
## 1 Licensed Massage Therapist (LMT) Full or Part time, *Signing...
## 2 Licensed Massage Therapist
## 3 FT/PT Massage Therapist at Sukho Thai Massage Raleigh ($25-$...
## 4 Massage Therapist - Join Our Spa Family (15 mins between cli...
## 5 The Cypress - Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 WakeMed NORTH - Massage Therapist
## 9 RDU- Licensed Massage Therapist-$60-93/hour: Corporation and...
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist - Independent Contractor
## 15 Join our Amazing Team! Licensed Massage Therapist (LMT)
## 16 Licensed Massage Therapist (LMT), *SIGNING BONUS* Part or Fu...
## 17 Licensed Massage Therapist
## 18 Join our Amazing Team! Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist (LMT), *SIGNING BONUS* Part or Fu...
## 20 Licensed Massage Therapist (LMT) Full or Part time, *Signing...
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist
## 25 Massage Therapist- Full or Part Time (Raleigh, NC)
## 26 Massage Therapist
## 27 Mobile Massage Therapist
## 28 Licensed Massage Therapist
## 29 FT/PT Licensed Massage Therapist
## 30 Part-time Massage Therapist
## 31 Massage Therapist - Join Our Spa Family (15 mins between cli...
## 32 FT/PT Massage Therapist at Sukho Thai Massage Raleigh ($25-$...
## 33 massage therapist
## 34 Massage Therapists - Flexible Work Schedule Full Time
## 35 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 36 Independent Contractor (Medical) Esthetician, Makeup Artist,...
## 37 Mobile Massage Therapist
## 38 Licensed Massage Therapist
## 39 FT/PT Licensed Massage Therapist
## 40 Part-time Massage Therapist
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations!
## 44 Flexologist (Stretch Professional)
## 45 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations! Fle...
## 46 Licensed Massage Therapist (LMBT)
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist- Great Bonus
## 49 Massage Therapists - Flexible Work Schedule Full Time
## 50 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 51 Independent Contractor (Medical) Esthetician, Makeup Artist,...
## 52 Mobile Massage Therapist
## 53 Licensed Massage Therapist
## 54 FT/PT Licensed Massage Therapist
## 55 Part-time Massage Therapist
## 56 Licensed Massage Therapist
## 57 Massage Therapist
## 58 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations!
## 59 Flexologist (Stretch Professional)
## 60 Massage Therapist- FT/PT- Raleigh/Durham/Cary locations! Fle...
## 61 Licensed Massage Therapist (LMBT)
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist- Great Bonus
## 64 Massage Therapists - Flexible Work Schedule Full Time
## 65 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 66 Independent Contractor (Medical) Esthetician, Makeup Artist,...
## HiringAgency
## 1 MassageLuXe3.0Apex, NC 27502
## 2 Holistic Vitality CenterRaleigh-Durham, NC
## 3 Lighthouse Lab Services5.0Raleigh, NC
## 4 Hand and Stone Massage and Facial Spa Cameron Village3.0Raleigh, NC (Hillsborough area)
## 5 Skin Sense2.4Raleigh, NC (North Raleigh area)
## 6 Skin Sense2.4Raleigh, NC 27615 (North Raleigh area)
## 7 Massage Envy3.2Raleigh, NC 27612 (Northwest Raleigh area)+7 locations
## 8 Skin Sense2.4Raleigh, NC (North Raleigh area)
## 9 Spa Utopia (Luxury - On-demand Spa)2.0Raleigh-Durham, NC
## 10 Hands & Hearts StaffingRaleigh-Durham, NC
## 11 Triangle Spine CenterRaleigh, NC 27617 (Northwest Raleigh area)
## 12 Life Time3.6Raleigh, NC
## 13 Synergy Face & BodyRaleigh, NC
## 14 Indo-Pak Massage TherapyRaleigh, NC+1 location•Remote work available
## 15 LaVida Massage3.7Raleigh-Durham, NC
## 16 MassageLuXe3.0Raleigh, NC 27613 (North Raleigh area)
## 17 Holistic Vitality CenterRaleigh-Durham, NC
## 18 LaVida Massage3.7Raleigh-Durham, NC
## 19 MassageLuXe3.0Raleigh, NC 27613 (North Raleigh area)
## 20 MassageLuXe3.0Apex, NC 27502
## 21 BODY RESTORATION massage & bodyworkHolly Springs, NC 27540
## 22 Hand & Stone - Fuquay VarinaFuquay-Varina, NC 27526
## 23 Hand and Stone3.0Raleigh, NC 27605 (Hillsborough area)+3 locations
## 24 Structure House4.3Durham, NC 27705
## 25 The NOW, LLCRaleigh, NC 27609 (Falls Of Neuse area)
## 26 Plus One Health Management3.8Durham, NC
## 27 Indo-Pak Massage TherapyCary, NC
## 28 Gorgeous Glam LLCSmithfield, NC 27577
## 29 Massage Envy3.2Durham, NC 27713+1 location
## 30 Case Chiropractic, Inc.Apex, NC 27502
## 31 Hand and Stone Massage and Facial Spa Cameron Village3.0Raleigh, NC (Hillsborough area)
## 32 Lighthouse Lab Services5.0Raleigh, NC
## 33 Wellville Massage & Healing ArtsDurham, NC 27707 (Tuscaloosa-Lakewood area)
## 34 Massage Envy3.2Wake Forest, NC 27587
## 35 Massage Envy3.2Raleigh, NC 27613 (Northwest Raleigh area)+1 location
## 36 FAB StudioWake Forest, NC 27587
## 37 Indo-Pak Massage TherapyCary, NC
## 38 Gorgeous Glam LLCSmithfield, NC 27577
## 39 Massage Envy3.2Durham, NC 27713+1 location
## 40 Case Chiropractic, Inc.Apex, NC 27502
## 41 Tranquillity SpaAngier, NC 27501
## 42 Serasana Holly SpringsHolly Springs, NC 27540
## 43 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 44 AMO Investment Holdings, LLC dba/Stretch LabCary, NC 27518+1 location
## 45 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 46 Hand & Stone Massage and Facial Spa3.0Raleigh-Durham, NC
## 47 Massage Destination3.5Wake Forest, NC 27587
## 48 ECNR Massage and Facial Store No 7 LLCApex, NC 27502
## 49 Massage Envy3.2Wake Forest, NC 27587
## 50 Massage Envy3.2Raleigh, NC 27613 (Northwest Raleigh area)+1 location
## 51 FAB StudioWake Forest, NC 27587
## 52 Indo-Pak Massage TherapyCary, NC
## 53 Gorgeous Glam LLCSmithfield, NC 27577
## 54 Massage Envy3.2Durham, NC 27713+1 location
## 55 Case Chiropractic, Inc.Apex, NC 27502
## 56 Tranquillity SpaAngier, NC 27501
## 57 Serasana Holly SpringsHolly Springs, NC 27540
## 58 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 59 AMO Investment Holdings, LLC dba/Stretch LabCary, NC 27518+1 location
## 60 Massage Envy3.2Raleigh, NC 27609 (Falls of Neuse area)
## 61 Hand & Stone Massage and Facial Spa3.0Raleigh-Durham, NC
## 62 Massage Destination3.5Wake Forest, NC 27587
## 63 ECNR Massage and Facial Store No 7 LLCApex, NC 27502
## 64 Massage Envy3.2Wake Forest, NC 27587
## 65 Massage Envy3.2Raleigh, NC 27613 (Northwest Raleigh area)+1 location
## 66 FAB StudioWake Forest, NC 27587
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 16 93 15000 60000
## 2 6 16 93 15000 60000
## 3 25 16 93 15000 60000
## 4 30 16 93 15000 60000
## 5 30 16 93 15000 60000
## 6 30 16 93 15000 60000
## 7 Just posted 16 93 15000 60000
## 8 30 16 93 15000 60000
## 9 Today 16 93 15000 60000
## 10 13 16 93 15000 60000
## 11 14 16 93 15000 60000
## 12 30 16 93 15000 60000
## 13 30 16 93 15000 60000
## 14 5 16 93 15000 60000
## 15 30 16 93 15000 60000
## 16 30 16 93 15000 60000
## 17 6 16 93 15000 60000
## 18 30 16 93 15000 60000
## 19 30 16 93 15000 60000
## 20 30 16 93 15000 60000
## 21 6 16 93 15000 60000
## 22 7 16 93 15000 60000
## 23 30 16 93 15000 60000
## 24 30 16 93 15000 60000
## 25 30 16 93 15000 60000
## 26 30 16 93 15000 60000
## 27 30 16 93 15000 60000
## 28 30 16 93 15000 60000
## 29 4 16 93 15000 60000
## 30 29 16 93 15000 60000
## 31 30 16 93 15000 60000
## 32 25 16 93 15000 60000
## 33 30 16 93 15000 60000
## 34 30 16 93 15000 60000
## 35 30 16 93 15000 60000
## 36 30 16 93 15000 60000
## 37 30 16 93 15000 60000
## 38 30 16 93 15000 60000
## 39 4 16 93 15000 60000
## 40 29 16 93 15000 60000
## 41 30 16 93 15000 60000
## 42 17 16 93 15000 60000
## 43 30 16 93 15000 60000
## 44 30 16 93 15000 60000
## 45 30 16 93 15000 60000
## 46 30 16 93 15000 60000
## 47 30 16 93 15000 60000
## 48 27 16 93 15000 60000
## 49 30 16 93 15000 60000
## 50 30 16 93 15000 60000
## 51 30 16 93 15000 60000
## 52 30 16 93 15000 60000
## 53 30 16 93 15000 60000
## 54 4 16 93 15000 60000
## 55 29 16 93 15000 60000
## 56 30 16 93 15000 60000
## 57 17 16 93 15000 60000
## 58 30 16 93 15000 60000
## 59 30 16 93 15000 60000
## 60 30 16 93 15000 60000
## 61 30 16 93 15000 60000
## 62 30 16 93 15000 60000
## 63 27 16 93 15000 60000
## 64 30 16 93 15000 60000
## 65 30 16 93 15000 60000
## 66 30 16 93 15000 60000
getIndeedJobData5pages('massage therapist', 'Greensboro','NC')
## Warning in getIndeedJobData5pages("massage therapist", "Greensboro", "NC"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist (LMT)
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist (LMT)
## 8 Massage Therapist
## 9 Certified Massage Therapist
## 10 Mobile Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist - Independent Contractor
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist
## 18 Certified Massage Therapist
## 19 Mobile Massage Therapist
## 20 Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist (LMT)
## 25 Massage Therapist
## 26 Certified Massage Therapist
## 27 Mobile Massage Therapist
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist (LMT)
## 34 Massage Therapist - Independent Contractor
## 35 Licensed Massage Therapist (LMT)
## 36 Massage Therapist
## 37 Certified Massage Therapist
## 38 Mobile Massage Therapist
## 39 Massage Therapist
## 40 Licensed Massage Therapist (LMT)
## 41 Massage Therapist - Independent Contractor
## 42 Licensed Massage Therapist (LMT)
## 43 Massage Therapist
## 44 Certified Massage Therapist
## 45 Mobile Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 2 \n$775 - $950 a week $775 - $950 a week 775 NA
## 3 \n$20 - $31 an hour $20 - $31 20 31
## 4 \n$30 - $45 an hour $30 - $45 30 45
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$700 - $989 a week $700 - $989 a week 700 NA
## 7 \n$775 - $950 a week $775 - $950 a week 775 NA
## 8 \n$20 - $25 an hour $20 - $25 20 25
## 9 \n$45 - $70 an hour $45 - $70 45 70
## 10 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 11 \n$775 - $950 a week $775 - $950 a week 775 NA
## 12 \n$20 - $31 an hour $20 - $31 20 31
## 13 \n$30 - $45 an hour $30 - $45 30 45
## 14 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 15 \n$700 - $989 a week $700 - $989 a week 700 NA
## 16 \n$775 - $950 a week $775 - $950 a week 775 NA
## 17 \n$20 - $25 an hour $20 - $25 20 25
## 18 \n$45 - $70 an hour $45 - $70 45 70
## 19 \n$20 - $31 an hour $20 - $31 20 31
## 20 \n$30 - $45 an hour $30 - $45 30 45
## 21 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 22 \n$700 - $989 a week $700 - $989 a week 700 NA
## 23 \n$775 - $950 a week $775 - $950 a week 775 NA
## 24 \n$20 - $25 an hour $20 - $25 20 25
## 25 \n$45 - $70 an hour $45 - $70 45 70
## 26 \n$775 - $950 a week $775 - $950 a week 775 NA
## 27 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 28 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 29 \n$775 - $950 a week $775 - $950 a week 775 NA
## 30 \n$20 - $31 an hour $20 - $31 20 31
## 31 \n$30 - $45 an hour $30 - $45 30 45
## 32 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 33 \n$700 - $989 a week $700 - $989 a week 700 NA
## 34 \n$775 - $950 a week $775 - $950 a week 775 NA
## 35 \n$20 - $25 an hour $20 - $25 20 25
## 36 \n$45 - $70 an hour $45 - $70 45 70
## 37 \n$20 - $31 an hour $20 - $31 20 31
## 38 \n$30 - $45 an hour $30 - $45 30 45
## 39 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 40 \n$700 - $989 a week $700 - $989 a week 700 NA
## 41 \n$775 - $950 a week $775 - $950 a week 775 NA
## 42 \n$20 - $25 an hour $20 - $25 20 25
## 43 \n$45 - $70 an hour $45 - $70 45 70
## 44 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 45 \n$775 - $950 a week $775 - $950 a week 775 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 700 70 3596.111 5969.067 20
## 2 700 70 3596.111 5969.067 20
## 3 700 70 3596.111 5969.067 20
## 4 700 70 3596.111 5969.067 20
## 5 700 70 3596.111 5969.067 20
## 6 700 70 3596.111 5969.067 20
## 7 700 70 3596.111 5969.067 20
## 8 700 70 3596.111 5969.067 20
## 9 700 70 3596.111 5969.067 20
## 10 700 70 3596.111 5969.067 20
## 11 700 70 3596.111 5969.067 20
## 12 700 70 3596.111 5969.067 20
## 13 700 70 3596.111 5969.067 20
## 14 700 70 3596.111 5969.067 20
## 15 700 70 3596.111 5969.067 20
## 16 700 70 3596.111 5969.067 20
## 17 700 70 3596.111 5969.067 20
## 18 700 70 3596.111 5969.067 20
## 19 700 70 3596.111 5969.067 20
## 20 700 70 3596.111 5969.067 20
## 21 700 70 3596.111 5969.067 20
## 22 700 70 3596.111 5969.067 20
## 23 700 70 3596.111 5969.067 20
## 24 700 70 3596.111 5969.067 20
## 25 700 70 3596.111 5969.067 20
## 26 700 70 3596.111 5969.067 20
## 27 700 70 3596.111 5969.067 20
## 28 700 70 3596.111 5969.067 20
## 29 700 70 3596.111 5969.067 20
## 30 700 70 3596.111 5969.067 20
## 31 700 70 3596.111 5969.067 20
## 32 700 70 3596.111 5969.067 20
## 33 700 70 3596.111 5969.067 20
## 34 700 70 3596.111 5969.067 20
## 35 700 70 3596.111 5969.067 20
## 36 700 70 3596.111 5969.067 20
## 37 700 70 3596.111 5969.067 20
## 38 700 70 3596.111 5969.067 20
## 39 700 70 3596.111 5969.067 20
## 40 700 70 3596.111 5969.067 20
## 41 700 70 3596.111 5969.067 20
## 42 700 70 3596.111 5969.067 20
## 43 700 70 3596.111 5969.067 20
## 44 700 70 3596.111 5969.067 20
## 45 700 70 3596.111 5969.067 20
## maximumMaxSalary
## 1 45000
## 2 45000
## 3 45000
## 4 45000
## 5 45000
## 6 45000
## 7 45000
## 8 45000
## 9 45000
## 10 45000
## 11 45000
## 12 45000
## 13 45000
## 14 45000
## 15 45000
## 16 45000
## 17 45000
## 18 45000
## 19 45000
## 20 45000
## 21 45000
## 22 45000
## 23 45000
## 24 45000
## 25 45000
## 26 45000
## 27 45000
## 28 45000
## 29 45000
## 30 45000
## 31 45000
## 32 45000
## 33 45000
## 34 45000
## 35 45000
## 36 45000
## 37 45000
## 38 45000
## 39 45000
## 40 45000
## 41 45000
## 42 45000
## 43 45000
## 44 45000
## 45 45000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 5
## 4 Today
## 5 13
## 6 5
## 7 5
## 8 30
## 9 30
## 10 30
## 11 30
## 12 30
## 13 Today
## 14 13
## 15 5
## 16 5
## 17 30
## 18 30
## 19 30
## 20 5
## 21 Today
## 22 13
## 23 5
## 24 5
## 25 30
## 26 30
## 27 30
## 28 30
## 29 30
## 30 30
## 31 30
## 32 Today
## 33 13
## 34 5
## 35 5
## 36 30
## 37 30
## 38 30
## 39 Today
## 40 13
## 41 5
## 42 5
## 43 30
## 44 30
## 45 30
## 46 5
## 47 30
## 48 30
##
## [[4]]
## HiringAgency
## 1 Balance Day Spa3.4Greensboro, NC 27408
## 2 ME Devco DBA Massage Envy3.2Greensboro, NC 27408
## 3 Tranquil Touch Spa and SalonHigh Point, NC
## 4 Tranquil Touch Spa and SalonHigh Point, NC 27262
## 5 Hands & Hearts StaffingGreensboro, NC+1 location
## 6 Indo-Pak Massage TherapyGreensboro, NC•Remote work available
## 7 Head 2 Feet MassageGreensboro, NC 27410
## 8 Massage Envy3.2Greensboro, NC 27408+2 locations
## 9 Alpha Health CenterGreensboro, NC 27408
## 10 Indo-Pak Massage TherapyGreensboro, NC
## 11 Balance Day Spa3.4Greensboro, NC 27408
## 12 ME Devco DBA Massage Envy3.2Greensboro, NC 27408
## 13 Tranquil Touch Spa and SalonHigh Point, NC 27262
## 14 Hands & Hearts StaffingGreensboro, NC+1 location
## 15 Indo-Pak Massage TherapyGreensboro, NC•Remote work available
## 16 Head 2 Feet MassageGreensboro, NC 27410
## 17 Massage Envy3.2Greensboro, NC 27408+2 locations
## 18 Alpha Health CenterGreensboro, NC 27408
## 19 Indo-Pak Massage TherapyGreensboro, NC
## 20 Tranquil Touch Spa and SalonHigh Point, NC
## 21 Tranquil Touch Spa and SalonHigh Point, NC 27262
## 22 Hands & Hearts StaffingGreensboro, NC+1 location
## 23 Indo-Pak Massage TherapyGreensboro, NC•Remote work available
## 24 Head 2 Feet MassageGreensboro, NC 27410
## 25 Massage Envy3.2Greensboro, NC 27408+2 locations
## 26 Alpha Health CenterGreensboro, NC 27408
## 27 Indo-Pak Massage TherapyGreensboro, NC
## 28 ME Devco DBA Massage Envy3.2Greensboro, NC 27408
## 29 Balance Day Spa3.4Greensboro, NC 27408
## 30 Balance Day Spa3.4Greensboro, NC 27408
## 31 ME Devco DBA Massage Envy3.2Greensboro, NC 27408
## 32 Tranquil Touch Spa and SalonHigh Point, NC 27262
## 33 Hands & Hearts StaffingGreensboro, NC+1 location
## 34 Indo-Pak Massage TherapyGreensboro, NC•Remote work available
## 35 Head 2 Feet MassageGreensboro, NC 27410
## 36 Massage Envy3.2Greensboro, NC 27408+2 locations
## 37 Alpha Health CenterGreensboro, NC 27408
## 38 Indo-Pak Massage TherapyGreensboro, NC
## 39 Tranquil Touch Spa and SalonHigh Point, NC 27262
## 40 Hands & Hearts StaffingGreensboro, NC+1 location
## 41 Indo-Pak Massage TherapyGreensboro, NC•Remote work available
## 42 Head 2 Feet MassageGreensboro, NC 27410
## 43 Massage Envy3.2Greensboro, NC 27408+2 locations
## 44 Alpha Health CenterGreensboro, NC 27408
## 45 Indo-Pak Massage TherapyGreensboro, NC
## 46 Tranquil Touch Spa and SalonHigh Point, NC
## 47 Balance Day Spa3.4Greensboro, NC 27408
## 48 ME Devco DBA Massage Envy3.2Greensboro, NC 27408
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 10 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 27 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 28 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## 44 \n$25,000 - $45,000 a year $25000 - $45000 25000 45000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25000 45000 25000 45000 25000
## 10 25000 45000 25000 45000 25000
## 27 25000 45000 25000 45000 25000
## 28 25000 45000 25000 45000 25000
## 44 25000 45000 25000 45000 25000
## maximumMaxSalary
## 1 45000
## 10 45000
## 27 45000
## 28 45000
## 44 45000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 3 \n$20 - $31 an hour $20 - $31 20 31 25
## 4 \n$30 - $45 an hour $30 - $45 30 45 25
## 8 \n$20 - $25 an hour $20 - $25 20 25 25
## 9 \n$45 - $70 an hour $45 - $70 45 70 25
## 12 \n$20 - $31 an hour $20 - $31 20 31 25
## 13 \n$30 - $45 an hour $30 - $45 30 45 25
## 17 \n$20 - $25 an hour $20 - $25 20 25 25
## 18 \n$45 - $70 an hour $45 - $70 45 70 25
## 19 \n$20 - $31 an hour $20 - $31 20 31 25
## 20 \n$30 - $45 an hour $30 - $45 30 45 25
## 24 \n$20 - $25 an hour $20 - $25 20 25 25
## 25 \n$45 - $70 an hour $45 - $70 45 70 25
## 30 \n$20 - $31 an hour $20 - $31 20 31 25
## 31 \n$30 - $45 an hour $30 - $45 30 45 25
## 35 \n$20 - $25 an hour $20 - $25 20 25 25
## 36 \n$45 - $70 an hour $45 - $70 45 70 25
## 37 \n$20 - $31 an hour $20 - $31 20 31 25
## 38 \n$30 - $45 an hour $30 - $45 30 45 25
## 42 \n$20 - $25 an hour $20 - $25 20 25 25
## 43 \n$45 - $70 an hour $45 - $70 45 70 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 3 38 28.75 42.75 20 70
## 4 38 28.75 42.75 20 70
## 8 38 28.75 42.75 20 70
## 9 38 28.75 42.75 20 70
## 12 38 28.75 42.75 20 70
## 13 38 28.75 42.75 20 70
## 17 38 28.75 42.75 20 70
## 18 38 28.75 42.75 20 70
## 19 38 28.75 42.75 20 70
## 20 38 28.75 42.75 20 70
## 24 38 28.75 42.75 20 70
## 25 38 28.75 42.75 20 70
## 30 38 28.75 42.75 20 70
## 31 38 28.75 42.75 20 70
## 35 38 28.75 42.75 20 70
## 36 38 28.75 42.75 20 70
## 37 38 28.75 42.75 20 70
## 38 38 28.75 42.75 20 70
## 42 38 28.75 42.75 20 70
## 43 38 28.75 42.75 20 70
##
## [[7]]
## city state jobTitle
## 1 Greensboro NC Licensed Massage Therapist
## 2 Greensboro NC Licensed Massage Therapist
## 3 Greensboro NC Massage Therapist
## 4 Greensboro NC Massage Therapist
## 5 Greensboro NC Licensed Massage Therapist (LMT)
## 6 Greensboro NC Massage Therapist - Independent Contractor
## 7 Greensboro NC Licensed Massage Therapist (LMT)
## 8 Greensboro NC Massage Therapist
## 9 Greensboro NC Certified Massage Therapist
## 10 Greensboro NC Mobile Massage Therapist
## 11 Greensboro NC Licensed Massage Therapist
## 12 Greensboro NC Licensed Massage Therapist
## 13 Greensboro NC Massage Therapist
## 14 Greensboro NC Licensed Massage Therapist (LMT)
## 15 Greensboro NC Massage Therapist - Independent Contractor
## 16 Greensboro NC Licensed Massage Therapist (LMT)
## 17 Greensboro NC Massage Therapist
## 18 Greensboro NC Certified Massage Therapist
## 19 Greensboro NC Mobile Massage Therapist
## 20 Greensboro NC Massage Therapist
## 21 Greensboro NC Massage Therapist
## 22 Greensboro NC Licensed Massage Therapist (LMT)
## 23 Greensboro NC Massage Therapist - Independent Contractor
## 24 Greensboro NC Licensed Massage Therapist (LMT)
## 25 Greensboro NC Massage Therapist
## 26 Greensboro NC Certified Massage Therapist
## 27 Greensboro NC Mobile Massage Therapist
## 28 Greensboro NC Licensed Massage Therapist
## 29 Greensboro NC Licensed Massage Therapist
## 30 Greensboro NC Licensed Massage Therapist
## 31 Greensboro NC Licensed Massage Therapist
## 32 Greensboro NC Massage Therapist
## 33 Greensboro NC Licensed Massage Therapist (LMT)
## 34 Greensboro NC Massage Therapist - Independent Contractor
## 35 Greensboro NC Licensed Massage Therapist (LMT)
## 36 Greensboro NC Massage Therapist
## 37 Greensboro NC Certified Massage Therapist
## 38 Greensboro NC Mobile Massage Therapist
## 39 Greensboro NC Massage Therapist
## 40 Greensboro NC Licensed Massage Therapist (LMT)
## 41 Greensboro NC Massage Therapist - Independent Contractor
## 42 Greensboro NC Licensed Massage Therapist (LMT)
## 43 Greensboro NC Massage Therapist
## 44 Greensboro NC Certified Massage Therapist
## 45 Greensboro NC Mobile Massage Therapist
## 46 Greensboro NC Massage Therapist
## 47 Greensboro NC Licensed Massage Therapist
## 48 Greensboro NC Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Balance Day Spa3.4Greensboro, NC 27408 30
## 2 ME Devco DBA Massage Envy3.2Greensboro, NC 27408 30
## 3 Tranquil Touch Spa and SalonHigh Point, NC 5
## 4 Tranquil Touch Spa and SalonHigh Point, NC 27262 Today
## 5 Hands & Hearts StaffingGreensboro, NC+1 location 13
## 6 Indo-Pak Massage TherapyGreensboro, NC•Remote work available 5
## 7 Head 2 Feet MassageGreensboro, NC 27410 5
## 8 Massage Envy3.2Greensboro, NC 27408+2 locations 30
## 9 Alpha Health CenterGreensboro, NC 27408 30
## 10 Indo-Pak Massage TherapyGreensboro, NC 30
## 11 Balance Day Spa3.4Greensboro, NC 27408 30
## 12 ME Devco DBA Massage Envy3.2Greensboro, NC 27408 30
## 13 Tranquil Touch Spa and SalonHigh Point, NC 27262 Today
## 14 Hands & Hearts StaffingGreensboro, NC+1 location 13
## 15 Indo-Pak Massage TherapyGreensboro, NC•Remote work available 5
## 16 Head 2 Feet MassageGreensboro, NC 27410 5
## 17 Massage Envy3.2Greensboro, NC 27408+2 locations 30
## 18 Alpha Health CenterGreensboro, NC 27408 30
## 19 Indo-Pak Massage TherapyGreensboro, NC 30
## 20 Tranquil Touch Spa and SalonHigh Point, NC 5
## 21 Tranquil Touch Spa and SalonHigh Point, NC 27262 Today
## 22 Hands & Hearts StaffingGreensboro, NC+1 location 13
## 23 Indo-Pak Massage TherapyGreensboro, NC•Remote work available 5
## 24 Head 2 Feet MassageGreensboro, NC 27410 5
## 25 Massage Envy3.2Greensboro, NC 27408+2 locations 30
## 26 Alpha Health CenterGreensboro, NC 27408 30
## 27 Indo-Pak Massage TherapyGreensboro, NC 30
## 28 ME Devco DBA Massage Envy3.2Greensboro, NC 27408 30
## 29 Balance Day Spa3.4Greensboro, NC 27408 30
## 30 Balance Day Spa3.4Greensboro, NC 27408 30
## 31 ME Devco DBA Massage Envy3.2Greensboro, NC 27408 30
## 32 Tranquil Touch Spa and SalonHigh Point, NC 27262 Today
## 33 Hands & Hearts StaffingGreensboro, NC+1 location 13
## 34 Indo-Pak Massage TherapyGreensboro, NC•Remote work available 5
## 35 Head 2 Feet MassageGreensboro, NC 27410 5
## 36 Massage Envy3.2Greensboro, NC 27408+2 locations 30
## 37 Alpha Health CenterGreensboro, NC 27408 30
## 38 Indo-Pak Massage TherapyGreensboro, NC 30
## 39 Tranquil Touch Spa and SalonHigh Point, NC 27262 Today
## 40 Hands & Hearts StaffingGreensboro, NC+1 location 13
## 41 Indo-Pak Massage TherapyGreensboro, NC•Remote work available 5
## 42 Head 2 Feet MassageGreensboro, NC 27410 5
## 43 Massage Envy3.2Greensboro, NC 27408+2 locations 30
## 44 Alpha Health CenterGreensboro, NC 27408 30
## 45 Indo-Pak Massage TherapyGreensboro, NC 30
## 46 Tranquil Touch Spa and SalonHigh Point, NC 5
## 47 Balance Day Spa3.4Greensboro, NC 27408 30
## 48 ME Devco DBA Massage Envy3.2Greensboro, NC 27408 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 20 70 25000 45000
## 2 20 70 25000 45000
## 3 20 70 25000 45000
## 4 20 70 25000 45000
## 5 20 70 25000 45000
## 6 20 70 25000 45000
## 7 20 70 25000 45000
## 8 20 70 25000 45000
## 9 20 70 25000 45000
## 10 20 70 25000 45000
## 11 20 70 25000 45000
## 12 20 70 25000 45000
## 13 20 70 25000 45000
## 14 20 70 25000 45000
## 15 20 70 25000 45000
## 16 20 70 25000 45000
## 17 20 70 25000 45000
## 18 20 70 25000 45000
## 19 20 70 25000 45000
## 20 20 70 25000 45000
## 21 20 70 25000 45000
## 22 20 70 25000 45000
## 23 20 70 25000 45000
## 24 20 70 25000 45000
## 25 20 70 25000 45000
## 26 20 70 25000 45000
## 27 20 70 25000 45000
## 28 20 70 25000 45000
## 29 20 70 25000 45000
## 30 20 70 25000 45000
## 31 20 70 25000 45000
## 32 20 70 25000 45000
## 33 20 70 25000 45000
## 34 20 70 25000 45000
## 35 20 70 25000 45000
## 36 20 70 25000 45000
## 37 20 70 25000 45000
## 38 20 70 25000 45000
## 39 20 70 25000 45000
## 40 20 70 25000 45000
## 41 20 70 25000 45000
## 42 20 70 25000 45000
## 43 20 70 25000 45000
## 44 20 70 25000 45000
## 45 20 70 25000 45000
## 46 20 70 25000 45000
## 47 20 70 25000 45000
## 48 20 70 25000 45000
North Dakota Fargo, Bismarck, Grand Forks
getIndeedJobData5pages('massage therapist', 'Fargo','ND')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist in ND
## 2 Massage Therapist - Independent Contractor
## 3 Massage Therapist Full Time 25-35hr
## 4 $500 Hire on Bonus - Massage Therapist
## 5 Massage Therapist Part-Time 8-24hrs
## 6 Massage Therapist - Independent Contractor
## 7 Massage Therapist Full Time 25-35hr
## 8 $500 Hire on Bonus - Massage Therapist
## 9 Massage Therapist Part-Time 8-24hrs
## 10 Licensed Massage Therapist in ND
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist Full Time 25-35hr
## 13 $500 Hire on Bonus - Massage Therapist
## 14 Licensed Massage Therapist in ND
## 15 Massage Therapist Part-Time 8-24hrs
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist Full Time 25-35hr
## 18 $500 Hire on Bonus - Massage Therapist
## 19 Licensed Massage Therapist in ND
## 20 Massage Therapist Part-Time 8-24hrs
## 21 Massage Therapist - Independent Contractor
## 22 Massage Therapist Full Time 25-35hr
## 23 $500 Hire on Bonus - Massage Therapist
## 24 Massage Therapist Part-Time 8-24hrs
## 25 Licensed Massage Therapist in ND
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 - $25 an hour $23 - $25 23 25
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$23 - $25 an hour $23 - $25 23 25
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$23 - $25 an hour $23 - $25 23 25
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$23 - $25 an hour $23 - $25 23 25
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$23 - $25 an hour $23 - $25 23 25
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 2511.5 2512.5 2511.5 4262 23
## 2 2511.5 2512.5 2511.5 4262 23
## 3 2511.5 2512.5 2511.5 4262 23
## 4 2511.5 2512.5 2511.5 4262 23
## 5 2511.5 2512.5 2511.5 4262 23
## 6 2511.5 2512.5 2511.5 4262 23
## 7 2511.5 2512.5 2511.5 4262 23
## 8 2511.5 2512.5 2511.5 4262 23
## 9 2511.5 2512.5 2511.5 4262 23
## 10 2511.5 2512.5 2511.5 4262 23
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 17
## 3 30
## 4 24
## 5 30
## 6 17
## 7 30
## 8 24
## 9 30
## 10 30
## 11 17
## 12 30
## 13 24
## 14 30
## 15 30
## 16 17
## 17 30
## 18 24
## 19 30
## 20 30
## 21 17
## 22 30
## 23 24
## 24 30
## 25 30
##
## [[4]]
## HiringAgency
## 1 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area)
## 2 Indo-Pak Massage TherapyFargo, ND•Remote work available
## 3 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 4 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 5 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 6 Indo-Pak Massage TherapyFargo, ND•Remote work available
## 7 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 8 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 9 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 10 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area)
## 11 Indo-Pak Massage TherapyFargo, ND•Remote work available
## 12 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 13 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 14 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area)
## 15 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 16 Indo-Pak Massage TherapyFargo, ND•Remote work available
## 17 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 18 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 19 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area)
## 20 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 21 Indo-Pak Massage TherapyFargo, ND•Remote work available
## 22 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 23 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 24 Massage Envy3.2Fargo, ND 58103 (West Acres area)
## 25 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$23 - $25 an hour $23 - $25 23 25 23
## 4 \n$23 - $25 an hour $23 - $25 23 25 23
## 6 \n$23 - $25 an hour $23 - $25 23 25 23
## 8 \n$23 - $25 an hour $23 - $25 23 25 23
## 10 \n$23 - $25 an hour $23 - $25 23 25 23
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 25 23 25 23 25
## 4 25 23 25 23 25
## 6 25 23 25 23 25
## 8 25 23 25 23 25
## 10 25 23 25 23 25
##
## [[7]]
## city state jobTitle
## 1 Fargo ND Licensed Massage Therapist in ND
## 2 Fargo ND Massage Therapist - Independent Contractor
## 3 Fargo ND Massage Therapist Full Time 25-35hr
## 4 Fargo ND $500 Hire on Bonus - Massage Therapist
## 5 Fargo ND Massage Therapist Part-Time 8-24hrs
## 6 Fargo ND Massage Therapist - Independent Contractor
## 7 Fargo ND Massage Therapist Full Time 25-35hr
## 8 Fargo ND $500 Hire on Bonus - Massage Therapist
## 9 Fargo ND Massage Therapist Part-Time 8-24hrs
## 10 Fargo ND Licensed Massage Therapist in ND
## 11 Fargo ND Massage Therapist - Independent Contractor
## 12 Fargo ND Massage Therapist Full Time 25-35hr
## 13 Fargo ND $500 Hire on Bonus - Massage Therapist
## 14 Fargo ND Licensed Massage Therapist in ND
## 15 Fargo ND Massage Therapist Part-Time 8-24hrs
## 16 Fargo ND Massage Therapist - Independent Contractor
## 17 Fargo ND Massage Therapist Full Time 25-35hr
## 18 Fargo ND $500 Hire on Bonus - Massage Therapist
## 19 Fargo ND Licensed Massage Therapist in ND
## 20 Fargo ND Massage Therapist Part-Time 8-24hrs
## 21 Fargo ND Massage Therapist - Independent Contractor
## 22 Fargo ND Massage Therapist Full Time 25-35hr
## 23 Fargo ND $500 Hire on Bonus - Massage Therapist
## 24 Fargo ND Massage Therapist Part-Time 8-24hrs
## 25 Fargo ND Licensed Massage Therapist in ND
## HiringAgency date_daysAgo
## 1 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area) 30
## 2 Indo-Pak Massage TherapyFargo, ND•Remote work available 17
## 3 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 4 Massage Envy3.2Fargo, ND 58103 (West Acres area) 24
## 5 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 6 Indo-Pak Massage TherapyFargo, ND•Remote work available 17
## 7 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 8 Massage Envy3.2Fargo, ND 58103 (West Acres area) 24
## 9 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 10 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area) 30
## 11 Indo-Pak Massage TherapyFargo, ND•Remote work available 17
## 12 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 13 Massage Envy3.2Fargo, ND 58103 (West Acres area) 24
## 14 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area) 30
## 15 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 16 Indo-Pak Massage TherapyFargo, ND•Remote work available 17
## 17 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 18 Massage Envy3.2Fargo, ND 58103 (West Acres area) 24
## 19 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area) 30
## 20 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 21 Indo-Pak Massage TherapyFargo, ND•Remote work available 17
## 22 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 23 Massage Envy3.2Fargo, ND 58103 (West Acres area) 24
## 24 Massage Envy3.2Fargo, ND 58103 (West Acres area) 30
## 25 Affiniti Day Spa and SalonFargo, ND 58103 (West Acres area) 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 23 25 NA NA
## 2 23 25 NA NA
## 3 23 25 NA NA
## 4 23 25 NA NA
## 5 23 25 NA NA
## 6 23 25 NA NA
## 7 23 25 NA NA
## 8 23 25 NA NA
## 9 23 25 NA NA
## 10 23 25 NA NA
## 11 23 25 NA NA
## 12 23 25 NA NA
## 13 23 25 NA NA
## 14 23 25 NA NA
## 15 23 25 NA NA
## 16 23 25 NA NA
## 17 23 25 NA NA
## 18 23 25 NA NA
## 19 23 25 NA NA
## 20 23 25 NA NA
## 21 23 25 NA NA
## 22 23 25 NA NA
## 23 23 25 NA NA
## 24 23 25 NA NA
## 25 23 25 NA NA
getIndeedJobData5pages('massage therapist', 'Bismarck','ND')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Full Licensed Massage Therapist
## 3 Massage Therapist - Independent Contractor
## 4 Licensed Massage Therapist
## 5 Full Licensed Massage Therapist
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist
## 8 Full Licensed Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Full Licensed Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Full Licensed Massage Therapist
## 15 Massage Therapist - Independent Contractor
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22000 25500 22000 27750 5000
## 2 22000 25500 22000 27750 5000
## 3 22000 25500 22000 27750 5000
## 4 22000 25500 22000 27750 5000
## 5 22000 25500 22000 27750 5000
## 6 22000 25500 22000 27750 5000
## 7 22000 25500 22000 27750 5000
## 8 22000 25500 22000 27750 5000
## 9 22000 25500 22000 27750 5000
## 10 22000 25500 22000 27750 5000
## maximumMaxSalary
## 1 55000
## 2 55000
## 3 55000
## 4 55000
## 5 55000
## 6 55000
## 7 55000
## 8 55000
## 9 55000
## 10 55000
##
## [[3]]
## date_daysAgo
## 1 28
## 2 30
## 3 17
## 4 28
## 5 30
## 6 17
## 7 28
## 8 30
## 9 17
## 10 28
## 11 30
## 12 17
## 13 28
## 14 30
## 15 17
##
## [[4]]
## HiringAgency
## 1 Broadway Centre Spa and SalonBismarck, ND 58501
## 2 Broadway Centre Spa & SalonBismarck, ND 58501
## 3 Indo-Pak Massage TherapyBismarck, ND•Remote work available
## 4 Broadway Centre Spa and SalonBismarck, ND 58501
## 5 Broadway Centre Spa & SalonBismarck, ND 58501
## 6 Indo-Pak Massage TherapyBismarck, ND•Remote work available
## 7 Broadway Centre Spa and SalonBismarck, ND 58501
## 8 Broadway Centre Spa & SalonBismarck, ND 58501
## 9 Indo-Pak Massage TherapyBismarck, ND•Remote work available
## 10 Broadway Centre Spa and SalonBismarck, ND 58501
## 11 Broadway Centre Spa & SalonBismarck, ND 58501
## 12 Indo-Pak Massage TherapyBismarck, ND•Remote work available
## 13 Broadway Centre Spa and SalonBismarck, ND 58501
## 14 Broadway Centre Spa & SalonBismarck, ND 58501
## 15 Indo-Pak Massage TherapyBismarck, ND•Remote work available
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 3 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 5 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 7 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## 9 \n$39,000 - $55,000 a year $39000 - $55000 39000 55000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 39000 55000 39000 55000 39000
## 3 39000 55000 39000 55000 39000
## 5 39000 55000 39000 55000 39000
## 7 39000 55000 39000 55000 39000
## 9 39000 55000 39000 55000 39000
## maximumMaxSalary
## 1 55000
## 3 55000
## 5 55000
## 7 55000
## 9 55000
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Bismarck ND Licensed Massage Therapist
## 2 Bismarck ND Full Licensed Massage Therapist
## 3 Bismarck ND Massage Therapist - Independent Contractor
## 4 Bismarck ND Licensed Massage Therapist
## 5 Bismarck ND Full Licensed Massage Therapist
## 6 Bismarck ND Massage Therapist - Independent Contractor
## 7 Bismarck ND Licensed Massage Therapist
## 8 Bismarck ND Full Licensed Massage Therapist
## 9 Bismarck ND Massage Therapist - Independent Contractor
## 10 Bismarck ND Licensed Massage Therapist
## 11 Bismarck ND Full Licensed Massage Therapist
## 12 Bismarck ND Massage Therapist - Independent Contractor
## 13 Bismarck ND Licensed Massage Therapist
## 14 Bismarck ND Full Licensed Massage Therapist
## 15 Bismarck ND Massage Therapist - Independent Contractor
## HiringAgency date_daysAgo
## 1 Broadway Centre Spa and SalonBismarck, ND 58501 28
## 2 Broadway Centre Spa & SalonBismarck, ND 58501 30
## 3 Indo-Pak Massage TherapyBismarck, ND•Remote work available 17
## 4 Broadway Centre Spa and SalonBismarck, ND 58501 28
## 5 Broadway Centre Spa & SalonBismarck, ND 58501 30
## 6 Indo-Pak Massage TherapyBismarck, ND•Remote work available 17
## 7 Broadway Centre Spa and SalonBismarck, ND 58501 28
## 8 Broadway Centre Spa & SalonBismarck, ND 58501 30
## 9 Indo-Pak Massage TherapyBismarck, ND•Remote work available 17
## 10 Broadway Centre Spa and SalonBismarck, ND 58501 28
## 11 Broadway Centre Spa & SalonBismarck, ND 58501 30
## 12 Indo-Pak Massage TherapyBismarck, ND•Remote work available 17
## 13 Broadway Centre Spa and SalonBismarck, ND 58501 28
## 14 Broadway Centre Spa & SalonBismarck, ND 58501 30
## 15 Indo-Pak Massage TherapyBismarck, ND•Remote work available 17
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA 39000 55000
## 2 NA NA 39000 55000
## 3 NA NA 39000 55000
## 4 NA NA 39000 55000
## 5 NA NA 39000 55000
## 6 NA NA 39000 55000
## 7 NA NA 39000 55000
## 8 NA NA 39000 55000
## 9 NA NA 39000 55000
## 10 NA NA 39000 55000
## 11 NA NA 39000 55000
## 12 NA NA 39000 55000
## 13 NA NA 39000 55000
## 14 NA NA 39000 55000
## 15 NA NA 39000 55000
getIndeedJobData5pages('massage therapist', 'Grand Forks','ND')
## [[1]]
## [1] jobTitle
## <0 rows> (or 0-length row.names)
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## [1] date_daysAgo
## <0 rows> (or 0-length row.names)
##
## [[4]]
## [1] HiringAgency
## <0 rows> (or 0-length row.names)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## [1] city state jobTitle HiringAgency
## [5] date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary
## [9] MaxAnnualSalary
## <0 rows> (or 0-length row.names)
Ohio Columbus, Cleveland, Cincinnati
getIndeedJobData5pages('massage therapist', 'Columbus','OH')
## Warning in getIndeedJobData5pages("massage therapist", "Columbus", "OH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Columbus", "OH"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Reynoldsburg Chiropractic Center Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapists
## 11 Licensed Massage Therapist (LMT)
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist Part-Time and Full-Time
## 17 Licensed Massage Therapist
## 18 Massage Therapist - Full & Part-time
## 19 Aesthetician ...masseuse ...hairstylist... nail technician
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Reynoldsburg Chiropractic Center Licensed Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapist (LMT)
## 27 Aesthetician ...masseuse ...hairstylist... nail technician
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapy Student Clinic Director
## 31 Licensed Massage Therapist
## 32 Massage Therapist
## 33 Hairstylist massage therapy aesthetician recession
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Licensed Massage Therapist
## 40 Massage Therapist Part-Time and Full-Time
## 41 Licensed Massage Therapist
## 42 Massage Therapist - Full & Part-time
## 43 Aesthetician ...masseuse ...hairstylist... nail technician
## 44 Licensed Massage Therapist
## 45 Massage Therapy Student Clinic Director
## 46 Licensed Massage Therapist
## 47 Massage Therapist
## 48 Hairstylist massage therapy aesthetician recession
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist (LMT)
## 54 Licensed Massage Therapist
## 55 Massage Therapist Part-Time and Full-Time
## 56 Licensed Massage Therapist
## 57 Massage Therapist - Full & Part-time
## 58 Aesthetician ...masseuse ...hairstylist... nail technician
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $26 an hour $22 - $26 22.0 26
## 2 \n$25 - $32 an hour $25 - $32 25.0 32
## 3 \n$35 - $45 an hour $35 - $45 35.0 45
## 4 \n$25 an hour $25 25.0 NA
## 5 \n$800 - $1,100 a week $800 - $1100 a week 800.0 NA
## 6 \n$30 - $50 an hour $30 - $50 30.0 50
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 8 \n$55,000 - $78,000 a year $55000 - $78000 55000.0 78000
## 9 \n$27 - $30 an hour $27 - $30 27.0 30
## 10 \n$60 - $100 an hour $60 - $100 60.0 100
## 11 \n$22.50 an hour $22.50 22.5 NA
## 12 \n$35,000 - $55,000 a year $35000 - $55000 35000.0 55000
## 13 \n$800 - $1,100 a week $800 - $1100 a week 800.0 NA
## 14 \n$25 an hour $25 25.0 NA
## 15 \n$22 - $26 an hour $22 - $26 22.0 26
## 16 \n$35 - $45 an hour $35 - $45 35.0 45
## 17 \n$18 - $25 an hour $18 - $25 18.0 25
## 18 \n$25 - $32 an hour $25 - $32 25.0 32
## 19 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 20 \n$40 - $45 an hour $40 - $45 40.0 45
## 21 \n$20 - $30 an hour $20 - $30 20.0 30
## 22 \n$35,000 - $55,000 a year $35000 - $55000 35000.0 55000
## 23 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 24 \n$40 - $45 an hour $40 - $45 40.0 45
## 25 \n$20 - $30 an hour $20 - $30 20.0 30
## 26 \n$35,000 - $55,000 a year $35000 - $55000 35000.0 55000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 40 8349.673 11545.8 18
## 2 35 40 8349.673 11545.8 18
## 3 35 40 8349.673 11545.8 18
## 4 35 40 8349.673 11545.8 18
## 5 35 40 8349.673 11545.8 18
## 6 35 40 8349.673 11545.8 18
## 7 35 40 8349.673 11545.8 18
## 8 35 40 8349.673 11545.8 18
## 9 35 40 8349.673 11545.8 18
## 10 35 40 8349.673 11545.8 18
## 11 35 40 8349.673 11545.8 18
## 12 35 40 8349.673 11545.8 18
## 13 35 40 8349.673 11545.8 18
## 14 35 40 8349.673 11545.8 18
## 15 35 40 8349.673 11545.8 18
## 16 35 40 8349.673 11545.8 18
## 17 35 40 8349.673 11545.8 18
## 18 35 40 8349.673 11545.8 18
## 19 35 40 8349.673 11545.8 18
## 20 35 40 8349.673 11545.8 18
## 21 35 40 8349.673 11545.8 18
## 22 35 40 8349.673 11545.8 18
## 23 35 40 8349.673 11545.8 18
## 24 35 40 8349.673 11545.8 18
## 25 35 40 8349.673 11545.8 18
## 26 35 40 8349.673 11545.8 18
## maximumMaxSalary
## 1 78000
## 2 78000
## 3 78000
## 4 78000
## 5 78000
## 6 78000
## 7 78000
## 8 78000
## 9 78000
## 10 78000
## 11 78000
## 12 78000
## 13 78000
## 14 78000
## 15 78000
## 16 78000
## 17 78000
## 18 78000
## 19 78000
## 20 78000
## 21 78000
## 22 78000
## 23 78000
## 24 78000
## 25 78000
## 26 78000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 14
## 3 30
## 4 1
## 5 30
## 6 Just posted
## 7 30
## 8 5
## 9 Today
## 10 4
## 11 19
## 12 12
## 13 7
## 14 19
## 15 13
## 16 30
## 17 30
## 18 30
## 19 6
## 20 30
## 21 7
## 22 30
## 23 1
## 24 30
## 25 30
## 26 18
## 27 6
## 28 14
## 29 20
## 30 30
## 31 20
## 32 27
## 33 1
## 34 26
## 35 6
## 36 5
## 37 11
## 38 30
## 39 20
## 40 30
## 41 30
## 42 30
## 43 6
## 44 20
## 45 30
## 46 20
## 47 27
## 48 1
## 49 26
## 50 6
## 51 5
## 52 11
## 53 30
## 54 20
## 55 30
## 56 30
## 57 30
## 58 6
##
## [[4]]
## HiringAgency
## 1 Reynoldsburg Chiropractic CenterReynoldsburg, OH 43068
## 2 Lighthouse Family ChiropracticHilliard, OH 43026
## 3 Elements Massage3.6Dublin, OH 43017
## 4 Kowalski ChiropracticDublin, OH 43016
## 5 Hand & Stone Massage and Facial Spa3.0Dublin, OH 43016
## 6 Papillon Day SpaWorthington, OH 43085 (Worthington area)
## 7 Healthcare Recruitment CounselorsGrove City, OH
## 8 Indo-Pak Massage TherapyColumbus, OH•Remote work available
## 9 Spavia Day Spa3.3Dublin, OH 43017
## 10 Embody Health and WellnessColumbus, OH
## 11 The Winchester Institute4.3Dublin, OH 43016
## 12 Comprehensive ServicesColumbus, OH 43220 (Knolls West area)
## 13 Hand and Stone Spa3.0Dublin, OH 43016
## 14 PalomaColumbus, OH 43212 (Tri-Village area)
## 15 Dublin Family ChiropracticDublin, OH 43016
## 16 Massage Envy3.2Columbus, OH 43085 (Worthington area)+1 location
## 17 Monroe's Salon & SpaPickerington, OH 43147
## 18 Massage Envy3.2Columbus, OH 43213 (East Broad area)+2 locations
## 19 L&K SalonColumbus, OH 43240 (Polaris area)
## 20 Hand & Stone Massage and Facial Spa3.0Dublin, OH 43016
## 21 Hand and Stone Spa3.0Dublin, OH 43016
## 22 Healthcare Recruitment CounselorsGrove City, OH
## 23 Kowalski ChiropracticDublin, OH 43016
## 24 Reynoldsburg Chiropractic CenterReynoldsburg, OH 43068
## 25 Elements Massage3.6Dublin, OH 43017
## 26 Kinsale Golf And Fitness Club2.5Powell, OH 43065
## 27 L&K SalonColumbus, OH 43240 (Polaris area)
## 28 Lighthouse Family ChiropracticHilliard, OH 43026
## 29 Kenneth's Hair Salons & Day Spas-Polaris ParkwayLewis Center, OH
## 30 Medical Dynamics IncorporatedDublin, OH
## 31 Kenneth's Hair Salons & Day Spas- New AlbanyColumbus, OH
## 32 Elements3.6Hilliard, OH 43026+2 locations
## 33 Exceptional Hair Salon & SpaWesterville, OH 43081
## 34 Massage MiPowell, OH 43065
## 35 Massage Envy3.2Gahanna, OH 43230+7 locations
## 36 Hand & Stone - Dublin OH3.0Columbus, OH 43221 (Upper Arlington area)+2 locations
## 37 Massage Envy3.2Grandview Heights, OH 43212+5 locations
## 38 Sean's Massage CenterColumbus, OH 43220 (Henderson Heights area)
## 39 Kenneth's Hair Salons & Day Spas- HilliardHilliard, OH
## 40 Massage Envy3.2Columbus, OH 43085 (Worthington area)+1 location
## 41 Monroe's Salon & SpaPickerington, OH 43147
## 42 Massage Envy3.2Columbus, OH 43213 (East Broad area)+2 locations
## 43 L&K SalonColumbus, OH 43240 (Polaris area)
## 44 Kenneth's Hair Salons & Day Spas-Polaris ParkwayLewis Center, OH
## 45 Medical Dynamics IncorporatedDublin, OH
## 46 Kenneth's Hair Salons & Day Spas- New AlbanyColumbus, OH
## 47 Elements3.6Hilliard, OH 43026+2 locations
## 48 Exceptional Hair Salon & SpaWesterville, OH 43081
## 49 Massage MiPowell, OH 43065
## 50 Massage Envy3.2Gahanna, OH 43230+7 locations
## 51 Hand & Stone - Dublin OH3.0Columbus, OH 43221 (Upper Arlington area)+2 locations
## 52 Massage Envy3.2Grandview Heights, OH 43212+5 locations
## 53 Sean's Massage CenterColumbus, OH 43220 (Henderson Heights area)
## 54 Kenneth's Hair Salons & Day Spas- HilliardHilliard, OH
## 55 Massage Envy3.2Columbus, OH 43085 (Worthington area)+1 location
## 56 Monroe's Salon & SpaPickerington, OH 43147
## 57 Massage Envy3.2Columbus, OH 43213 (East Broad area)+2 locations
## 58 L&K SalonColumbus, OH 43240 (Polaris area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 8 \n$55,000 - $78,000 a year $55000 - $78000 55000 78000
## 12 \n$35,000 - $55,000 a year $35000 - $55000 35000 55000
## 19 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 22 \n$35,000 - $55,000 a year $35000 - $55000 35000 55000
## 23 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 26 \n$35,000 - $55,000 a year $35000 - $55000 35000 55000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 8 35000 55000 35000 52166.67 25000
## 12 35000 55000 35000 52166.67 25000
## 19 35000 55000 35000 52166.67 25000
## 22 35000 55000 35000 52166.67 25000
## 23 35000 55000 35000 52166.67 25000
## 26 35000 55000 35000 52166.67 25000
## maximumMaxSalary
## 8 78000
## 12 78000
## 19 78000
## 22 78000
## 23 78000
## 26 78000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$22 - $26 an hour $22 - $26 22.0 26 25
## 2 \n$25 - $32 an hour $25 - $32 25.0 32 25
## 3 \n$35 - $45 an hour $35 - $45 35.0 45 25
## 4 \n$25 an hour $25 25.0 NA 25
## 6 \n$30 - $50 an hour $30 - $50 30.0 50 25
## 9 \n$27 - $30 an hour $27 - $30 27.0 30 25
## 10 \n$60 - $100 an hour $60 - $100 60.0 100 25
## 11 \n$22.50 an hour $22.50 22.5 NA 25
## 14 \n$25 an hour $25 25.0 NA 25
## 15 \n$22 - $26 an hour $22 - $26 22.0 26 25
## 16 \n$35 - $45 an hour $35 - $45 35.0 45 25
## 17 \n$18 - $25 an hour $18 - $25 18.0 25 25
## 18 \n$25 - $32 an hour $25 - $32 25.0 32 25
## 20 \n$40 - $45 an hour $40 - $45 40.0 45 25
## 21 \n$20 - $30 an hour $20 - $30 20.0 30 25
## 24 \n$40 - $45 an hour $40 - $45 40.0 45 25
## 25 \n$20 - $30 an hour $20 - $30 20.0 30 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 32 28.91176 40.07143 18 100
## 2 32 28.91176 40.07143 18 100
## 3 32 28.91176 40.07143 18 100
## 4 32 28.91176 40.07143 18 100
## 6 32 28.91176 40.07143 18 100
## 9 32 28.91176 40.07143 18 100
## 10 32 28.91176 40.07143 18 100
## 11 32 28.91176 40.07143 18 100
## 14 32 28.91176 40.07143 18 100
## 15 32 28.91176 40.07143 18 100
## 16 32 28.91176 40.07143 18 100
## 17 32 28.91176 40.07143 18 100
## 18 32 28.91176 40.07143 18 100
## 20 32 28.91176 40.07143 18 100
## 21 32 28.91176 40.07143 18 100
## 24 32 28.91176 40.07143 18 100
## 25 32 28.91176 40.07143 18 100
##
## [[7]]
## city state jobTitle
## 1 Columbus OH Reynoldsburg Chiropractic Center Licensed Massage Therapist
## 2 Columbus OH Licensed Massage Therapist
## 3 Columbus OH Massage Therapist
## 4 Columbus OH Licensed Massage Therapist
## 5 Columbus OH Licensed Massage Therapist
## 6 Columbus OH Licensed Massage Therapist
## 7 Columbus OH Licensed Massage Therapist
## 8 Columbus OH Massage Therapist - Independent Contractor
## 9 Columbus OH Licensed Massage Therapist
## 10 Columbus OH Licensed Massage Therapists
## 11 Columbus OH Licensed Massage Therapist (LMT)
## 12 Columbus OH Massage Therapist - Independent Contractor
## 13 Columbus OH Licensed Massage Therapist
## 14 Columbus OH Licensed Massage Therapist
## 15 Columbus OH Licensed Massage Therapist
## 16 Columbus OH Massage Therapist Part-Time and Full-Time
## 17 Columbus OH Licensed Massage Therapist
## 18 Columbus OH Massage Therapist - Full & Part-time
## 19 Columbus OH Aesthetician ...masseuse ...hairstylist... nail technician
## 20 Columbus OH Licensed Massage Therapist
## 21 Columbus OH Licensed Massage Therapist
## 22 Columbus OH Licensed Massage Therapist
## 23 Columbus OH Licensed Massage Therapist
## 24 Columbus OH Reynoldsburg Chiropractic Center Licensed Massage Therapist
## 25 Columbus OH Massage Therapist
## 26 Columbus OH Licensed Massage Therapist (LMT)
## 27 Columbus OH Aesthetician ...masseuse ...hairstylist... nail technician
## 28 Columbus OH Licensed Massage Therapist
## 29 Columbus OH Licensed Massage Therapist
## 30 Columbus OH Massage Therapy Student Clinic Director
## 31 Columbus OH Licensed Massage Therapist
## 32 Columbus OH Massage Therapist
## 33 Columbus OH Hairstylist massage therapy aesthetician recession
## 34 Columbus OH Licensed Massage Therapist
## 35 Columbus OH Massage Therapist
## 36 Columbus OH Licensed Massage Therapist
## 37 Columbus OH Licensed Massage Therapist
## 38 Columbus OH Licensed Massage Therapist (LMT)
## 39 Columbus OH Licensed Massage Therapist
## 40 Columbus OH Massage Therapist Part-Time and Full-Time
## 41 Columbus OH Licensed Massage Therapist
## 42 Columbus OH Massage Therapist - Full & Part-time
## 43 Columbus OH Aesthetician ...masseuse ...hairstylist... nail technician
## 44 Columbus OH Licensed Massage Therapist
## 45 Columbus OH Massage Therapy Student Clinic Director
## 46 Columbus OH Licensed Massage Therapist
## 47 Columbus OH Massage Therapist
## 48 Columbus OH Hairstylist massage therapy aesthetician recession
## 49 Columbus OH Licensed Massage Therapist
## 50 Columbus OH Massage Therapist
## 51 Columbus OH Licensed Massage Therapist
## 52 Columbus OH Licensed Massage Therapist
## 53 Columbus OH Licensed Massage Therapist (LMT)
## 54 Columbus OH Licensed Massage Therapist
## 55 Columbus OH Massage Therapist Part-Time and Full-Time
## 56 Columbus OH Licensed Massage Therapist
## 57 Columbus OH Massage Therapist - Full & Part-time
## 58 Columbus OH Aesthetician ...masseuse ...hairstylist... nail technician
## HiringAgency
## 1 Reynoldsburg Chiropractic CenterReynoldsburg, OH 43068
## 2 Lighthouse Family ChiropracticHilliard, OH 43026
## 3 Elements Massage3.6Dublin, OH 43017
## 4 Kowalski ChiropracticDublin, OH 43016
## 5 Hand & Stone Massage and Facial Spa3.0Dublin, OH 43016
## 6 Papillon Day SpaWorthington, OH 43085 (Worthington area)
## 7 Healthcare Recruitment CounselorsGrove City, OH
## 8 Indo-Pak Massage TherapyColumbus, OH•Remote work available
## 9 Spavia Day Spa3.3Dublin, OH 43017
## 10 Embody Health and WellnessColumbus, OH
## 11 The Winchester Institute4.3Dublin, OH 43016
## 12 Comprehensive ServicesColumbus, OH 43220 (Knolls West area)
## 13 Hand and Stone Spa3.0Dublin, OH 43016
## 14 PalomaColumbus, OH 43212 (Tri-Village area)
## 15 Dublin Family ChiropracticDublin, OH 43016
## 16 Massage Envy3.2Columbus, OH 43085 (Worthington area)+1 location
## 17 Monroe's Salon & SpaPickerington, OH 43147
## 18 Massage Envy3.2Columbus, OH 43213 (East Broad area)+2 locations
## 19 L&K SalonColumbus, OH 43240 (Polaris area)
## 20 Hand & Stone Massage and Facial Spa3.0Dublin, OH 43016
## 21 Hand and Stone Spa3.0Dublin, OH 43016
## 22 Healthcare Recruitment CounselorsGrove City, OH
## 23 Kowalski ChiropracticDublin, OH 43016
## 24 Reynoldsburg Chiropractic CenterReynoldsburg, OH 43068
## 25 Elements Massage3.6Dublin, OH 43017
## 26 Kinsale Golf And Fitness Club2.5Powell, OH 43065
## 27 L&K SalonColumbus, OH 43240 (Polaris area)
## 28 Lighthouse Family ChiropracticHilliard, OH 43026
## 29 Kenneth's Hair Salons & Day Spas-Polaris ParkwayLewis Center, OH
## 30 Medical Dynamics IncorporatedDublin, OH
## 31 Kenneth's Hair Salons & Day Spas- New AlbanyColumbus, OH
## 32 Elements3.6Hilliard, OH 43026+2 locations
## 33 Exceptional Hair Salon & SpaWesterville, OH 43081
## 34 Massage MiPowell, OH 43065
## 35 Massage Envy3.2Gahanna, OH 43230+7 locations
## 36 Hand & Stone - Dublin OH3.0Columbus, OH 43221 (Upper Arlington area)+2 locations
## 37 Massage Envy3.2Grandview Heights, OH 43212+5 locations
## 38 Sean's Massage CenterColumbus, OH 43220 (Henderson Heights area)
## 39 Kenneth's Hair Salons & Day Spas- HilliardHilliard, OH
## 40 Massage Envy3.2Columbus, OH 43085 (Worthington area)+1 location
## 41 Monroe's Salon & SpaPickerington, OH 43147
## 42 Massage Envy3.2Columbus, OH 43213 (East Broad area)+2 locations
## 43 L&K SalonColumbus, OH 43240 (Polaris area)
## 44 Kenneth's Hair Salons & Day Spas-Polaris ParkwayLewis Center, OH
## 45 Medical Dynamics IncorporatedDublin, OH
## 46 Kenneth's Hair Salons & Day Spas- New AlbanyColumbus, OH
## 47 Elements3.6Hilliard, OH 43026+2 locations
## 48 Exceptional Hair Salon & SpaWesterville, OH 43081
## 49 Massage MiPowell, OH 43065
## 50 Massage Envy3.2Gahanna, OH 43230+7 locations
## 51 Hand & Stone - Dublin OH3.0Columbus, OH 43221 (Upper Arlington area)+2 locations
## 52 Massage Envy3.2Grandview Heights, OH 43212+5 locations
## 53 Sean's Massage CenterColumbus, OH 43220 (Henderson Heights area)
## 54 Kenneth's Hair Salons & Day Spas- HilliardHilliard, OH
## 55 Massage Envy3.2Columbus, OH 43085 (Worthington area)+1 location
## 56 Monroe's Salon & SpaPickerington, OH 43147
## 57 Massage Envy3.2Columbus, OH 43213 (East Broad area)+2 locations
## 58 L&K SalonColumbus, OH 43240 (Polaris area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 18 100 25000 78000
## 2 14 18 100 25000 78000
## 3 30 18 100 25000 78000
## 4 1 18 100 25000 78000
## 5 30 18 100 25000 78000
## 6 Just posted 18 100 25000 78000
## 7 30 18 100 25000 78000
## 8 5 18 100 25000 78000
## 9 Today 18 100 25000 78000
## 10 4 18 100 25000 78000
## 11 19 18 100 25000 78000
## 12 12 18 100 25000 78000
## 13 7 18 100 25000 78000
## 14 19 18 100 25000 78000
## 15 13 18 100 25000 78000
## 16 30 18 100 25000 78000
## 17 30 18 100 25000 78000
## 18 30 18 100 25000 78000
## 19 6 18 100 25000 78000
## 20 30 18 100 25000 78000
## 21 7 18 100 25000 78000
## 22 30 18 100 25000 78000
## 23 1 18 100 25000 78000
## 24 30 18 100 25000 78000
## 25 30 18 100 25000 78000
## 26 18 18 100 25000 78000
## 27 6 18 100 25000 78000
## 28 14 18 100 25000 78000
## 29 20 18 100 25000 78000
## 30 30 18 100 25000 78000
## 31 20 18 100 25000 78000
## 32 27 18 100 25000 78000
## 33 1 18 100 25000 78000
## 34 26 18 100 25000 78000
## 35 6 18 100 25000 78000
## 36 5 18 100 25000 78000
## 37 11 18 100 25000 78000
## 38 30 18 100 25000 78000
## 39 20 18 100 25000 78000
## 40 30 18 100 25000 78000
## 41 30 18 100 25000 78000
## 42 30 18 100 25000 78000
## 43 6 18 100 25000 78000
## 44 20 18 100 25000 78000
## 45 30 18 100 25000 78000
## 46 20 18 100 25000 78000
## 47 27 18 100 25000 78000
## 48 1 18 100 25000 78000
## 49 26 18 100 25000 78000
## 50 6 18 100 25000 78000
## 51 5 18 100 25000 78000
## 52 11 18 100 25000 78000
## 53 30 18 100 25000 78000
## 54 20 18 100 25000 78000
## 55 30 18 100 25000 78000
## 56 30 18 100 25000 78000
## 57 30 18 100 25000 78000
## 58 6 18 100 25000 78000
getIndeedJobData5pages('massage therapist', 'Cleveland','OH')
## Warning in getIndeedJobData5pages("massage therapist", "Cleveland", "OH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Cleveland", "OH"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Massage Therapist Chiropractic Clinic
## 5 Massage Therapist w/ SIGN ON BONUS
## 6 Licensed Massage Therapist (LMT)
## 7 Licensed Massage Therapist SIGN ON BONUS
## 8 Licensed Massage Therapist - Passionate Healer
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist, Independent Contractor
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist, Full-Time
## 20 Licensed Massage Therapist
## 21 Massage Therapist, Part-Time
## 22 Massage Therapist
## 23 Mobile Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist (LMT)
## 28 Massage Therapist (PRN - As Needed)
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Salon Massage Therapist
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist
## 34 Massage Therapist, Full-Time
## 35 Licensed Massage Therapist
## 36 Massage Therapist, Part-Time
## 37 Massage Therapist
## 38 Mobile Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist (LMT)
## 43 Massage Therapist (PRN - As Needed)
## 44 Licensed Massage Therapist
## 45 Massage Therapist
## 46 Salon Massage Therapist
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Massage Therapist, Full-Time
## 50 Licensed Massage Therapist
## 51 Massage Therapist, Part-Time
## 52 Massage Therapist
## 53 Mobile Massage Therapist
## 54 Licensed Massage Therapist
## 55 Massage Therapist
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist (LMT)
## 58 Massage Therapist (PRN - As Needed)
## 59 Licensed Massage Therapist
## 60 Massage Therapist
## 61 Salon Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist, Full-Time
## 65 Licensed Massage Therapist
## 66 Massage Therapist, Part-Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$15 - $18 an hour $15 - $18 15 18
## 2 \n$40 - $80 an hour $40 - $80 40 80
## 3 \n$30 - $45 an hour $30 - $45 30 45
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$30 - $40 an hour $30 - $40 30 40
## 6 \n$40 - $50 an hour $40 - $50 40 50
## 7 \n$40 - $45 an hour $40 - $45 40 45
## 8 \n$25,000 - $52,589 a year $25000 - $52589 25000 52589
## 9 \n$30 - $45 an hour $30 - $45 30 45
## 10 \n$20 - $30 an hour $20 - $30 20 30
## 11 \n$62,000 a year $62000 62000 NA
## 12 \n$45 - $70 an hour $45 - $70 45 70
## 13 \n$35 - $50 an hour $35 - $50 35 50
## 14 \n$30,000 a year $30000 30000 NA
## 15 \n$27 - $32 an hour $27 - $32 27 32
## 16 \n$20 - $30 an hour $20 - $30 20 30
## 17 \n$62,000 a year $62000 62000 NA
## 18 \n$45 - $70 an hour $45 - $70 45 70
## 19 \n$35 - $50 an hour $35 - $50 35 50
## 20 \n$30,000 a year $30000 30000 NA
## 21 \n$27 - $32 an hour $27 - $32 27 32
## 22 \n$20 - $30 an hour $20 - $30 20 30
## 23 \n$62,000 a year $62000 62000 NA
## 24 \n$45 - $70 an hour $45 - $70 45 70
## 25 \n$35 - $50 an hour $35 - $50 35 50
## 26 \n$30,000 a year $30000 30000 NA
## 27 \n$27 - $32 an hour $27 - $32 27 32
## 28 \n$20 - $30 an hour $20 - $30 20 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 37.5 40 10950.93 7442.28 15
## 2 37.5 40 10950.93 7442.28 15
## 3 37.5 40 10950.93 7442.28 15
## 4 37.5 40 10950.93 7442.28 15
## 5 37.5 40 10950.93 7442.28 15
## 6 37.5 40 10950.93 7442.28 15
## 7 37.5 40 10950.93 7442.28 15
## 8 37.5 40 10950.93 7442.28 15
## 9 37.5 40 10950.93 7442.28 15
## 10 37.5 40 10950.93 7442.28 15
## 11 37.5 40 10950.93 7442.28 15
## 12 37.5 40 10950.93 7442.28 15
## 13 37.5 40 10950.93 7442.28 15
## 14 37.5 40 10950.93 7442.28 15
## 15 37.5 40 10950.93 7442.28 15
## 16 37.5 40 10950.93 7442.28 15
## 17 37.5 40 10950.93 7442.28 15
## 18 37.5 40 10950.93 7442.28 15
## 19 37.5 40 10950.93 7442.28 15
## 20 37.5 40 10950.93 7442.28 15
## 21 37.5 40 10950.93 7442.28 15
## 22 37.5 40 10950.93 7442.28 15
## 23 37.5 40 10950.93 7442.28 15
## 24 37.5 40 10950.93 7442.28 15
## 25 37.5 40 10950.93 7442.28 15
## 26 37.5 40 10950.93 7442.28 15
## 27 37.5 40 10950.93 7442.28 15
## 28 37.5 40 10950.93 7442.28 15
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
## 26 62000
## 27 62000
## 28 62000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 1
## 3 2
## 4 30
## 5 30
## 6 30
## 7 9
## 8 2
## 9 5
## 10 4
## 11 29
## 12 28
## 13 5
## 14 30
## 15 29
## 16 1
## 17 18
## 18 30
## 19 30
## 20 30
## 21 30
## 22 30
## 23 30
## 24 14
## 25 25
## 26 7
## 27 12
## 28 30
## 29 23
## 30 30
## 31 30
## 32 18
## 33 30
## 34 30
## 35 30
## 36 30
## 37 30
## 38 30
## 39 14
## 40 25
## 41 7
## 42 12
## 43 30
## 44 23
## 45 30
## 46 30
## 47 18
## 48 30
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 14
## 55 25
## 56 7
## 57 12
## 58 30
## 59 23
## 60 30
## 61 30
## 62 18
## 63 30
## 64 30
## 65 30
## 66 30
##
## [[4]]
## HiringAgency
## 1 Hand and Stone Massage and Facial SpaRocky River, OH 44116
## 2 The Injury Center, LLCCleveland, OH 44144
## 3 Urban Haven LLCCleveland, OH 44113 (Tremont area)
## 4 CHIROPRACTIC CLINICBedford, OH 44146
## 5 Hand and Stone StrongsvilleStrongsville, OH 44136
## 6 Lynette Sciulli Salon and SpaWestlake, OH 44145
## 7 Hand & Stone - Strongsville3.0Strongsville, OH 44136
## 8 Ramsey InsightCleveland, OH+1 location
## 9 Indo-Pak Massage TherapyCleveland, OH•Remote work available
## 10 Lifelong BodyworkBeachwood, OH 44122
## 11 Acupuncture First LLCCleveland, OH 44113 (Tremont area)
## 12 Mac Mobile MassageCleveland Heights, OH
## 13 Brecksville Physical MedicineBrecksville, OH 44141
## 14 Life Time3.6Beachwood, OH 44122
## 15 Elements Massage3.6Avon, OH 44011
## 16 Ramsey InsightCleveland, OH
## 17 Spa LavenderSolon, OH 44139
## 18 Massage Heights3.1Fairview Park, OH 44126+1 location
## 19 Massage Envy3.2Westlake, OH 44145+4 locations
## 20 Massage Envy3.2Macedonia, OH 44056
## 21 Massage Envy3.2Westlake, OH 44145+4 locations
## 22 Elements3.6Avon, OH 44011
## 23 Indo-Pak Massage TherapyLakewood, OH
## 24 Spavia Day Spa3.3Strongsville, OH 44136
## 25 The Woodhouse Day Spa - ClevelandOrange, OH
## 26 Hand and Stone Spa3.0Rocky River, OH 44116
## 27 Living Tree Center for HealingNorth Royalton, OH 44133
## 28 Summa Health3.6Hudson, OH
## 29 Spa WestWestlake, OH 44145
## 30 Massage Envy3.2Beachwood, OH 44122+3 locations
## 31 JCPenney3.7Mentor, OH 44060
## 32 Spa LavenderSolon, OH 44139
## 33 Massage Heights3.1Fairview Park, OH 44126+1 location
## 34 Massage Envy3.2Westlake, OH 44145+4 locations
## 35 Massage Envy3.2Macedonia, OH 44056
## 36 Massage Envy3.2Westlake, OH 44145+4 locations
## 37 Elements3.6Avon, OH 44011
## 38 Indo-Pak Massage TherapyLakewood, OH
## 39 Spavia Day Spa3.3Strongsville, OH 44136
## 40 The Woodhouse Day Spa - ClevelandOrange, OH
## 41 Hand and Stone Spa3.0Rocky River, OH 44116
## 42 Living Tree Center for HealingNorth Royalton, OH 44133
## 43 Summa Health3.6Hudson, OH
## 44 Spa WestWestlake, OH 44145
## 45 Massage Envy3.2Beachwood, OH 44122+3 locations
## 46 JCPenney3.7Mentor, OH 44060
## 47 Spa LavenderSolon, OH 44139
## 48 Massage Heights3.1Fairview Park, OH 44126+1 location
## 49 Massage Envy3.2Westlake, OH 44145+4 locations
## 50 Massage Envy3.2Macedonia, OH 44056
## 51 Massage Envy3.2Westlake, OH 44145+4 locations
## 52 Elements3.6Avon, OH 44011
## 53 Indo-Pak Massage TherapyLakewood, OH
## 54 Spavia Day Spa3.3Strongsville, OH 44136
## 55 The Woodhouse Day Spa - ClevelandOrange, OH
## 56 Hand and Stone Spa3.0Rocky River, OH 44116
## 57 Living Tree Center for HealingNorth Royalton, OH 44133
## 58 Summa Health3.6Hudson, OH
## 59 Spa WestWestlake, OH 44145
## 60 Massage Envy3.2Beachwood, OH 44122+3 locations
## 61 JCPenney3.7Mentor, OH 44060
## 62 Spa LavenderSolon, OH 44139
## 63 Massage Heights3.1Fairview Park, OH 44126+1 location
## 64 Massage Envy3.2Westlake, OH 44145+4 locations
## 65 Massage Envy3.2Macedonia, OH 44056
## 66 Massage Envy3.2Westlake, OH 44145+4 locations
##
## [[5]]
## Salary salary minSalary maxSalary
## 8 \n$25,000 - $52,589 a year $25000 - $52589 25000 52589
## 11 \n$62,000 a year $62000 62000 NA
## 14 \n$30,000 a year $30000 30000 NA
## 17 \n$62,000 a year $62000 62000 NA
## 20 \n$30,000 a year $30000 30000 NA
## 23 \n$62,000 a year $62000 62000 NA
## 26 \n$30,000 a year $30000 30000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 8 30000 52589 43000 52589 25000
## 11 30000 52589 43000 52589 25000
## 14 30000 52589 43000 52589 25000
## 17 30000 52589 43000 52589 25000
## 20 30000 52589 43000 52589 25000
## 23 30000 52589 43000 52589 25000
## 26 30000 52589 43000 52589 25000
## maximumMaxSalary
## 8 52589
## 11 52589
## 14 52589
## 17 52589
## 20 52589
## 23 52589
## 26 52589
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$15 - $18 an hour $15 - $18 15 18 30
## 2 \n$40 - $80 an hour $40 - $80 40 80 30
## 3 \n$30 - $45 an hour $30 - $45 30 45 30
## 5 \n$30 - $40 an hour $30 - $40 30 40 30
## 6 \n$40 - $50 an hour $40 - $50 40 50 30
## 7 \n$40 - $45 an hour $40 - $45 40 45 30
## 9 \n$30 - $45 an hour $30 - $45 30 45 30
## 10 \n$20 - $30 an hour $20 - $30 20 30 30
## 12 \n$45 - $70 an hour $45 - $70 45 70 30
## 13 \n$35 - $50 an hour $35 - $50 35 50 30
## 15 \n$27 - $32 an hour $27 - $32 27 32 30
## 16 \n$20 - $30 an hour $20 - $30 20 30 30
## 18 \n$45 - $70 an hour $45 - $70 45 70 30
## 19 \n$35 - $50 an hour $35 - $50 35 50 30
## 21 \n$27 - $32 an hour $27 - $32 27 32 30
## 22 \n$20 - $30 an hour $20 - $30 20 30 30
## 24 \n$45 - $70 an hour $45 - $70 45 70 30
## 25 \n$35 - $50 an hour $35 - $50 35 50 30
## 27 \n$27 - $32 an hour $27 - $32 27 32 30
## 28 \n$20 - $30 an hour $20 - $30 20 30 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 31.3 44.95 15 80
## 2 45 31.3 44.95 15 80
## 3 45 31.3 44.95 15 80
## 5 45 31.3 44.95 15 80
## 6 45 31.3 44.95 15 80
## 7 45 31.3 44.95 15 80
## 9 45 31.3 44.95 15 80
## 10 45 31.3 44.95 15 80
## 12 45 31.3 44.95 15 80
## 13 45 31.3 44.95 15 80
## 15 45 31.3 44.95 15 80
## 16 45 31.3 44.95 15 80
## 18 45 31.3 44.95 15 80
## 19 45 31.3 44.95 15 80
## 21 45 31.3 44.95 15 80
## 22 45 31.3 44.95 15 80
## 24 45 31.3 44.95 15 80
## 25 45 31.3 44.95 15 80
## 27 45 31.3 44.95 15 80
## 28 45 31.3 44.95 15 80
##
## [[7]]
## city state jobTitle
## 1 Cleveland OH Massage Therapist
## 2 Cleveland OH Licensed Massage Therapist (LMT)
## 3 Cleveland OH Licensed Massage Therapist
## 4 Cleveland OH Massage Therapist Chiropractic Clinic
## 5 Cleveland OH Massage Therapist w/ SIGN ON BONUS
## 6 Cleveland OH Licensed Massage Therapist (LMT)
## 7 Cleveland OH Licensed Massage Therapist SIGN ON BONUS
## 8 Cleveland OH Licensed Massage Therapist - Passionate Healer
## 9 Cleveland OH Massage Therapist - Independent Contractor
## 10 Cleveland OH Licensed Massage Therapist (LMT)
## 11 Cleveland OH Licensed Massage Therapist, Independent Contractor
## 12 Cleveland OH Licensed Massage Therapist
## 13 Cleveland OH Licensed Massage Therapist
## 14 Cleveland OH Massage Therapist
## 15 Cleveland OH Massage Therapist
## 16 Cleveland OH Licensed Massage Therapist - HUGE OPPORTUNITY!
## 17 Cleveland OH Licensed Massage Therapist
## 18 Cleveland OH Licensed Massage Therapist
## 19 Cleveland OH Massage Therapist, Full-Time
## 20 Cleveland OH Licensed Massage Therapist
## 21 Cleveland OH Massage Therapist, Part-Time
## 22 Cleveland OH Massage Therapist
## 23 Cleveland OH Mobile Massage Therapist
## 24 Cleveland OH Licensed Massage Therapist
## 25 Cleveland OH Massage Therapist
## 26 Cleveland OH Licensed Massage Therapist
## 27 Cleveland OH Licensed Massage Therapist (LMT)
## 28 Cleveland OH Massage Therapist (PRN - As Needed)
## 29 Cleveland OH Licensed Massage Therapist
## 30 Cleveland OH Massage Therapist
## 31 Cleveland OH Salon Massage Therapist
## 32 Cleveland OH Licensed Massage Therapist
## 33 Cleveland OH Licensed Massage Therapist
## 34 Cleveland OH Massage Therapist, Full-Time
## 35 Cleveland OH Licensed Massage Therapist
## 36 Cleveland OH Massage Therapist, Part-Time
## 37 Cleveland OH Massage Therapist
## 38 Cleveland OH Mobile Massage Therapist
## 39 Cleveland OH Licensed Massage Therapist
## 40 Cleveland OH Massage Therapist
## 41 Cleveland OH Licensed Massage Therapist
## 42 Cleveland OH Licensed Massage Therapist (LMT)
## 43 Cleveland OH Massage Therapist (PRN - As Needed)
## 44 Cleveland OH Licensed Massage Therapist
## 45 Cleveland OH Massage Therapist
## 46 Cleveland OH Salon Massage Therapist
## 47 Cleveland OH Licensed Massage Therapist
## 48 Cleveland OH Licensed Massage Therapist
## 49 Cleveland OH Massage Therapist, Full-Time
## 50 Cleveland OH Licensed Massage Therapist
## 51 Cleveland OH Massage Therapist, Part-Time
## 52 Cleveland OH Massage Therapist
## 53 Cleveland OH Mobile Massage Therapist
## 54 Cleveland OH Licensed Massage Therapist
## 55 Cleveland OH Massage Therapist
## 56 Cleveland OH Licensed Massage Therapist
## 57 Cleveland OH Licensed Massage Therapist (LMT)
## 58 Cleveland OH Massage Therapist (PRN - As Needed)
## 59 Cleveland OH Licensed Massage Therapist
## 60 Cleveland OH Massage Therapist
## 61 Cleveland OH Salon Massage Therapist
## 62 Cleveland OH Licensed Massage Therapist
## 63 Cleveland OH Licensed Massage Therapist
## 64 Cleveland OH Massage Therapist, Full-Time
## 65 Cleveland OH Licensed Massage Therapist
## 66 Cleveland OH Massage Therapist, Part-Time
## HiringAgency date_daysAgo
## 1 Hand and Stone Massage and Facial SpaRocky River, OH 44116 30
## 2 The Injury Center, LLCCleveland, OH 44144 1
## 3 Urban Haven LLCCleveland, OH 44113 (Tremont area) 2
## 4 CHIROPRACTIC CLINICBedford, OH 44146 30
## 5 Hand and Stone StrongsvilleStrongsville, OH 44136 30
## 6 Lynette Sciulli Salon and SpaWestlake, OH 44145 30
## 7 Hand & Stone - Strongsville3.0Strongsville, OH 44136 9
## 8 Ramsey InsightCleveland, OH+1 location 2
## 9 Indo-Pak Massage TherapyCleveland, OH•Remote work available 5
## 10 Lifelong BodyworkBeachwood, OH 44122 4
## 11 Acupuncture First LLCCleveland, OH 44113 (Tremont area) 29
## 12 Mac Mobile MassageCleveland Heights, OH 28
## 13 Brecksville Physical MedicineBrecksville, OH 44141 5
## 14 Life Time3.6Beachwood, OH 44122 30
## 15 Elements Massage3.6Avon, OH 44011 29
## 16 Ramsey InsightCleveland, OH 1
## 17 Spa LavenderSolon, OH 44139 18
## 18 Massage Heights3.1Fairview Park, OH 44126+1 location 30
## 19 Massage Envy3.2Westlake, OH 44145+4 locations 30
## 20 Massage Envy3.2Macedonia, OH 44056 30
## 21 Massage Envy3.2Westlake, OH 44145+4 locations 30
## 22 Elements3.6Avon, OH 44011 30
## 23 Indo-Pak Massage TherapyLakewood, OH 30
## 24 Spavia Day Spa3.3Strongsville, OH 44136 14
## 25 The Woodhouse Day Spa - ClevelandOrange, OH 25
## 26 Hand and Stone Spa3.0Rocky River, OH 44116 7
## 27 Living Tree Center for HealingNorth Royalton, OH 44133 12
## 28 Summa Health3.6Hudson, OH 30
## 29 Spa WestWestlake, OH 44145 23
## 30 Massage Envy3.2Beachwood, OH 44122+3 locations 30
## 31 JCPenney3.7Mentor, OH 44060 30
## 32 Spa LavenderSolon, OH 44139 18
## 33 Massage Heights3.1Fairview Park, OH 44126+1 location 30
## 34 Massage Envy3.2Westlake, OH 44145+4 locations 30
## 35 Massage Envy3.2Macedonia, OH 44056 30
## 36 Massage Envy3.2Westlake, OH 44145+4 locations 30
## 37 Elements3.6Avon, OH 44011 30
## 38 Indo-Pak Massage TherapyLakewood, OH 30
## 39 Spavia Day Spa3.3Strongsville, OH 44136 14
## 40 The Woodhouse Day Spa - ClevelandOrange, OH 25
## 41 Hand and Stone Spa3.0Rocky River, OH 44116 7
## 42 Living Tree Center for HealingNorth Royalton, OH 44133 12
## 43 Summa Health3.6Hudson, OH 30
## 44 Spa WestWestlake, OH 44145 23
## 45 Massage Envy3.2Beachwood, OH 44122+3 locations 30
## 46 JCPenney3.7Mentor, OH 44060 30
## 47 Spa LavenderSolon, OH 44139 18
## 48 Massage Heights3.1Fairview Park, OH 44126+1 location 30
## 49 Massage Envy3.2Westlake, OH 44145+4 locations 30
## 50 Massage Envy3.2Macedonia, OH 44056 30
## 51 Massage Envy3.2Westlake, OH 44145+4 locations 30
## 52 Elements3.6Avon, OH 44011 30
## 53 Indo-Pak Massage TherapyLakewood, OH 30
## 54 Spavia Day Spa3.3Strongsville, OH 44136 14
## 55 The Woodhouse Day Spa - ClevelandOrange, OH 25
## 56 Hand and Stone Spa3.0Rocky River, OH 44116 7
## 57 Living Tree Center for HealingNorth Royalton, OH 44133 12
## 58 Summa Health3.6Hudson, OH 30
## 59 Spa WestWestlake, OH 44145 23
## 60 Massage Envy3.2Beachwood, OH 44122+3 locations 30
## 61 JCPenney3.7Mentor, OH 44060 30
## 62 Spa LavenderSolon, OH 44139 18
## 63 Massage Heights3.1Fairview Park, OH 44126+1 location 30
## 64 Massage Envy3.2Westlake, OH 44145+4 locations 30
## 65 Massage Envy3.2Macedonia, OH 44056 30
## 66 Massage Envy3.2Westlake, OH 44145+4 locations 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 15 80 25000 52589
## 2 15 80 25000 52589
## 3 15 80 25000 52589
## 4 15 80 25000 52589
## 5 15 80 25000 52589
## 6 15 80 25000 52589
## 7 15 80 25000 52589
## 8 15 80 25000 52589
## 9 15 80 25000 52589
## 10 15 80 25000 52589
## 11 15 80 25000 52589
## 12 15 80 25000 52589
## 13 15 80 25000 52589
## 14 15 80 25000 52589
## 15 15 80 25000 52589
## 16 15 80 25000 52589
## 17 15 80 25000 52589
## 18 15 80 25000 52589
## 19 15 80 25000 52589
## 20 15 80 25000 52589
## 21 15 80 25000 52589
## 22 15 80 25000 52589
## 23 15 80 25000 52589
## 24 15 80 25000 52589
## 25 15 80 25000 52589
## 26 15 80 25000 52589
## 27 15 80 25000 52589
## 28 15 80 25000 52589
## 29 15 80 25000 52589
## 30 15 80 25000 52589
## 31 15 80 25000 52589
## 32 15 80 25000 52589
## 33 15 80 25000 52589
## 34 15 80 25000 52589
## 35 15 80 25000 52589
## 36 15 80 25000 52589
## 37 15 80 25000 52589
## 38 15 80 25000 52589
## 39 15 80 25000 52589
## 40 15 80 25000 52589
## 41 15 80 25000 52589
## 42 15 80 25000 52589
## 43 15 80 25000 52589
## 44 15 80 25000 52589
## 45 15 80 25000 52589
## 46 15 80 25000 52589
## 47 15 80 25000 52589
## 48 15 80 25000 52589
## 49 15 80 25000 52589
## 50 15 80 25000 52589
## 51 15 80 25000 52589
## 52 15 80 25000 52589
## 53 15 80 25000 52589
## 54 15 80 25000 52589
## 55 15 80 25000 52589
## 56 15 80 25000 52589
## 57 15 80 25000 52589
## 58 15 80 25000 52589
## 59 15 80 25000 52589
## 60 15 80 25000 52589
## 61 15 80 25000 52589
## 62 15 80 25000 52589
## 63 15 80 25000 52589
## 64 15 80 25000 52589
## 65 15 80 25000 52589
## 66 15 80 25000 52589
getIndeedJobData5pages('massage therapist', 'Cincinnati','OH')
## Warning in getIndeedJobData5pages("massage therapist", "Cincinnati", "OH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Cincinnati", "OH"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Cincinnati", "OH"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapists
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist/Chiropractic Assistant
## 9 Massage Therapist
## 10 Mobile Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist (Cincinnati-Eastgate)
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Lead Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapists
## 20 Massage Therapist
## 21 Massage Therapist LOVE WORKING AT NEWPORT
## 22 Licensed Massage Therapist at The Woodhouse Day Spa
## 23 Stretch Therapist
## 24 Massage Therapist - Independent Contractor
## 25 Licensed Massage Therapist
## 26 Stretch Service Provider (Great Opportunity for Personal Tra...
## 27 Salon Massage Therapist
## 28 Licensed Massage Therapist
## 29 Lead Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (Cincinnati-Eastgate)
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist LOVE WORKING AT NEWPORT
## 35 Licensed Massage Therapist at The Woodhouse Day Spa
## 36 Stretch Therapist
## 37 Massage Therapist - Independent Contractor
## 38 Licensed Massage Therapist
## 39 Stretch Service Provider (Great Opportunity for Personal Tra...
## 40 Salon Massage Therapist
## 41 Licensed Massage Therapist
## 42 Lead Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapists
## 46 Massage Therapist
## 47 Massage Therapist
## 48 Licensed Massage Therapist (Cincinnati-Eastgate)
## 49 Massage Therapist
## 50 Massage Therapist LOVE WORKING AT NEWPORT
## 51 Licensed Massage Therapist at The Woodhouse Day Spa
## 52 Stretch Therapist
## 53 Massage Therapist - Independent Contractor
## 54 Licensed Massage Therapist
## 55 Stretch Service Provider (Great Opportunity for Personal Tra...
## 56 Salon Massage Therapist
## 57 Licensed Massage Therapist
## 58 Lead Massage Therapist
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapists
## 62 Massage Therapist
## 63 Massage Therapist
## 64 Licensed Massage Therapist (Cincinnati-Eastgate)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$18 - $45 an hour $18 - $45 18 45
## 2 \n$20 - $25 an hour $20 - $25 20 25
## 3 \n$26 - $34 an hour $26 - $34 26 34
## 4 \nUp to $35 an hour $35 35 NA
## 5 \n$62,000 a year $62000 62000 NA
## 6 \n$17 - $18 an hour $17 - $18 17 18
## 7 \n$45 - $70 an hour $45 - $70 45 70
## 8 \n$15 - $40 an hour $15 - $40 15 40
## 9 \n$25 - $35 an hour $25 - $35 25 35
## 10 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## 11 \n$18 - $45 an hour $18 - $45 18 45
## 12 \n$20 - $25 an hour $20 - $25 20 25
## 13 \n$18 - $20 an hour $18 - $20 18 20
## 14 \n$28 - $34 an hour $28 - $34 28 34
## 15 \n$14 - $15 an hour $14 - $15 14 15
## 16 \n$26 - $34 an hour $26 - $34 26 34
## 17 \n$25 - $35 an hour $25 - $35 25 35
## 18 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## 19 \n$18 - $20 an hour $18 - $20 18 20
## 20 \n$28 - $34 an hour $28 - $34 28 34
## 21 \n$14 - $15 an hour $14 - $15 14 15
## 22 \n$26 - $34 an hour $26 - $34 26 34
## 23 \n$20 - $25 an hour $20 - $25 20 25
## 24 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## 25 \n$18 - $45 an hour $18 - $45 18 45
## 26 \n$25 - $35 an hour $25 - $35 25 35
## 27 \n$18 - $20 an hour $18 - $20 18 20
## 28 \n$28 - $34 an hour $28 - $34 28 34
## 29 \n$14 - $15 an hour $14 - $15 14 15
## 30 \n$26 - $34 an hour $26 - $34 26 34
## 31 \n$20 - $25 an hour $20 - $25 20 25
## 32 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## 33 \n$18 - $45 an hour $18 - $45 18 45
## 34 \n$25 - $35 an hour $25 - $35 25 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 26 7136.706 7205.136 14
## 2 25 26 7136.706 7205.136 14
## 3 25 26 7136.706 7205.136 14
## 4 25 26 7136.706 7205.136 14
## 5 25 26 7136.706 7205.136 14
## 6 25 26 7136.706 7205.136 14
## 7 25 26 7136.706 7205.136 14
## 8 25 26 7136.706 7205.136 14
## 9 25 26 7136.706 7205.136 14
## 10 25 26 7136.706 7205.136 14
## 11 25 26 7136.706 7205.136 14
## 12 25 26 7136.706 7205.136 14
## 13 25 26 7136.706 7205.136 14
## 14 25 26 7136.706 7205.136 14
## 15 25 26 7136.706 7205.136 14
## 16 25 26 7136.706 7205.136 14
## 17 25 26 7136.706 7205.136 14
## 18 25 26 7136.706 7205.136 14
## 19 25 26 7136.706 7205.136 14
## 20 25 26 7136.706 7205.136 14
## 21 25 26 7136.706 7205.136 14
## 22 25 26 7136.706 7205.136 14
## 23 25 26 7136.706 7205.136 14
## 24 25 26 7136.706 7205.136 14
## 25 25 26 7136.706 7205.136 14
## 26 25 26 7136.706 7205.136 14
## 27 25 26 7136.706 7205.136 14
## 28 25 26 7136.706 7205.136 14
## 29 25 26 7136.706 7205.136 14
## 30 25 26 7136.706 7205.136 14
## 31 25 26 7136.706 7205.136 14
## 32 25 26 7136.706 7205.136 14
## 33 25 26 7136.706 7205.136 14
## 34 25 26 7136.706 7205.136 14
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
## 26 62000
## 27 62000
## 28 62000
## 29 62000
## 30 62000
## 31 62000
## 32 62000
## 33 62000
## 34 62000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 30
## 4 30
## 5 Just posted
## 6 30
## 7 7
## 8 12
## 9 30
## 10 30
## 11 12
## 12 30
## 13 30
## 14 11
## 15 21
## 16 13
## 17 30
## 18 30
## 19 30
## 20 30
## 21 18
## 22 30
## 23 30
## 24 28
## 25 27
## 26 5
## 27 30
## 28 21
## 29 13
## 30 30
## 31 30
## 32 11
## 33 30
## 34 18
## 35 30
## 36 30
## 37 28
## 38 27
## 39 5
## 40 30
## 41 21
## 42 13
## 43 30
## 44 30
## 45 30
## 46 11
## 47 30
## 48 30
## 49 30
## 50 18
## 51 30
## 52 30
## 53 28
## 54 27
## 55 5
## 56 30
## 57 21
## 58 13
## 59 30
## 60 30
## 61 30
## 62 11
## 63 30
## 64 30
##
## [[4]]
## HiringAgency
## 1 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 2 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 3 Everybody's Health2.4Mason, OH 45040
## 4 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 5 Norwood Chiropractic & Sports Injury CenterMason, OH 45040
## 6 Elements3.6Cincinnati, OH 45255 (Forestville area)+3 locations
## 7 Phenix Salon Suites FranchisingCincinnati, OH 45249+1 location
## 8 WholeCareBlue Ash, OH 45242
## 9 WTS International3.3Cincinnati, OH 45236
## 10 Indo-Pak Massage TherapyCincinnati, OH+2 locations
## 11 Hand and Stone3.0Cincinnati, OH 45209 (Oakley area)+3 locations
## 12 Everybodys Health2.4Mason, OH 45040
## 13 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
## 14 Elements Massage3.6West Chester, OH 45069
## 15 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 16 Massage Spa4.3Fort Mitchell, KY 41017
## 17 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 18 Everybody's Health2.4Mason, OH 45040
## 19 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 20 Power Wellness3.1Fairfield, OH 45014
## 21 Massage Envy3.2Newport, KY 41071
## 22 The Woodhouse Day Spa3.3Township of Liberty, OH 45069
## 23 StretchLab Ft. Wright3.8Fort Wright, KY
## 24 Kneading Touch Therapeutic MassageWest Chester, OH 45069
## 25 Cloud 9 Salon & SpaFlorence, KY 41042
## 26 Massage Envy3.2Florence, KY 41042
## 27 JCPenney3.7Florence, KY 41042
## 28 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 29 Massage Spa4.3Fort Mitchell, KY 41017
## 30 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 31 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
## 32 Elements Massage3.6West Chester, OH 45069
## 33 Power Wellness3.1Fairfield, OH 45014
## 34 Massage Envy3.2Newport, KY 41071
## 35 The Woodhouse Day Spa3.3Township of Liberty, OH 45069
## 36 StretchLab Ft. Wright3.8Fort Wright, KY
## 37 Kneading Touch Therapeutic MassageWest Chester, OH 45069
## 38 Cloud 9 Salon & SpaFlorence, KY 41042
## 39 Massage Envy3.2Florence, KY 41042
## 40 JCPenney3.7Florence, KY 41042
## 41 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 42 Massage Spa4.3Fort Mitchell, KY 41017
## 43 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 44 Everybody's Health2.4Mason, OH 45040
## 45 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 46 Elements Massage3.6West Chester, OH 45069
## 47 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 48 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
## 49 Power Wellness3.1Fairfield, OH 45014
## 50 Massage Envy3.2Newport, KY 41071
## 51 The Woodhouse Day Spa3.3Township of Liberty, OH 45069
## 52 StretchLab Ft. Wright3.8Fort Wright, KY
## 53 Kneading Touch Therapeutic MassageWest Chester, OH 45069
## 54 Cloud 9 Salon & SpaFlorence, KY 41042
## 55 Massage Envy3.2Florence, KY 41042
## 56 JCPenney3.7Florence, KY 41042
## 57 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 58 Massage Spa4.3Fort Mitchell, KY 41017
## 59 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 60 Everybody's Health2.4Mason, OH 45040
## 61 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 62 Elements Massage3.6West Chester, OH 45069
## 63 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 64 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
##
## [[5]]
## Salary salary minSalary maxSalary
## 5 \n$62,000 a year $62000 62000 NA
## 10 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## 18 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## 24 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## 32 \n$45,000 - $58,000 a year $45000 - $58000 45000 58000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 5 45000 58000 48400 58000 45000
## 10 45000 58000 48400 58000 45000
## 18 45000 58000 48400 58000 45000
## 24 45000 58000 48400 58000 45000
## 32 45000 58000 48400 58000 45000
## maximumMaxSalary
## 5 58000
## 10 58000
## 18 58000
## 24 58000
## 32 58000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$18 - $45 an hour $18 - $45 18 45 20
## 2 \n$20 - $25 an hour $20 - $25 20 25 20
## 3 \n$26 - $34 an hour $26 - $34 26 34 20
## 4 \nUp to $35 an hour $35 35 NA 20
## 6 \n$17 - $18 an hour $17 - $18 17 18 20
## 7 \n$45 - $70 an hour $45 - $70 45 70 20
## 8 \n$15 - $40 an hour $15 - $40 15 40 20
## 9 \n$25 - $35 an hour $25 - $35 25 35 20
## 11 \n$18 - $45 an hour $18 - $45 18 45 20
## 12 \n$20 - $25 an hour $20 - $25 20 25 20
## 13 \n$18 - $20 an hour $18 - $20 18 20 20
## 14 \n$28 - $34 an hour $28 - $34 28 34 20
## 15 \n$14 - $15 an hour $14 - $15 14 15 20
## 16 \n$26 - $34 an hour $26 - $34 26 34 20
## 17 \n$25 - $35 an hour $25 - $35 25 35 20
## 19 \n$18 - $20 an hour $18 - $20 18 20 20
## 20 \n$28 - $34 an hour $28 - $34 28 34 20
## 21 \n$14 - $15 an hour $14 - $15 14 15 20
## 22 \n$26 - $34 an hour $26 - $34 26 34 20
## 23 \n$20 - $25 an hour $20 - $25 20 25 20
## 25 \n$18 - $45 an hour $18 - $45 18 45 20
## 26 \n$25 - $35 an hour $25 - $35 25 35 20
## 27 \n$18 - $20 an hour $18 - $20 18 20 20
## 28 \n$28 - $34 an hour $28 - $34 28 34 20
## 29 \n$14 - $15 an hour $14 - $15 14 15 20
## 30 \n$26 - $34 an hour $26 - $34 26 34 20
## 31 \n$20 - $25 an hour $20 - $25 20 25 20
## 33 \n$18 - $45 an hour $18 - $45 18 45 20
## 34 \n$25 - $35 an hour $25 - $35 25 35 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 34 22.34483 31.82143 14 70
## 2 34 22.34483 31.82143 14 70
## 3 34 22.34483 31.82143 14 70
## 4 34 22.34483 31.82143 14 70
## 6 34 22.34483 31.82143 14 70
## 7 34 22.34483 31.82143 14 70
## 8 34 22.34483 31.82143 14 70
## 9 34 22.34483 31.82143 14 70
## 11 34 22.34483 31.82143 14 70
## 12 34 22.34483 31.82143 14 70
## 13 34 22.34483 31.82143 14 70
## 14 34 22.34483 31.82143 14 70
## 15 34 22.34483 31.82143 14 70
## 16 34 22.34483 31.82143 14 70
## 17 34 22.34483 31.82143 14 70
## 19 34 22.34483 31.82143 14 70
## 20 34 22.34483 31.82143 14 70
## 21 34 22.34483 31.82143 14 70
## 22 34 22.34483 31.82143 14 70
## 23 34 22.34483 31.82143 14 70
## 25 34 22.34483 31.82143 14 70
## 26 34 22.34483 31.82143 14 70
## 27 34 22.34483 31.82143 14 70
## 28 34 22.34483 31.82143 14 70
## 29 34 22.34483 31.82143 14 70
## 30 34 22.34483 31.82143 14 70
## 31 34 22.34483 31.82143 14 70
## 33 34 22.34483 31.82143 14 70
## 34 34 22.34483 31.82143 14 70
##
## [[7]]
## city state
## 1 Cincinnati OH
## 2 Cincinnati OH
## 3 Cincinnati OH
## 4 Cincinnati OH
## 5 Cincinnati OH
## 6 Cincinnati OH
## 7 Cincinnati OH
## 8 Cincinnati OH
## 9 Cincinnati OH
## 10 Cincinnati OH
## 11 Cincinnati OH
## 12 Cincinnati OH
## 13 Cincinnati OH
## 14 Cincinnati OH
## 15 Cincinnati OH
## 16 Cincinnati OH
## 17 Cincinnati OH
## 18 Cincinnati OH
## 19 Cincinnati OH
## 20 Cincinnati OH
## 21 Cincinnati OH
## 22 Cincinnati OH
## 23 Cincinnati OH
## 24 Cincinnati OH
## 25 Cincinnati OH
## 26 Cincinnati OH
## 27 Cincinnati OH
## 28 Cincinnati OH
## 29 Cincinnati OH
## 30 Cincinnati OH
## 31 Cincinnati OH
## 32 Cincinnati OH
## 33 Cincinnati OH
## 34 Cincinnati OH
## 35 Cincinnati OH
## 36 Cincinnati OH
## 37 Cincinnati OH
## 38 Cincinnati OH
## 39 Cincinnati OH
## 40 Cincinnati OH
## 41 Cincinnati OH
## 42 Cincinnati OH
## 43 Cincinnati OH
## 44 Cincinnati OH
## 45 Cincinnati OH
## 46 Cincinnati OH
## 47 Cincinnati OH
## 48 Cincinnati OH
## 49 Cincinnati OH
## 50 Cincinnati OH
## 51 Cincinnati OH
## 52 Cincinnati OH
## 53 Cincinnati OH
## 54 Cincinnati OH
## 55 Cincinnati OH
## 56 Cincinnati OH
## 57 Cincinnati OH
## 58 Cincinnati OH
## 59 Cincinnati OH
## 60 Cincinnati OH
## 61 Cincinnati OH
## 62 Cincinnati OH
## 63 Cincinnati OH
## 64 Cincinnati OH
## jobTitle
## 1 Licensed Massage Therapists
## 2 Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Massage Therapist/Chiropractic Assistant
## 9 Massage Therapist
## 10 Mobile Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist (Cincinnati-Eastgate)
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Lead Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapists
## 20 Massage Therapist
## 21 Massage Therapist LOVE WORKING AT NEWPORT
## 22 Licensed Massage Therapist at The Woodhouse Day Spa
## 23 Stretch Therapist
## 24 Massage Therapist - Independent Contractor
## 25 Licensed Massage Therapist
## 26 Stretch Service Provider (Great Opportunity for Personal Tra...
## 27 Salon Massage Therapist
## 28 Licensed Massage Therapist
## 29 Lead Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist (Cincinnati-Eastgate)
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist LOVE WORKING AT NEWPORT
## 35 Licensed Massage Therapist at The Woodhouse Day Spa
## 36 Stretch Therapist
## 37 Massage Therapist - Independent Contractor
## 38 Licensed Massage Therapist
## 39 Stretch Service Provider (Great Opportunity for Personal Tra...
## 40 Salon Massage Therapist
## 41 Licensed Massage Therapist
## 42 Lead Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapists
## 46 Massage Therapist
## 47 Massage Therapist
## 48 Licensed Massage Therapist (Cincinnati-Eastgate)
## 49 Massage Therapist
## 50 Massage Therapist LOVE WORKING AT NEWPORT
## 51 Licensed Massage Therapist at The Woodhouse Day Spa
## 52 Stretch Therapist
## 53 Massage Therapist - Independent Contractor
## 54 Licensed Massage Therapist
## 55 Stretch Service Provider (Great Opportunity for Personal Tra...
## 56 Salon Massage Therapist
## 57 Licensed Massage Therapist
## 58 Lead Massage Therapist
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapists
## 62 Massage Therapist
## 63 Massage Therapist
## 64 Licensed Massage Therapist (Cincinnati-Eastgate)
## HiringAgency
## 1 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 2 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 3 Everybody's Health2.4Mason, OH 45040
## 4 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 5 Norwood Chiropractic & Sports Injury CenterMason, OH 45040
## 6 Elements3.6Cincinnati, OH 45255 (Forestville area)+3 locations
## 7 Phenix Salon Suites FranchisingCincinnati, OH 45249+1 location
## 8 WholeCareBlue Ash, OH 45242
## 9 WTS International3.3Cincinnati, OH 45236
## 10 Indo-Pak Massage TherapyCincinnati, OH+2 locations
## 11 Hand and Stone3.0Cincinnati, OH 45209 (Oakley area)+3 locations
## 12 Everybodys Health2.4Mason, OH 45040
## 13 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
## 14 Elements Massage3.6West Chester, OH 45069
## 15 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 16 Massage Spa4.3Fort Mitchell, KY 41017
## 17 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 18 Everybody's Health2.4Mason, OH 45040
## 19 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 20 Power Wellness3.1Fairfield, OH 45014
## 21 Massage Envy3.2Newport, KY 41071
## 22 The Woodhouse Day Spa3.3Township of Liberty, OH 45069
## 23 StretchLab Ft. Wright3.8Fort Wright, KY
## 24 Kneading Touch Therapeutic MassageWest Chester, OH 45069
## 25 Cloud 9 Salon & SpaFlorence, KY 41042
## 26 Massage Envy3.2Florence, KY 41042
## 27 JCPenney3.7Florence, KY 41042
## 28 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 29 Massage Spa4.3Fort Mitchell, KY 41017
## 30 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 31 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
## 32 Elements Massage3.6West Chester, OH 45069
## 33 Power Wellness3.1Fairfield, OH 45014
## 34 Massage Envy3.2Newport, KY 41071
## 35 The Woodhouse Day Spa3.3Township of Liberty, OH 45069
## 36 StretchLab Ft. Wright3.8Fort Wright, KY
## 37 Kneading Touch Therapeutic MassageWest Chester, OH 45069
## 38 Cloud 9 Salon & SpaFlorence, KY 41042
## 39 Massage Envy3.2Florence, KY 41042
## 40 JCPenney3.7Florence, KY 41042
## 41 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 42 Massage Spa4.3Fort Mitchell, KY 41017
## 43 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 44 Everybody's Health2.4Mason, OH 45040
## 45 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 46 Elements Massage3.6West Chester, OH 45069
## 47 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 48 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
## 49 Power Wellness3.1Fairfield, OH 45014
## 50 Massage Envy3.2Newport, KY 41071
## 51 The Woodhouse Day Spa3.3Township of Liberty, OH 45069
## 52 StretchLab Ft. Wright3.8Fort Wright, KY
## 53 Kneading Touch Therapeutic MassageWest Chester, OH 45069
## 54 Cloud 9 Salon & SpaFlorence, KY 41042
## 55 Massage Envy3.2Florence, KY 41042
## 56 JCPenney3.7Florence, KY 41042
## 57 The Woodhouse Day Spa - NKYCrestview Hills, KY 41017
## 58 Massage Spa4.3Fort Mitchell, KY 41017
## 59 Mello Massage, LLCCincinnati, OH 45228 (California area)
## 60 Everybody's Health2.4Mason, OH 45040
## 61 Spavia Day Spa - RookwoodCincinnati, OH 45209 (Oakley area)
## 62 Elements Massage3.6West Chester, OH 45069
## 63 Becoming Mom® Spa + UltrasoundMason, OH 45040
## 64 Hand & Stone Massage and Facial Spa (Cincinnati - Eastgate)3.0Cincinnati, OH 45245
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 14 70 45000 58000
## 2 30 14 70 45000 58000
## 3 30 14 70 45000 58000
## 4 30 14 70 45000 58000
## 5 Just posted 14 70 45000 58000
## 6 30 14 70 45000 58000
## 7 7 14 70 45000 58000
## 8 12 14 70 45000 58000
## 9 30 14 70 45000 58000
## 10 30 14 70 45000 58000
## 11 12 14 70 45000 58000
## 12 30 14 70 45000 58000
## 13 30 14 70 45000 58000
## 14 11 14 70 45000 58000
## 15 21 14 70 45000 58000
## 16 13 14 70 45000 58000
## 17 30 14 70 45000 58000
## 18 30 14 70 45000 58000
## 19 30 14 70 45000 58000
## 20 30 14 70 45000 58000
## 21 18 14 70 45000 58000
## 22 30 14 70 45000 58000
## 23 30 14 70 45000 58000
## 24 28 14 70 45000 58000
## 25 27 14 70 45000 58000
## 26 5 14 70 45000 58000
## 27 30 14 70 45000 58000
## 28 21 14 70 45000 58000
## 29 13 14 70 45000 58000
## 30 30 14 70 45000 58000
## 31 30 14 70 45000 58000
## 32 11 14 70 45000 58000
## 33 30 14 70 45000 58000
## 34 18 14 70 45000 58000
## 35 30 14 70 45000 58000
## 36 30 14 70 45000 58000
## 37 28 14 70 45000 58000
## 38 27 14 70 45000 58000
## 39 5 14 70 45000 58000
## 40 30 14 70 45000 58000
## 41 21 14 70 45000 58000
## 42 13 14 70 45000 58000
## 43 30 14 70 45000 58000
## 44 30 14 70 45000 58000
## 45 30 14 70 45000 58000
## 46 11 14 70 45000 58000
## 47 30 14 70 45000 58000
## 48 30 14 70 45000 58000
## 49 30 14 70 45000 58000
## 50 18 14 70 45000 58000
## 51 30 14 70 45000 58000
## 52 30 14 70 45000 58000
## 53 28 14 70 45000 58000
## 54 27 14 70 45000 58000
## 55 5 14 70 45000 58000
## 56 30 14 70 45000 58000
## 57 21 14 70 45000 58000
## 58 13 14 70 45000 58000
## 59 30 14 70 45000 58000
## 60 30 14 70 45000 58000
## 61 30 14 70 45000 58000
## 62 11 14 70 45000 58000
## 63 30 14 70 45000 58000
## 64 30 14 70 45000 58000
Oklahoma Oklahoma City, Tulsa, Norman
getIndeedJobData5pages('massage therapist', 'Oklahoma City','OK')
## Warning in getIndeedJobData5pages("massage therapist", "Oklahoma City", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Oklahoma City", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Oklahoma City", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Full Time Licensed Massage Therapist
## 2 Massage Therapist - Independent Contractor
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Part Time Massage Therapist
## 8 Massage Therapist - Stretch Technician
## 9 Massage Therapist
## 10 LifeSpa-Massage Therapist
## 11 LifeSpa-Massage Therapist Apprentice
## 12 Massage Therapist [FULL-TIME]
## 13 Mobile Massage Therapist
## 14 Massage Therapist [PART-TIME]
## 15 Full Time Licensed Massage Therapist
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Part Time Massage Therapist
## 22 Massage Therapist - Stretch Technician
## 23 Massage Therapist
## 24 LifeSpa-Massage Therapist
## 25 LifeSpa-Massage Therapist Apprentice
## 26 Massage Therapist [FULL-TIME]
## 27 Mobile Massage Therapist
## 28 Massage Therapist [PART-TIME]
## 29 Full Time Licensed Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Massage Therapist
## 35 Part Time Massage Therapist
## 36 Massage Therapist - Stretch Technician
## 37 Massage Therapist
## 38 LifeSpa-Massage Therapist
## 39 LifeSpa-Massage Therapist Apprentice
## 40 Massage Therapist [FULL-TIME]
## 41 Mobile Massage Therapist
## 42 Massage Therapist [PART-TIME]
## 43 Full Time Licensed Massage Therapist
## 44 Massage Therapist - Independent Contractor
## 45 Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapist
## 49 Part Time Massage Therapist
## 50 Massage Therapist - Stretch Technician
## 51 Massage Therapist
## 52 LifeSpa-Massage Therapist
## 53 LifeSpa-Massage Therapist Apprentice
## 54 Massage Therapist [FULL-TIME]
## 55 Mobile Massage Therapist
## 56 Massage Therapist [PART-TIME]
## 57 Massage Therapist
## 58 Part Time Massage Therapist
## 59 Part Time Massage Therapist
## 60 Massage Therapist - Stretch Technician
## 61 Massage Therapist
## 62 LifeSpa-Massage Therapist
## 63 LifeSpa-Massage Therapist Apprentice
## 64 Massage Therapist [FULL-TIME]
## 65 Mobile Massage Therapist
## 66 Massage Therapist [PART-TIME]
## 67 Full Time Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$21 an hour $21 21 NA
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 4 \n$21 an hour $21 21 NA
## 5 \n$13 an hour $13 13 NA
## 6 \n$45,000 a year $45000 45000 NA
## 7 \n$45 - $70 an hour $45 - $70 45 70
## 8 \n$21 an hour $21 21 NA
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 11 \n$21 an hour $21 21 NA
## 12 \n$13 an hour $13 13 NA
## 13 \n$45,000 a year $45000 45000 NA
## 14 \n$45 - $70 an hour $45 - $70 45 70
## 15 \n$21 an hour $21 21 NA
## 16 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 17 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 18 \n$21 an hour $21 21 NA
## 19 \n$13 an hour $13 13 NA
## 20 \n$45,000 a year $45000 45000 NA
## 21 \n$45 - $70 an hour $45 - $70 45 70
## 22 \n$21 an hour $21 21 NA
## 23 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 24 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 25 \n$21 an hour $21 21 NA
## 26 \n$13 an hour $13 13 NA
## 27 \n$45,000 a year $45000 45000 NA
## 28 \n$45 - $70 an hour $45 - $70 45 70
## 29 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 30 \n$21 an hour $21 21 NA
## 31 \n$21 an hour $21 21 NA
## 32 \n$13 an hour $13 13 NA
## 33 \n$45,000 a year $45000 45000 NA
## 34 \n$45 - $70 an hour $45 - $70 45 70
## 35 \n$21 an hour $21 21 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 70 10443.46 12732.06 13
## 2 45 70 10443.46 12732.06 13
## 3 45 70 10443.46 12732.06 13
## 4 45 70 10443.46 12732.06 13
## 5 45 70 10443.46 12732.06 13
## 6 45 70 10443.46 12732.06 13
## 7 45 70 10443.46 12732.06 13
## 8 45 70 10443.46 12732.06 13
## 9 45 70 10443.46 12732.06 13
## 10 45 70 10443.46 12732.06 13
## 11 45 70 10443.46 12732.06 13
## 12 45 70 10443.46 12732.06 13
## 13 45 70 10443.46 12732.06 13
## 14 45 70 10443.46 12732.06 13
## 15 45 70 10443.46 12732.06 13
## 16 45 70 10443.46 12732.06 13
## 17 45 70 10443.46 12732.06 13
## 18 45 70 10443.46 12732.06 13
## 19 45 70 10443.46 12732.06 13
## 20 45 70 10443.46 12732.06 13
## 21 45 70 10443.46 12732.06 13
## 22 45 70 10443.46 12732.06 13
## 23 45 70 10443.46 12732.06 13
## 24 45 70 10443.46 12732.06 13
## 25 45 70 10443.46 12732.06 13
## 26 45 70 10443.46 12732.06 13
## 27 45 70 10443.46 12732.06 13
## 28 45 70 10443.46 12732.06 13
## 29 45 70 10443.46 12732.06 13
## 30 45 70 10443.46 12732.06 13
## 31 45 70 10443.46 12732.06 13
## 32 45 70 10443.46 12732.06 13
## 33 45 70 10443.46 12732.06 13
## 34 45 70 10443.46 12732.06 13
## 35 45 70 10443.46 12732.06 13
## maximumMaxSalary
## 1 45000
## 2 45000
## 3 45000
## 4 45000
## 5 45000
## 6 45000
## 7 45000
## 8 45000
## 9 45000
## 10 45000
## 11 45000
## 12 45000
## 13 45000
## 14 45000
## 15 45000
## 16 45000
## 17 45000
## 18 45000
## 19 45000
## 20 45000
## 21 45000
## 22 45000
## 23 45000
## 24 45000
## 25 45000
## 26 45000
## 27 45000
## 28 45000
## 29 45000
## 30 45000
## 31 45000
## 32 45000
## 33 45000
## 34 45000
## 35 45000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 5
## 3 20
## 4 30
## 5 30
## 6 4
## 7 30
## 8 12
## 9 30
## 10 30
## 11 30
## 12 30
## 13 30
## 14 30
## 15 30
## 16 5
## 17 20
## 18 30
## 19 30
## 20 4
## 21 30
## 22 12
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 30
## 29 30
## 30 5
## 31 20
## 32 30
## 33 30
## 34 4
## 35 30
## 36 12
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 5
## 45 20
## 46 30
## 47 30
## 48 4
## 49 30
## 50 12
## 51 30
## 52 30
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 30
## 59 30
## 60 12
## 61 30
## 62 30
## 63 30
## 64 30
## 65 30
## 66 30
## 67 30
##
## [[4]]
## HiringAgency
## 1 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 2 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 3 EXOS3.7Edmond, OK
## 4 Elements Massage3.6Edmond, OK 73013
## 5 Elements3.6Warr Acres, OK 73132
## 6 Massage Envy3.2Oklahoma City, OK 73134
## 7 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 8 Stretch U @ The Vitality MillYukon, OK 73099
## 9 Elements3.6Edmond, OK 73034
## 10 Life Time3.6Oklahoma City, OK 73134
## 11 Life Time3.6Oklahoma City, OK 73134
## 12 Massage Envy3.2Oklahoma City, OK 73170
## 13 Indo-Pak Massage TherapyNorman, OK
## 14 Massage Envy3.2Oklahoma City, OK 73170
## 15 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 16 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 17 EXOS3.7Edmond, OK
## 18 Elements Massage3.6Edmond, OK 73013
## 19 Elements3.6Warr Acres, OK 73132
## 20 Massage Envy3.2Oklahoma City, OK 73134
## 21 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 22 Stretch U @ The Vitality MillYukon, OK 73099
## 23 Elements3.6Edmond, OK 73034
## 24 Life Time3.6Oklahoma City, OK 73134
## 25 Life Time3.6Oklahoma City, OK 73134
## 26 Massage Envy3.2Oklahoma City, OK 73170
## 27 Indo-Pak Massage TherapyNorman, OK
## 28 Massage Envy3.2Oklahoma City, OK 73170
## 29 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 30 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 31 EXOS3.7Edmond, OK
## 32 Elements Massage3.6Edmond, OK 73013
## 33 Elements3.6Warr Acres, OK 73132
## 34 Massage Envy3.2Oklahoma City, OK 73134
## 35 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 36 Stretch U @ The Vitality MillYukon, OK 73099
## 37 Elements3.6Edmond, OK 73034
## 38 Life Time3.6Oklahoma City, OK 73134
## 39 Life Time3.6Oklahoma City, OK 73134
## 40 Massage Envy3.2Oklahoma City, OK 73170
## 41 Indo-Pak Massage TherapyNorman, OK
## 42 Massage Envy3.2Oklahoma City, OK 73170
## 43 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 44 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 45 EXOS3.7Edmond, OK
## 46 Elements Massage3.6Edmond, OK 73013
## 47 Elements3.6Warr Acres, OK 73132
## 48 Massage Envy3.2Oklahoma City, OK 73134
## 49 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 50 Stretch U @ The Vitality MillYukon, OK 73099
## 51 Elements3.6Edmond, OK 73034
## 52 Life Time3.6Oklahoma City, OK 73134
## 53 Life Time3.6Oklahoma City, OK 73134
## 54 Massage Envy3.2Oklahoma City, OK 73170
## 55 Indo-Pak Massage TherapyNorman, OK
## 56 Massage Envy3.2Oklahoma City, OK 73170
## 57 Elements Massage3.6Edmond, OK 73013
## 58 Brixton Chiropractic and AcupunctureNorman, OK
## 59 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 60 Stretch U @ The Vitality MillYukon, OK 73099
## 61 Elements3.6Edmond, OK 73034
## 62 Life Time3.6Oklahoma City, OK 73134
## 63 Life Time3.6Oklahoma City, OK 73134
## 64 Massage Envy3.2Oklahoma City, OK 73170
## 65 Indo-Pak Massage TherapyNorman, OK
## 66 Massage Envy3.2Oklahoma City, OK 73170
## 67 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 6 \n$45,000 a year $45000 45000 NA
## 10 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 13 \n$45,000 a year $45000 45000 NA
## 17 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 20 \n$45,000 a year $45000 45000 NA
## 24 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 27 \n$45,000 a year $45000 45000 NA
## 29 \n$24,000 - $42,000 a year $24000 - $42000 24000 42000
## 33 \n$45,000 a year $45000 45000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 34500 42000 34500 42000 24000
## 6 34500 42000 34500 42000 24000
## 10 34500 42000 34500 42000 24000
## 13 34500 42000 34500 42000 24000
## 17 34500 42000 34500 42000 24000
## 20 34500 42000 34500 42000 24000
## 24 34500 42000 34500 42000 24000
## 27 34500 42000 34500 42000 24000
## 29 34500 42000 34500 42000 24000
## 33 34500 42000 34500 42000 24000
## maximumMaxSalary
## 3 42000
## 6 42000
## 10 42000
## 13 42000
## 17 42000
## 20 42000
## 24 42000
## 27 42000
## 29 42000
## 33 42000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$21 an hour $21 21 NA 21
## 4 \n$21 an hour $21 21 NA 21
## 5 \n$13 an hour $13 13 NA 21
## 7 \n$45 - $70 an hour $45 - $70 45 70 21
## 8 \n$21 an hour $21 21 NA 21
## 11 \n$21 an hour $21 21 NA 21
## 12 \n$13 an hour $13 13 NA 21
## 14 \n$45 - $70 an hour $45 - $70 45 70 21
## 15 \n$21 an hour $21 21 NA 21
## 18 \n$21 an hour $21 21 NA 21
## 19 \n$13 an hour $13 13 NA 21
## 21 \n$45 - $70 an hour $45 - $70 45 70 21
## 22 \n$21 an hour $21 21 NA 21
## 25 \n$21 an hour $21 21 NA 21
## 26 \n$13 an hour $13 13 NA 21
## 28 \n$45 - $70 an hour $45 - $70 45 70 21
## 30 \n$21 an hour $21 21 NA 21
## 31 \n$21 an hour $21 21 NA 21
## 32 \n$13 an hour $13 13 NA 21
## 34 \n$45 - $70 an hour $45 - $70 45 70 21
## 35 \n$21 an hour $21 21 NA 21
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 70 24.80952 70 13 70
## 4 70 24.80952 70 13 70
## 5 70 24.80952 70 13 70
## 7 70 24.80952 70 13 70
## 8 70 24.80952 70 13 70
## 11 70 24.80952 70 13 70
## 12 70 24.80952 70 13 70
## 14 70 24.80952 70 13 70
## 15 70 24.80952 70 13 70
## 18 70 24.80952 70 13 70
## 19 70 24.80952 70 13 70
## 21 70 24.80952 70 13 70
## 22 70 24.80952 70 13 70
## 25 70 24.80952 70 13 70
## 26 70 24.80952 70 13 70
## 28 70 24.80952 70 13 70
## 30 70 24.80952 70 13 70
## 31 70 24.80952 70 13 70
## 32 70 24.80952 70 13 70
## 34 70 24.80952 70 13 70
## 35 70 24.80952 70 13 70
##
## [[7]]
## city state jobTitle
## 1 Oklahoma City OK Full Time Licensed Massage Therapist
## 2 Oklahoma City OK Massage Therapist - Independent Contractor
## 3 Oklahoma City OK Massage Therapist
## 4 Oklahoma City OK Massage Therapist
## 5 Oklahoma City OK Licensed Massage Therapist
## 6 Oklahoma City OK Massage Therapist
## 7 Oklahoma City OK Part Time Massage Therapist
## 8 Oklahoma City OK Massage Therapist - Stretch Technician
## 9 Oklahoma City OK Massage Therapist
## 10 Oklahoma City OK LifeSpa-Massage Therapist
## 11 Oklahoma City OK LifeSpa-Massage Therapist Apprentice
## 12 Oklahoma City OK Massage Therapist [FULL-TIME]
## 13 Oklahoma City OK Mobile Massage Therapist
## 14 Oklahoma City OK Massage Therapist [PART-TIME]
## 15 Oklahoma City OK Full Time Licensed Massage Therapist
## 16 Oklahoma City OK Massage Therapist - Independent Contractor
## 17 Oklahoma City OK Massage Therapist
## 18 Oklahoma City OK Massage Therapist
## 19 Oklahoma City OK Licensed Massage Therapist
## 20 Oklahoma City OK Massage Therapist
## 21 Oklahoma City OK Part Time Massage Therapist
## 22 Oklahoma City OK Massage Therapist - Stretch Technician
## 23 Oklahoma City OK Massage Therapist
## 24 Oklahoma City OK LifeSpa-Massage Therapist
## 25 Oklahoma City OK LifeSpa-Massage Therapist Apprentice
## 26 Oklahoma City OK Massage Therapist [FULL-TIME]
## 27 Oklahoma City OK Mobile Massage Therapist
## 28 Oklahoma City OK Massage Therapist [PART-TIME]
## 29 Oklahoma City OK Full Time Licensed Massage Therapist
## 30 Oklahoma City OK Massage Therapist - Independent Contractor
## 31 Oklahoma City OK Massage Therapist
## 32 Oklahoma City OK Massage Therapist
## 33 Oklahoma City OK Licensed Massage Therapist
## 34 Oklahoma City OK Massage Therapist
## 35 Oklahoma City OK Part Time Massage Therapist
## 36 Oklahoma City OK Massage Therapist - Stretch Technician
## 37 Oklahoma City OK Massage Therapist
## 38 Oklahoma City OK LifeSpa-Massage Therapist
## 39 Oklahoma City OK LifeSpa-Massage Therapist Apprentice
## 40 Oklahoma City OK Massage Therapist [FULL-TIME]
## 41 Oklahoma City OK Mobile Massage Therapist
## 42 Oklahoma City OK Massage Therapist [PART-TIME]
## 43 Oklahoma City OK Full Time Licensed Massage Therapist
## 44 Oklahoma City OK Massage Therapist - Independent Contractor
## 45 Oklahoma City OK Massage Therapist
## 46 Oklahoma City OK Massage Therapist
## 47 Oklahoma City OK Licensed Massage Therapist
## 48 Oklahoma City OK Massage Therapist
## 49 Oklahoma City OK Part Time Massage Therapist
## 50 Oklahoma City OK Massage Therapist - Stretch Technician
## 51 Oklahoma City OK Massage Therapist
## 52 Oklahoma City OK LifeSpa-Massage Therapist
## 53 Oklahoma City OK LifeSpa-Massage Therapist Apprentice
## 54 Oklahoma City OK Massage Therapist [FULL-TIME]
## 55 Oklahoma City OK Mobile Massage Therapist
## 56 Oklahoma City OK Massage Therapist [PART-TIME]
## 57 Oklahoma City OK Massage Therapist
## 58 Oklahoma City OK Part Time Massage Therapist
## 59 Oklahoma City OK Part Time Massage Therapist
## 60 Oklahoma City OK Massage Therapist - Stretch Technician
## 61 Oklahoma City OK Massage Therapist
## 62 Oklahoma City OK LifeSpa-Massage Therapist
## 63 Oklahoma City OK LifeSpa-Massage Therapist Apprentice
## 64 Oklahoma City OK Massage Therapist [FULL-TIME]
## 65 Oklahoma City OK Mobile Massage Therapist
## 66 Oklahoma City OK Massage Therapist [PART-TIME]
## 67 Oklahoma City OK Full Time Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 2 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 3 EXOS3.7Edmond, OK 20
## 4 Elements Massage3.6Edmond, OK 73013 30
## 5 Elements3.6Warr Acres, OK 73132 30
## 6 Massage Envy3.2Oklahoma City, OK 73134 4
## 7 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 8 Stretch U @ The Vitality MillYukon, OK 73099 12
## 9 Elements3.6Edmond, OK 73034 30
## 10 Life Time3.6Oklahoma City, OK 73134 30
## 11 Life Time3.6Oklahoma City, OK 73134 30
## 12 Massage Envy3.2Oklahoma City, OK 73170 30
## 13 Indo-Pak Massage TherapyNorman, OK 30
## 14 Massage Envy3.2Oklahoma City, OK 73170 30
## 15 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 16 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 17 EXOS3.7Edmond, OK 20
## 18 Elements Massage3.6Edmond, OK 73013 30
## 19 Elements3.6Warr Acres, OK 73132 30
## 20 Massage Envy3.2Oklahoma City, OK 73134 4
## 21 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 22 Stretch U @ The Vitality MillYukon, OK 73099 12
## 23 Elements3.6Edmond, OK 73034 30
## 24 Life Time3.6Oklahoma City, OK 73134 30
## 25 Life Time3.6Oklahoma City, OK 73134 30
## 26 Massage Envy3.2Oklahoma City, OK 73170 30
## 27 Indo-Pak Massage TherapyNorman, OK 30
## 28 Massage Envy3.2Oklahoma City, OK 73170 30
## 29 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 30 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 31 EXOS3.7Edmond, OK 20
## 32 Elements Massage3.6Edmond, OK 73013 30
## 33 Elements3.6Warr Acres, OK 73132 30
## 34 Massage Envy3.2Oklahoma City, OK 73134 4
## 35 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 36 Stretch U @ The Vitality MillYukon, OK 73099 12
## 37 Elements3.6Edmond, OK 73034 30
## 38 Life Time3.6Oklahoma City, OK 73134 30
## 39 Life Time3.6Oklahoma City, OK 73134 30
## 40 Massage Envy3.2Oklahoma City, OK 73170 30
## 41 Indo-Pak Massage TherapyNorman, OK 30
## 42 Massage Envy3.2Oklahoma City, OK 73170 30
## 43 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 44 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 45 EXOS3.7Edmond, OK 20
## 46 Elements Massage3.6Edmond, OK 73013 30
## 47 Elements3.6Warr Acres, OK 73132 30
## 48 Massage Envy3.2Oklahoma City, OK 73134 4
## 49 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 50 Stretch U @ The Vitality MillYukon, OK 73099 12
## 51 Elements3.6Edmond, OK 73034 30
## 52 Life Time3.6Oklahoma City, OK 73134 30
## 53 Life Time3.6Oklahoma City, OK 73134 30
## 54 Massage Envy3.2Oklahoma City, OK 73170 30
## 55 Indo-Pak Massage TherapyNorman, OK 30
## 56 Massage Envy3.2Oklahoma City, OK 73170 30
## 57 Elements Massage3.6Edmond, OK 73013 30
## 58 Brixton Chiropractic and AcupunctureNorman, OK 30
## 59 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 60 Stretch U @ The Vitality MillYukon, OK 73099 12
## 61 Elements3.6Edmond, OK 73034 30
## 62 Life Time3.6Oklahoma City, OK 73134 30
## 63 Life Time3.6Oklahoma City, OK 73134 30
## 64 Massage Envy3.2Oklahoma City, OK 73170 30
## 65 Indo-Pak Massage TherapyNorman, OK 30
## 66 Massage Envy3.2Oklahoma City, OK 73170 30
## 67 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 13 70 24000 42000
## 2 13 70 24000 42000
## 3 13 70 24000 42000
## 4 13 70 24000 42000
## 5 13 70 24000 42000
## 6 13 70 24000 42000
## 7 13 70 24000 42000
## 8 13 70 24000 42000
## 9 13 70 24000 42000
## 10 13 70 24000 42000
## 11 13 70 24000 42000
## 12 13 70 24000 42000
## 13 13 70 24000 42000
## 14 13 70 24000 42000
## 15 13 70 24000 42000
## 16 13 70 24000 42000
## 17 13 70 24000 42000
## 18 13 70 24000 42000
## 19 13 70 24000 42000
## 20 13 70 24000 42000
## 21 13 70 24000 42000
## 22 13 70 24000 42000
## 23 13 70 24000 42000
## 24 13 70 24000 42000
## 25 13 70 24000 42000
## 26 13 70 24000 42000
## 27 13 70 24000 42000
## 28 13 70 24000 42000
## 29 13 70 24000 42000
## 30 13 70 24000 42000
## 31 13 70 24000 42000
## 32 13 70 24000 42000
## 33 13 70 24000 42000
## 34 13 70 24000 42000
## 35 13 70 24000 42000
## 36 13 70 24000 42000
## 37 13 70 24000 42000
## 38 13 70 24000 42000
## 39 13 70 24000 42000
## 40 13 70 24000 42000
## 41 13 70 24000 42000
## 42 13 70 24000 42000
## 43 13 70 24000 42000
## 44 13 70 24000 42000
## 45 13 70 24000 42000
## 46 13 70 24000 42000
## 47 13 70 24000 42000
## 48 13 70 24000 42000
## 49 13 70 24000 42000
## 50 13 70 24000 42000
## 51 13 70 24000 42000
## 52 13 70 24000 42000
## 53 13 70 24000 42000
## 54 13 70 24000 42000
## 55 13 70 24000 42000
## 56 13 70 24000 42000
## 57 13 70 24000 42000
## 58 13 70 24000 42000
## 59 13 70 24000 42000
## 60 13 70 24000 42000
## 61 13 70 24000 42000
## 62 13 70 24000 42000
## 63 13 70 24000 42000
## 64 13 70 24000 42000
## 65 13 70 24000 42000
## 66 13 70 24000 42000
## 67 13 70 24000 42000
getIndeedJobData5pages('massage therapist', 'Tulsa','OK')
## Warning in getIndeedJobData5pages("massage therapist", "Tulsa", "OK"): NAs
## introduced by coercion
## Warning in max(annual$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Tulsa", "OK"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist / Stretch Tech
## 2 Massage Therapist - Independent Contractor
## 3 Physical Therapy Aide/Massage Therapist
## 4 Licensed Massage Therapist
## 5 Mobile Massage Therapist
## 6 Massage Therapist - Full Time
## 7 Salon Massage Therapist
## 8 Licensed Massage Therapist - Sign On Bonus Available
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist Full Time
## 11 Massage Therapist
## 12 Licensed Massage Therapist / Stretch Tech
## 13 Physical Therapy Aide/Massage Therapist
## 14 Massage Therapist - Independent Contractor
## 15 Licensed Massage Therapist
## 16 Mobile Massage Therapist
## 17 Massage Therapist - Full Time
## 18 Salon Massage Therapist
## 19 Licensed Massage Therapist - Sign On Bonus Available
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist Full Time
## 22 Massage Therapist
## 23 Licensed Massage Therapist / Stretch Tech
## 24 Physical Therapy Aide/Massage Therapist
## 25 Massage Therapist - Independent Contractor
## 26 Licensed Massage Therapist
## 27 Mobile Massage Therapist
## 28 Massage Therapist - Full Time
## 29 Salon Massage Therapist
## 30 Licensed Massage Therapist - Sign On Bonus Available
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist Full Time
## 33 Massage Therapist
## 34 Licensed Massage Therapist / Stretch Tech
## 35 Physical Therapy Aide/Massage Therapist
## 36 Massage Therapist - Independent Contractor
## 37 Licensed Massage Therapist
## 38 Mobile Massage Therapist
## 39 Massage Therapist - Full Time
## 40 Salon Massage Therapist
## 41 Licensed Massage Therapist - Sign On Bonus Available
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist Full Time
## 44 Massage Therapist
## 45 Licensed Massage Therapist - Sign On Bonus Available
## 46 Massage Therapist - Independent Contractor
## 47 Licensed Massage Therapist
## 48 Mobile Massage Therapist
## 49 Massage Therapist - Full Time
## 50 Salon Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist Full Time
## 53 Massage Therapist
## 54 Physical Therapy Aide/Massage Therapist
## 55 Licensed Massage Therapist / Stretch Tech
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$13 - $15 an hour $13 - $15 13 15
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$24 - $30 an hour $24 - $30 24 30
## 4 \n$45 - $70 an hour $45 - $70 45 70
## 5 \nUp to $45,000 a year $45000 45000 NA
## 6 \n$13 - $15 an hour $13 - $15 13 15
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$24 - $30 an hour $24 - $30 24 30
## 9 \n$45 - $70 an hour $45 - $70 45 70
## 10 \nUp to $45,000 a year $45000 45000 NA
## 11 \n$13 - $15 an hour $13 - $15 13 15
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$24 - $30 an hour $24 - $30 24 30
## 14 \n$45 - $70 an hour $45 - $70 45 70
## 15 \nUp to $45,000 a year $45000 45000 NA
## 16 \n$13 - $15 an hour $13 - $15 13 15
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$24 - $30 an hour $24 - $30 24 30
## 19 \n$45 - $70 an hour $45 - $70 45 70
## 20 \nUp to $45,000 a year $45000 45000 NA
## 21 \nUp to $45,000 a year $45000 45000 NA
## 22 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 23 \n$24 - $30 an hour $24 - $30 24 30
## 24 \n$45 - $70 an hour $45 - $70 45 70
## 25 \n$13 - $15 an hour $13 - $15 13 15
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 45 10016.4 6910.778 13
## 2 45 45 10016.4 6910.778 13
## 3 45 45 10016.4 6910.778 13
## 4 45 45 10016.4 6910.778 13
## 5 45 45 10016.4 6910.778 13
## 6 45 45 10016.4 6910.778 13
## 7 45 45 10016.4 6910.778 13
## 8 45 45 10016.4 6910.778 13
## 9 45 45 10016.4 6910.778 13
## 10 45 45 10016.4 6910.778 13
## 11 45 45 10016.4 6910.778 13
## 12 45 45 10016.4 6910.778 13
## 13 45 45 10016.4 6910.778 13
## 14 45 45 10016.4 6910.778 13
## 15 45 45 10016.4 6910.778 13
## 16 45 45 10016.4 6910.778 13
## 17 45 45 10016.4 6910.778 13
## 18 45 45 10016.4 6910.778 13
## 19 45 45 10016.4 6910.778 13
## 20 45 45 10016.4 6910.778 13
## 21 45 45 10016.4 6910.778 13
## 22 45 45 10016.4 6910.778 13
## 23 45 45 10016.4 6910.778 13
## 24 45 45 10016.4 6910.778 13
## 25 45 45 10016.4 6910.778 13
## maximumMaxSalary
## 1 45000
## 2 45000
## 3 45000
## 4 45000
## 5 45000
## 6 45000
## 7 45000
## 8 45000
## 9 45000
## 10 45000
## 11 45000
## 12 45000
## 13 45000
## 14 45000
## 15 45000
## 16 45000
## 17 45000
## 18 45000
## 19 45000
## 20 45000
## 21 45000
## 22 45000
## 23 45000
## 24 45000
## 25 45000
##
## [[3]]
## date_daysAgo
## 1 8
## 2 5
## 3 5
## 4 30
## 5 30
## 6 30
## 7 30
## 8 30
## 9 30
## 10 30
## 11 30
## 12 8
## 13 5
## 14 5
## 15 30
## 16 30
## 17 30
## 18 30
## 19 30
## 20 30
## 21 30
## 22 30
## 23 8
## 24 5
## 25 5
## 26 30
## 27 30
## 28 30
## 29 30
## 30 30
## 31 30
## 32 30
## 33 30
## 34 8
## 35 5
## 36 5
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 5
## 47 30
## 48 30
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 5
## 55 8
##
## [[4]]
## HiringAgency
## 1 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 2 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 3 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 4 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 5 Indo-Pak Massage TherapyTulsa, OK
## 6 Life Time3.6Tulsa, OK 74133
## 7 JCPenney3.7Owasso, OK 74055
## 8 Massage Envy TulsaTulsa, OK
## 9 Hand and Stone3.0Tulsa, OK 74132
## 10 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 11 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 12 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 13 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 14 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 15 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 16 Indo-Pak Massage TherapyTulsa, OK
## 17 Life Time3.6Tulsa, OK 74133
## 18 JCPenney3.7Owasso, OK 74055
## 19 Massage Envy TulsaTulsa, OK
## 20 Hand and Stone3.0Tulsa, OK 74132
## 21 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 22 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 23 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 24 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 25 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 26 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 27 Indo-Pak Massage TherapyTulsa, OK
## 28 Life Time3.6Tulsa, OK 74133
## 29 JCPenney3.7Owasso, OK 74055
## 30 Massage Envy TulsaTulsa, OK
## 31 Hand and Stone3.0Tulsa, OK 74132
## 32 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 33 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 34 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 35 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 36 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 37 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 38 Indo-Pak Massage TherapyTulsa, OK
## 39 Life Time3.6Tulsa, OK 74133
## 40 JCPenney3.7Owasso, OK 74055
## 41 Massage Envy TulsaTulsa, OK
## 42 Hand and Stone3.0Tulsa, OK 74132
## 43 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 44 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 45 Massage Envy TulsaTulsa, OK
## 46 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 47 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 48 Indo-Pak Massage TherapyTulsa, OK
## 49 Life Time3.6Tulsa, OK 74133
## 50 JCPenney3.7Owasso, OK 74055
## 51 Hand and Stone3.0Tulsa, OK 74132
## 52 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 53 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 54 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 55 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
##
## [[5]]
## Salary salary minSalary maxSalary medianMinSalary
## 5 \nUp to $45,000 a year $45000 45000 NA 45000
## 10 \nUp to $45,000 a year $45000 45000 NA 45000
## 15 \nUp to $45,000 a year $45000 45000 NA 45000
## 20 \nUp to $45,000 a year $45000 45000 NA 45000
## 21 \nUp to $45,000 a year $45000 45000 NA 45000
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 5 NA 45000 NaN 45000 -Inf
## 10 NA 45000 NaN 45000 -Inf
## 15 NA 45000 NaN 45000 -Inf
## 20 NA 45000 NaN 45000 -Inf
## 21 NA 45000 NaN 45000 -Inf
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$13 - $15 an hour $13 - $15 13 15 24
## 3 \n$24 - $30 an hour $24 - $30 24 30 24
## 4 \n$45 - $70 an hour $45 - $70 45 70 24
## 6 \n$13 - $15 an hour $13 - $15 13 15 24
## 8 \n$24 - $30 an hour $24 - $30 24 30 24
## 9 \n$45 - $70 an hour $45 - $70 45 70 24
## 11 \n$13 - $15 an hour $13 - $15 13 15 24
## 13 \n$24 - $30 an hour $24 - $30 24 30 24
## 14 \n$45 - $70 an hour $45 - $70 45 70 24
## 16 \n$13 - $15 an hour $13 - $15 13 15 24
## 18 \n$24 - $30 an hour $24 - $30 24 30 24
## 19 \n$45 - $70 an hour $45 - $70 45 70 24
## 23 \n$24 - $30 an hour $24 - $30 24 30 24
## 24 \n$45 - $70 an hour $45 - $70 45 70 24
## 25 \n$13 - $15 an hour $13 - $15 13 15 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 27.33333 38.33333 13 70
## 3 30 27.33333 38.33333 13 70
## 4 30 27.33333 38.33333 13 70
## 6 30 27.33333 38.33333 13 70
## 8 30 27.33333 38.33333 13 70
## 9 30 27.33333 38.33333 13 70
## 11 30 27.33333 38.33333 13 70
## 13 30 27.33333 38.33333 13 70
## 14 30 27.33333 38.33333 13 70
## 16 30 27.33333 38.33333 13 70
## 18 30 27.33333 38.33333 13 70
## 19 30 27.33333 38.33333 13 70
## 23 30 27.33333 38.33333 13 70
## 24 30 27.33333 38.33333 13 70
## 25 30 27.33333 38.33333 13 70
##
## [[7]]
## city state jobTitle
## 1 Tulsa OK Licensed Massage Therapist / Stretch Tech
## 2 Tulsa OK Massage Therapist - Independent Contractor
## 3 Tulsa OK Physical Therapy Aide/Massage Therapist
## 4 Tulsa OK Licensed Massage Therapist
## 5 Tulsa OK Mobile Massage Therapist
## 6 Tulsa OK Massage Therapist - Full Time
## 7 Tulsa OK Salon Massage Therapist
## 8 Tulsa OK Licensed Massage Therapist - Sign On Bonus Available
## 9 Tulsa OK Licensed Massage Therapist
## 10 Tulsa OK Licensed Massage Therapist Full Time
## 11 Tulsa OK Massage Therapist
## 12 Tulsa OK Licensed Massage Therapist / Stretch Tech
## 13 Tulsa OK Physical Therapy Aide/Massage Therapist
## 14 Tulsa OK Massage Therapist - Independent Contractor
## 15 Tulsa OK Licensed Massage Therapist
## 16 Tulsa OK Mobile Massage Therapist
## 17 Tulsa OK Massage Therapist - Full Time
## 18 Tulsa OK Salon Massage Therapist
## 19 Tulsa OK Licensed Massage Therapist - Sign On Bonus Available
## 20 Tulsa OK Licensed Massage Therapist
## 21 Tulsa OK Licensed Massage Therapist Full Time
## 22 Tulsa OK Massage Therapist
## 23 Tulsa OK Licensed Massage Therapist / Stretch Tech
## 24 Tulsa OK Physical Therapy Aide/Massage Therapist
## 25 Tulsa OK Massage Therapist - Independent Contractor
## 26 Tulsa OK Licensed Massage Therapist
## 27 Tulsa OK Mobile Massage Therapist
## 28 Tulsa OK Massage Therapist - Full Time
## 29 Tulsa OK Salon Massage Therapist
## 30 Tulsa OK Licensed Massage Therapist - Sign On Bonus Available
## 31 Tulsa OK Licensed Massage Therapist
## 32 Tulsa OK Licensed Massage Therapist Full Time
## 33 Tulsa OK Massage Therapist
## 34 Tulsa OK Licensed Massage Therapist / Stretch Tech
## 35 Tulsa OK Physical Therapy Aide/Massage Therapist
## 36 Tulsa OK Massage Therapist - Independent Contractor
## 37 Tulsa OK Licensed Massage Therapist
## 38 Tulsa OK Mobile Massage Therapist
## 39 Tulsa OK Massage Therapist - Full Time
## 40 Tulsa OK Salon Massage Therapist
## 41 Tulsa OK Licensed Massage Therapist - Sign On Bonus Available
## 42 Tulsa OK Licensed Massage Therapist
## 43 Tulsa OK Licensed Massage Therapist Full Time
## 44 Tulsa OK Massage Therapist
## 45 Tulsa OK Licensed Massage Therapist - Sign On Bonus Available
## 46 Tulsa OK Massage Therapist - Independent Contractor
## 47 Tulsa OK Licensed Massage Therapist
## 48 Tulsa OK Mobile Massage Therapist
## 49 Tulsa OK Massage Therapist - Full Time
## 50 Tulsa OK Salon Massage Therapist
## 51 Tulsa OK Licensed Massage Therapist
## 52 Tulsa OK Licensed Massage Therapist Full Time
## 53 Tulsa OK Massage Therapist
## 54 Tulsa OK Physical Therapy Aide/Massage Therapist
## 55 Tulsa OK Licensed Massage Therapist / Stretch Tech
## HiringAgency
## 1 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 2 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 3 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 4 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 5 Indo-Pak Massage TherapyTulsa, OK
## 6 Life Time3.6Tulsa, OK 74133
## 7 JCPenney3.7Owasso, OK 74055
## 8 Massage Envy TulsaTulsa, OK
## 9 Hand and Stone3.0Tulsa, OK 74132
## 10 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 11 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 12 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 13 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 14 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 15 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 16 Indo-Pak Massage TherapyTulsa, OK
## 17 Life Time3.6Tulsa, OK 74133
## 18 JCPenney3.7Owasso, OK 74055
## 19 Massage Envy TulsaTulsa, OK
## 20 Hand and Stone3.0Tulsa, OK 74132
## 21 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 22 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 23 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 24 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 25 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 26 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 27 Indo-Pak Massage TherapyTulsa, OK
## 28 Life Time3.6Tulsa, OK 74133
## 29 JCPenney3.7Owasso, OK 74055
## 30 Massage Envy TulsaTulsa, OK
## 31 Hand and Stone3.0Tulsa, OK 74132
## 32 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 33 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 34 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## 35 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 36 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 37 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 38 Indo-Pak Massage TherapyTulsa, OK
## 39 Life Time3.6Tulsa, OK 74133
## 40 JCPenney3.7Owasso, OK 74055
## 41 Massage Envy TulsaTulsa, OK
## 42 Hand and Stone3.0Tulsa, OK 74132
## 43 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 44 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 45 Massage Envy TulsaTulsa, OK
## 46 Indo-Pak Massage TherapyTulsa, OK•Remote work available
## 47 Active Life Chiropractic4.5Broken Arrow, OK 74014
## 48 Indo-Pak Massage TherapyTulsa, OK
## 49 Life Time3.6Tulsa, OK 74133
## 50 JCPenney3.7Owasso, OK 74055
## 51 Hand and Stone3.0Tulsa, OK 74132
## 52 Massage Envy3.2Tulsa, OK 74105 (Brookside area)+2 locations
## 53 Massage Envy3.2Tulsa, OK 74133 (Ridge Point area)
## 54 Physical Therapy Specialist of TulsaTulsa, OK (South Towne Square area)
## 55 R3 Stretch www.r3stretch.com Facebook R3StretchTulsa, OK
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 8 13 70 45000 45000
## 2 5 13 70 45000 45000
## 3 5 13 70 45000 45000
## 4 30 13 70 45000 45000
## 5 30 13 70 45000 45000
## 6 30 13 70 45000 45000
## 7 30 13 70 45000 45000
## 8 30 13 70 45000 45000
## 9 30 13 70 45000 45000
## 10 30 13 70 45000 45000
## 11 30 13 70 45000 45000
## 12 8 13 70 45000 45000
## 13 5 13 70 45000 45000
## 14 5 13 70 45000 45000
## 15 30 13 70 45000 45000
## 16 30 13 70 45000 45000
## 17 30 13 70 45000 45000
## 18 30 13 70 45000 45000
## 19 30 13 70 45000 45000
## 20 30 13 70 45000 45000
## 21 30 13 70 45000 45000
## 22 30 13 70 45000 45000
## 23 8 13 70 45000 45000
## 24 5 13 70 45000 45000
## 25 5 13 70 45000 45000
## 26 30 13 70 45000 45000
## 27 30 13 70 45000 45000
## 28 30 13 70 45000 45000
## 29 30 13 70 45000 45000
## 30 30 13 70 45000 45000
## 31 30 13 70 45000 45000
## 32 30 13 70 45000 45000
## 33 30 13 70 45000 45000
## 34 8 13 70 45000 45000
## 35 5 13 70 45000 45000
## 36 5 13 70 45000 45000
## 37 30 13 70 45000 45000
## 38 30 13 70 45000 45000
## 39 30 13 70 45000 45000
## 40 30 13 70 45000 45000
## 41 30 13 70 45000 45000
## 42 30 13 70 45000 45000
## 43 30 13 70 45000 45000
## 44 30 13 70 45000 45000
## 45 30 13 70 45000 45000
## 46 5 13 70 45000 45000
## 47 30 13 70 45000 45000
## 48 30 13 70 45000 45000
## 49 30 13 70 45000 45000
## 50 30 13 70 45000 45000
## 51 30 13 70 45000 45000
## 52 30 13 70 45000 45000
## 53 30 13 70 45000 45000
## 54 5 13 70 45000 45000
## 55 8 13 70 45000 45000
getIndeedJobData5pages('massage therapist', 'Norman','OK')
## Warning in getIndeedJobData5pages("massage therapist", "Norman", "OK"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Norman", "OK"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Part Time Massage Therapist
## 2 Full Time Licensed Massage Therapist
## 3 Massage Therapist - Independent Contractor
## 4 Mobile Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Part Time Massage Therapist
## 8 Massage Therapist [FULL-TIME]
## 9 Massage Therapist [PART-TIME]
## 10 Full Time Licensed Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Mobile Massage Therapist
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Part Time Massage Therapist
## 16 Massage Therapist [FULL-TIME]
## 17 Massage Therapist [PART-TIME]
## 18 Part Time Massage Therapist
## 19 Massage Therapist - Independent Contractor
## 20 Mobile Massage Therapist
## 21 Full Time Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 Part Time Massage Therapist
## 25 Massage Therapist [FULL-TIME]
## 26 Massage Therapist [PART-TIME]
## 27 Massage Therapist - Independent Contractor
## 28 Mobile Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Part Time Massage Therapist
## 32 Massage Therapist [FULL-TIME]
## 33 Massage Therapist [PART-TIME]
## 34 Full Time Licensed Massage Therapist
## 35 Part Time Massage Therapist
## 36 Massage Therapist - Independent Contractor
## 37 Mobile Massage Therapist
## 38 Full Time Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Part Time Massage Therapist
## 42 Massage Therapist [FULL-TIME]
## 43 Massage Therapist [PART-TIME]
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$21 an hour $21 21 NA
## 2 \n$21 an hour $21 21 NA
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$45 - $70 an hour $45 - $70 45 70
## 5 \n$21 an hour $21 21 NA
## 6 \n$21 an hour $21 21 NA
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$45 - $70 an hour $45 - $70 45 70
## 9 \n$21 an hour $21 21 NA
## 10 \n$21 an hour $21 21 NA
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$45 - $70 an hour $45 - $70 45 70
## 13 \n$21 an hour $21 21 NA
## 14 \n$21 an hour $21 21 NA
## 15 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 16 \n$45 - $70 an hour $45 - $70 45 70
## 17 \n$21 an hour $21 21 NA
## 18 \n$21 an hour $21 21 NA
## 19 \n$21 an hour $21 21 NA
## 20 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 21 \n$45 - $70 an hour $45 - $70 45 70
## 22 \n$21 an hour $21 21 NA
## 23 \n$21 an hour $21 21 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 21 45 1108.609 2601.455 21
## 2 21 45 1108.609 2601.455 21
## 3 21 45 1108.609 2601.455 21
## 4 21 45 1108.609 2601.455 21
## 5 21 45 1108.609 2601.455 21
## 6 21 45 1108.609 2601.455 21
## 7 21 45 1108.609 2601.455 21
## 8 21 45 1108.609 2601.455 21
## 9 21 45 1108.609 2601.455 21
## 10 21 45 1108.609 2601.455 21
## 11 21 45 1108.609 2601.455 21
## 12 21 45 1108.609 2601.455 21
## 13 21 45 1108.609 2601.455 21
## 14 21 45 1108.609 2601.455 21
## 15 21 45 1108.609 2601.455 21
## 16 21 45 1108.609 2601.455 21
## 17 21 45 1108.609 2601.455 21
## 18 21 45 1108.609 2601.455 21
## 19 21 45 1108.609 2601.455 21
## 20 21 45 1108.609 2601.455 21
## 21 21 45 1108.609 2601.455 21
## 22 21 45 1108.609 2601.455 21
## 23 21 45 1108.609 2601.455 21
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 5
## 4 30
## 5 30
## 6 4
## 7 30
## 8 30
## 9 30
## 10 30
## 11 5
## 12 30
## 13 30
## 14 4
## 15 30
## 16 30
## 17 30
## 18 30
## 19 5
## 20 30
## 21 30
## 22 30
## 23 4
## 24 30
## 25 30
## 26 30
## 27 5
## 28 30
## 29 30
## 30 4
## 31 30
## 32 30
## 33 30
## 34 30
## 35 30
## 36 5
## 37 30
## 38 30
## 39 30
## 40 4
## 41 30
## 42 30
## 43 30
##
## [[4]]
## HiringAgency
## 1 Brixton Chiropractic and AcupunctureNorman, OK
## 2 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 3 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 4 Indo-Pak Massage TherapyNorman, OK
## 5 Elements3.6Warr Acres, OK 73132
## 6 Massage Envy3.2Oklahoma City, OK 73170
## 7 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 8 Massage Envy3.2Oklahoma City, OK 73170
## 9 Massage Envy3.2Oklahoma City, OK 73170
## 10 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 11 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 12 Indo-Pak Massage TherapyNorman, OK
## 13 Elements3.6Warr Acres, OK 73132
## 14 Massage Envy3.2Oklahoma City, OK 73170
## 15 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 16 Massage Envy3.2Oklahoma City, OK 73170
## 17 Massage Envy3.2Oklahoma City, OK 73170
## 18 Brixton Chiropractic and AcupunctureNorman, OK
## 19 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 20 Indo-Pak Massage TherapyNorman, OK
## 21 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 22 Elements3.6Warr Acres, OK 73132
## 23 Massage Envy3.2Oklahoma City, OK 73170
## 24 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 25 Massage Envy3.2Oklahoma City, OK 73170
## 26 Massage Envy3.2Oklahoma City, OK 73170
## 27 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 28 Indo-Pak Massage TherapyNorman, OK
## 29 Elements3.6Warr Acres, OK 73132
## 30 Massage Envy3.2Oklahoma City, OK 73170
## 31 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 32 Massage Envy3.2Oklahoma City, OK 73170
## 33 Massage Envy3.2Oklahoma City, OK 73170
## 34 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 35 Brixton Chiropractic and AcupunctureNorman, OK
## 36 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available
## 37 Indo-Pak Massage TherapyNorman, OK
## 38 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 39 Elements3.6Warr Acres, OK 73132
## 40 Massage Envy3.2Oklahoma City, OK 73170
## 41 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132
## 42 Massage Envy3.2Oklahoma City, OK 73170
## 43 Massage Envy3.2Oklahoma City, OK 73170
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$21 an hour $21 21 NA 21
## 2 \n$21 an hour $21 21 NA 21
## 4 \n$45 - $70 an hour $45 - $70 45 70 21
## 5 \n$21 an hour $21 21 NA 21
## 6 \n$21 an hour $21 21 NA 21
## 8 \n$45 - $70 an hour $45 - $70 45 70 21
## 9 \n$21 an hour $21 21 NA 21
## 10 \n$21 an hour $21 21 NA 21
## 12 \n$45 - $70 an hour $45 - $70 45 70 21
## 13 \n$21 an hour $21 21 NA 21
## 14 \n$21 an hour $21 21 NA 21
## 16 \n$45 - $70 an hour $45 - $70 45 70 21
## 17 \n$21 an hour $21 21 NA 21
## 18 \n$21 an hour $21 21 NA 21
## 19 \n$21 an hour $21 21 NA 21
## 21 \n$45 - $70 an hour $45 - $70 45 70 21
## 22 \n$21 an hour $21 21 NA 21
## 23 \n$21 an hour $21 21 NA 21
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 70 27.66667 70 21 70
## 2 70 27.66667 70 21 70
## 4 70 27.66667 70 21 70
## 5 70 27.66667 70 21 70
## 6 70 27.66667 70 21 70
## 8 70 27.66667 70 21 70
## 9 70 27.66667 70 21 70
## 10 70 27.66667 70 21 70
## 12 70 27.66667 70 21 70
## 13 70 27.66667 70 21 70
## 14 70 27.66667 70 21 70
## 16 70 27.66667 70 21 70
## 17 70 27.66667 70 21 70
## 18 70 27.66667 70 21 70
## 19 70 27.66667 70 21 70
## 21 70 27.66667 70 21 70
## 22 70 27.66667 70 21 70
## 23 70 27.66667 70 21 70
##
## [[7]]
## city state jobTitle
## 1 Norman OK Part Time Massage Therapist
## 2 Norman OK Full Time Licensed Massage Therapist
## 3 Norman OK Massage Therapist - Independent Contractor
## 4 Norman OK Mobile Massage Therapist
## 5 Norman OK Licensed Massage Therapist
## 6 Norman OK Massage Therapist
## 7 Norman OK Part Time Massage Therapist
## 8 Norman OK Massage Therapist [FULL-TIME]
## 9 Norman OK Massage Therapist [PART-TIME]
## 10 Norman OK Full Time Licensed Massage Therapist
## 11 Norman OK Massage Therapist - Independent Contractor
## 12 Norman OK Mobile Massage Therapist
## 13 Norman OK Licensed Massage Therapist
## 14 Norman OK Massage Therapist
## 15 Norman OK Part Time Massage Therapist
## 16 Norman OK Massage Therapist [FULL-TIME]
## 17 Norman OK Massage Therapist [PART-TIME]
## 18 Norman OK Part Time Massage Therapist
## 19 Norman OK Massage Therapist - Independent Contractor
## 20 Norman OK Mobile Massage Therapist
## 21 Norman OK Full Time Licensed Massage Therapist
## 22 Norman OK Licensed Massage Therapist
## 23 Norman OK Massage Therapist
## 24 Norman OK Part Time Massage Therapist
## 25 Norman OK Massage Therapist [FULL-TIME]
## 26 Norman OK Massage Therapist [PART-TIME]
## 27 Norman OK Massage Therapist - Independent Contractor
## 28 Norman OK Mobile Massage Therapist
## 29 Norman OK Licensed Massage Therapist
## 30 Norman OK Massage Therapist
## 31 Norman OK Part Time Massage Therapist
## 32 Norman OK Massage Therapist [FULL-TIME]
## 33 Norman OK Massage Therapist [PART-TIME]
## 34 Norman OK Full Time Licensed Massage Therapist
## 35 Norman OK Part Time Massage Therapist
## 36 Norman OK Massage Therapist - Independent Contractor
## 37 Norman OK Mobile Massage Therapist
## 38 Norman OK Full Time Licensed Massage Therapist
## 39 Norman OK Licensed Massage Therapist
## 40 Norman OK Massage Therapist
## 41 Norman OK Part Time Massage Therapist
## 42 Norman OK Massage Therapist [FULL-TIME]
## 43 Norman OK Massage Therapist [PART-TIME]
## HiringAgency date_daysAgo
## 1 Brixton Chiropractic and AcupunctureNorman, OK 30
## 2 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 3 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 4 Indo-Pak Massage TherapyNorman, OK 30
## 5 Elements3.6Warr Acres, OK 73132 30
## 6 Massage Envy3.2Oklahoma City, OK 73170 4
## 7 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 8 Massage Envy3.2Oklahoma City, OK 73170 30
## 9 Massage Envy3.2Oklahoma City, OK 73170 30
## 10 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 11 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 12 Indo-Pak Massage TherapyNorman, OK 30
## 13 Elements3.6Warr Acres, OK 73132 30
## 14 Massage Envy3.2Oklahoma City, OK 73170 4
## 15 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 16 Massage Envy3.2Oklahoma City, OK 73170 30
## 17 Massage Envy3.2Oklahoma City, OK 73170 30
## 18 Brixton Chiropractic and AcupunctureNorman, OK 30
## 19 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 20 Indo-Pak Massage TherapyNorman, OK 30
## 21 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 22 Elements3.6Warr Acres, OK 73132 30
## 23 Massage Envy3.2Oklahoma City, OK 73170 4
## 24 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 25 Massage Envy3.2Oklahoma City, OK 73170 30
## 26 Massage Envy3.2Oklahoma City, OK 73170 30
## 27 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 28 Indo-Pak Massage TherapyNorman, OK 30
## 29 Elements3.6Warr Acres, OK 73132 30
## 30 Massage Envy3.2Oklahoma City, OK 73170 4
## 31 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 32 Massage Envy3.2Oklahoma City, OK 73170 30
## 33 Massage Envy3.2Oklahoma City, OK 73170 30
## 34 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 35 Brixton Chiropractic and AcupunctureNorman, OK 30
## 36 Indo-Pak Massage TherapyOklahoma City, OK•Remote work available 5
## 37 Indo-Pak Massage TherapyNorman, OK 30
## 38 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 39 Elements3.6Warr Acres, OK 73132 30
## 40 Massage Envy3.2Oklahoma City, OK 73170 4
## 41 Brixton Chiropractic and AcupunctureOklahoma City, OK 73132 30
## 42 Massage Envy3.2Oklahoma City, OK 73170 30
## 43 Massage Envy3.2Oklahoma City, OK 73170 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 21 70 NA NA
## 2 21 70 NA NA
## 3 21 70 NA NA
## 4 21 70 NA NA
## 5 21 70 NA NA
## 6 21 70 NA NA
## 7 21 70 NA NA
## 8 21 70 NA NA
## 9 21 70 NA NA
## 10 21 70 NA NA
## 11 21 70 NA NA
## 12 21 70 NA NA
## 13 21 70 NA NA
## 14 21 70 NA NA
## 15 21 70 NA NA
## 16 21 70 NA NA
## 17 21 70 NA NA
## 18 21 70 NA NA
## 19 21 70 NA NA
## 20 21 70 NA NA
## 21 21 70 NA NA
## 22 21 70 NA NA
## 23 21 70 NA NA
## 24 21 70 NA NA
## 25 21 70 NA NA
## 26 21 70 NA NA
## 27 21 70 NA NA
## 28 21 70 NA NA
## 29 21 70 NA NA
## 30 21 70 NA NA
## 31 21 70 NA NA
## 32 21 70 NA NA
## 33 21 70 NA NA
## 34 21 70 NA NA
## 35 21 70 NA NA
## 36 21 70 NA NA
## 37 21 70 NA NA
## 38 21 70 NA NA
## 39 21 70 NA NA
## 40 21 70 NA NA
## 41 21 70 NA NA
## 42 21 70 NA NA
## 43 21 70 NA NA
Oregon Portland, Salem, Eugene
getIndeedJobData5pages('massage therapist', 'Portland','OR')
## Warning in getIndeedJobData5pages("massage therapist", "Portland", "OR"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Portland", "OR"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Portland", "OR"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist / LMT (1YR EXP REQ)
## 2 Licenced Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Massage therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 12 LMT Part-time/Full-time
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 LMT Part-time/Full-time
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist, LMT
## 24 Lead Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapists - Pearl District - Portland, OR
## 27 Licensed Massage Therapists
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Part time LMT
## 31 LMT Part-time/Full-time
## 32 Stretch Service Provider / Personal Trainer
## 33 Massage Therapist
## 34 Naturopathic Physician, acupuncturist, massage therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Licensed Massage Therapist
## 40 Part-time Licensed Massage Therapist for Holistic Clinic
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist FT or PT
## 43 Licensed Massage Therapist (LMT)-Hillsboro
## 44 Licensed Massage Therapist ME TeamLaszlo
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist (LMT)
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapist with health/dental insurance
## 51 Licensed Massage Therapist
## 52 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 53 Licensed Massage Therapist
## 54 Immediate Opening, LMT for Wilsonville Chiropractic Clinic $...
## 55 Total Body Stretch Service Provider
## 56 WA State Licensed Massage Therapist
## 57 Licensed Massage Therapist (LMT)
## 58 Massage Therapist retirement plan with match and health/dent...
## 59 Massage Therapist West Vancouver
## 60 Licensed Massage Therapist ME TeamLaszlo
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist (LMT)
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist with health/dental insurance
## 67 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 68 Total Body Stretch Service Provider
## 69 WA State Licensed Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage therapist
## 72 Licensed Massage Therapist (LMT)
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist (LMT)
## 76 Licenced Massage Therapist
## 77 Licensed Massage Therapist
## 78 Licensed Massage Therapist / LMT (1YR EXP REQ)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$14 - $45 an hour $14 - $45 14 45.00
## 2 \n$20 - $35 an hour $20 - $35 20 35.00
## 3 \n$34 - $35 an hour $34 - $35 34 35.00
## 4 \n$30 - $40 an hour $30 - $40 30 40.00
## 5 \n$20 - $52 an hour $20 - $52 20 52.00
## 6 \n$35 - $40 an hour $35 - $40 35 40.00
## 7 \n$24 - $32 an hour $24 - $32 24 32.00
## 8 \n$30 - $60 an hour $30 - $60 30 60.00
## 9 \n$28 - $32 an hour $28 - $32 28 32.00
## 10 \n$18 - $40 an hour $18 - $40 18 40.00
## 11 \n$50 - $100 an hour $50 - $100 50 100.00
## 12 \n$45 - $55 an hour $45 - $55 45 55.00
## 13 \n$30 - $35 an hour $30 - $35 30 35.00
## 14 \n$50 - $100 an hour $50 - $100 50 100.00
## 15 \n$29 - $44 an hour $29 - $44 29 44.00
## 16 \n$33 - $40 an hour $33 - $40 33 40.00
## 17 \n$30 - $40 an hour $30 - $40 30 40.00
## 18 \n$45 - $55 an hour $45 - $55 45 55.00
## 19 \n$35 - $40 an hour $35 - $40 35 40.00
## 20 \n$15 - $40 an hour $15 - $40 15 40.00
## 21 \n$50 - $59 an hour $50 - $59 50 59.00
## 22 \n$20.00 - $28.61 an hour $20.00 - $28.61 20 28.61
## 23 \n$62,000 a year $62000 62000 NA
## 24 \n$25 - $50 an hour $25 - $50 25 50.00
## 25 \n$32 - $35 an hour $32 - $35 32 35.00
## 26 \n$50 - $100 an hour $50 - $100 50 100.00
## 27 \n$45 - $55 an hour $45 - $55 45 55.00
## 28 \n$25 - $50 an hour $25 - $50 25 50.00
## 29 \n$15 - $40 an hour $15 - $40 15 40.00
## 30 \n$35 - $40 an hour $35 - $40 35 40.00
## 31 \n$28 - $30 an hour $28 - $30 28 30.00
## 32 \n$32 - $38 an hour $32 - $38 32 38.00
## 33 \n$36,000 - $60,000 a year $36000 - $60000 36000 60000.00
## 34 \n$28 - $35 an hour $28 - $35 28 35.00
## 35 \nFrom $30 an hour $30 30 NA
## 36 \n$30 - $40 an hour $30 - $40 30 40.00
## 37 \n$30 - $40 an hour $30 - $40 30 40.00
## 38 \n$25 - $35 an hour $25 - $35 25 35.00
## 39 \n$35 - $40 an hour $35 - $40 35 40.00
## 40 \n$28 - $35 an hour $28 - $35 28 35.00
## 41 \n$25 - $50 an hour $25 - $50 25 50.00
## 42 \nFrom $30 an hour $30 30 NA
## 43 \n$25 - $35 an hour $25 - $35 25 35.00
## 44 \n$24 - $32 an hour $24 - $32 24 32.00
## 45 \n$35 - $40 an hour $35 - $40 35 40.00
## 46 \n$30 - $40 an hour $30 - $40 30 40.00
## 47 \n$20 - $52 an hour $20 - $52 20 52.00
## 48 \nUp to $30 an hour ++ $30 30 NA
## 49 \n$20 - $35 an hour $20 - $35 20 35.00
## 50 \n$34 - $35 an hour $34 - $35 34 35.00
## 51 \n$14 - $45 an hour $14 - $45 14 45.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 35 1950.294 1648.363 14
## 2 30 35 1950.294 1648.363 14
## 3 30 35 1950.294 1648.363 14
## 4 30 35 1950.294 1648.363 14
## 5 30 35 1950.294 1648.363 14
## 6 30 35 1950.294 1648.363 14
## 7 30 35 1950.294 1648.363 14
## 8 30 35 1950.294 1648.363 14
## 9 30 35 1950.294 1648.363 14
## 10 30 35 1950.294 1648.363 14
## 11 30 35 1950.294 1648.363 14
## 12 30 35 1950.294 1648.363 14
## 13 30 35 1950.294 1648.363 14
## 14 30 35 1950.294 1648.363 14
## 15 30 35 1950.294 1648.363 14
## 16 30 35 1950.294 1648.363 14
## 17 30 35 1950.294 1648.363 14
## 18 30 35 1950.294 1648.363 14
## 19 30 35 1950.294 1648.363 14
## 20 30 35 1950.294 1648.363 14
## 21 30 35 1950.294 1648.363 14
## 22 30 35 1950.294 1648.363 14
## 23 30 35 1950.294 1648.363 14
## 24 30 35 1950.294 1648.363 14
## 25 30 35 1950.294 1648.363 14
## 26 30 35 1950.294 1648.363 14
## 27 30 35 1950.294 1648.363 14
## 28 30 35 1950.294 1648.363 14
## 29 30 35 1950.294 1648.363 14
## 30 30 35 1950.294 1648.363 14
## 31 30 35 1950.294 1648.363 14
## 32 30 35 1950.294 1648.363 14
## 33 30 35 1950.294 1648.363 14
## 34 30 35 1950.294 1648.363 14
## 35 30 35 1950.294 1648.363 14
## 36 30 35 1950.294 1648.363 14
## 37 30 35 1950.294 1648.363 14
## 38 30 35 1950.294 1648.363 14
## 39 30 35 1950.294 1648.363 14
## 40 30 35 1950.294 1648.363 14
## 41 30 35 1950.294 1648.363 14
## 42 30 35 1950.294 1648.363 14
## 43 30 35 1950.294 1648.363 14
## 44 30 35 1950.294 1648.363 14
## 45 30 35 1950.294 1648.363 14
## 46 30 35 1950.294 1648.363 14
## 47 30 35 1950.294 1648.363 14
## 48 30 35 1950.294 1648.363 14
## 49 30 35 1950.294 1648.363 14
## 50 30 35 1950.294 1648.363 14
## 51 30 35 1950.294 1648.363 14
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
## 26 62000
## 27 62000
## 28 62000
## 29 62000
## 30 62000
## 31 62000
## 32 62000
## 33 62000
## 34 62000
## 35 62000
## 36 62000
## 37 62000
## 38 62000
## 39 62000
## 40 62000
## 41 62000
## 42 62000
## 43 62000
## 44 62000
## 45 62000
## 46 62000
## 47 62000
## 48 62000
## 49 62000
## 50 62000
## 51 62000
##
## [[3]]
## date_daysAgo
## 1 8
## 2 20
## 3 2
## 4 21
## 5 30
## 6 30
## 7 8
## 8 30
## 9 5
## 10 13
## 11 4
## 12 30
## 13 24
## 14 1
## 15 18
## 16 30
## 17 22
## 18 19
## 19 25
## 20 1
## 21 30
## 22 30
## 23 23
## 24 5
## 25 10
## 26 30
## 27 30
## 28 30
## 29 30
## 30 14
## 31 30
## 32 20
## 33 30
## 34 29
## 35 24
## 36 1
## 37 19
## 38 30
## 39 30
## 40 26
## 41 4
## 42 30
## 43 30
## 44 20
## 45 30
## 46 27
## 47 30
## 48 30
## 49 20
## 50 7
## 51 30
## 52 30
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 30
## 59 30
## 60 20
## 61 20
## 62 27
## 63 30
## 64 20
## 65 19
## 66 7
## 67 30
## 68 30
## 69 30
## 70 30
## 71 8
## 72 21
## 73 30
## 74 30
## 75 30
## 76 20
## 77 2
## 78 8
##
## [[4]]
## HiringAgency
## 1 ELITE MEDICAL CENTERPortland, OR 97233 (Mill Park area)
## 2 Aspen ChiropracticPortland, OR 97236 (Hazelwood area)
## 3 Columbia Gorge ChiropracticTroutdale, OR 97060
## 4 TeamLaszlo4.0Portland, OR 97232 (Irvington area)
## 5 Elements Massage3.6Lake Oswego, OR 97035 (Mountain Park area)
## 6 Mississippi Chiropractic, P.C.Portland, OR 97227 (Boise area)
## 7 Milwaukie Chiropractic CenterMilwaukie, OR 97222 (Milwaukie Business-Indust area)
## 8 Santé Aesthetics and WellnessPortland, OR 97209 (Northwest area)
## 9 Root Whole Body3.4Portland, OR 97210 (Northwest area)
## 10 Portland Backsmith ChiropracticPortland, OR 97210 (Northwest area)
## 11 Newberg Family Chiropractic4.3Newberg, OR 97132
## 12 Integrated Rehabilitation, Inc.Portland, OR 97266 (Powellhurst Gilbert area)
## 13 Soothe3.7Portland, OR
## 14 Soma Wellness SpaHillsboro, OR 97124
## 15 Pacific West Chiropractic, LLC.Hillsboro, OR 97123 (Brookwood area)
## 16 Integrated Rehabilitation, Inc.Portland, OR 97266 (Powellhurst Gilbert area)
## 17 Recovery Chiropractic Inc.Oregon City, OR 97045
## 18 Zen Garden Massage & Spa5.0Lake Oswego, OR 97034 (First Addition-Forest Hills area)
## 19 Burnett Chiropractic & Massage, Inc.Tigard, OR 97223 (Tigard Triangle area)
## 20 Soma Wellness SpaHillsboro, OR 97124
## 21 Accident Care Chiropractic and Massage, PCGresham, OR 97030
## 22 Spa Sasse'Portland, OR 97205 (Downtown area)
## 23 rumi simone day spa4.0Lake Oswego, OR 97034 (Evergreen area)+2 locations
## 24 Cohesive therapyVancouver, WA 98663 (Arnada area)
## 25 Elements Massage3.6Hillsboro, OR 97124
## 26 Elements3.6Portland, OR 97209 (Pearl District area)+1 location
## 27 Zama Massage Therapeutic SpaPortland, OR 97232 (Irvington area)
## 28 A Better Way Massage, LLCSaint Helens, OR 97051
## 29 Hand and Stone3.0Lake Oswego, OR 97035 (Lake Forest area)+1 location
## 30 Bridgetown ChiropracticPortland, OR 97213 (Montavilla area)
## 31 Integrated Rehabilitation, Inc.Portland, OR 97266 (Powellhurst Gilbert area)
## 32 Massage Envy3.2Portland, OR 97232 (Irvington area)+1 location
## 33 Massage Envy3.2Portland, OR 97239 (Corbett-Terwilliger-Lair Hill area)+8 locations
## 34 Core health and spineHillsboro, OR 97124
## 35 Soothe3.7Portland, OR
## 36 Soma Wellness SpaHillsboro, OR 97124
## 37 Ripple WellnessWashougal, WA 98671
## 38 Spa Sasse'Portland, OR 97205 (Downtown area)
## 39 Accident Care Chiropractic and Massage, PCGresham, OR 97030
## 40 Healing Path Holistic Medicine ClinicMilwaukie, OR 97222 (Hector Campbell area)
## 41 Quantum Chiropractic3.8Vancouver, WA 98683 (Bennington area)
## 42 Massage Envy3.2Gresham, OR 97030 (Central City area)+1 location
## 43 Hand & Stone Massage and Facial Spa- Portland and...3.0Hillsboro, OR 97124+1 location
## 44 Massage Envy3.2Beaverton, OR 97005 (Central Beaverton area)
## 45 Natural Way ChiropracticVancouver, WA 98682
## 46 Nexus ChiropracticVancouver, WA 98684 (Fircrest area)
## 47 Natural Way ChiropracticVancouver, WA 98682
## 48 Team Laszlo Massage EnvyClackamas, OR 97015
## 49 Massage Envy3.2Sherwood, OR 97140
## 50 Hand & Stone - OR & WA3.0Happy Valley, OR 97086
## 51 Emerge Natural Health CareVancouver, WA 98660 (Esther Short area)
## 52 Villasport Athletic Club and Spa3.5Beaverton, OR 97005 (Central Beaverton area)
## 53 HNCHillsboro, OR 97123
## 54 Complete Care ChiropracticWilsonville, OR 97070
## 55 Massage Envy3.2Gresham, OR 97030 (Central City area)
## 56 Breathe Yoga and MassageVancouver, WA 98684 (Fircrest area)
## 57 NW Injury & Rehab Center4.2Vancouver, WA 98662 (Van Mall area)
## 58 Hand and Stone3.0Beaverton, OR 97005 (Central Beaverton area)
## 59 Massage Envy3.2Vancouver, WA 98665
## 60 Massage Envy3.2Beaverton, OR 97005 (Central Beaverton area)
## 61 Back & Neck Care ChiropracticVancouver, WA 98684 (Fircrest area)
## 62 Nexus ChiropracticVancouver, WA 98684 (Fircrest area)
## 63 Team Laszlo Massage EnvyClackamas, OR 97015
## 64 Massage Envy3.2Sherwood, OR 97140
## 65 Ripple WellnessWashougal, WA 98671
## 66 Hand & Stone - OR & WA3.0Happy Valley, OR 97086
## 67 Villasport Athletic Club and Spa3.5Beaverton, OR 97005 (Central Beaverton area)
## 68 Massage Envy3.2Gresham, OR 97030 (Central City area)
## 69 Breathe Yoga and MassageVancouver, WA 98684 (Fircrest area)
## 70 Santé Aesthetics and WellnessPortland, OR 97209 (Northwest area)
## 71 Milwaukie Chiropractic CenterMilwaukie, OR 97222 (Milwaukie Business-Indust area)
## 72 TeamLaszlo4.0Portland, OR 97232 (Irvington area)
## 73 Elements Massage3.6Lake Oswego, OR 97035 (Mountain Park area)
## 74 Mississippi Chiropractic, P.C.Portland, OR 97227 (Boise area)
## 75 Massage Envy Tanasbourne and Murray SchollsBeaverton, OR
## 76 Aspen ChiropracticPortland, OR 97236 (Hazelwood area)
## 77 Columbia Gorge ChiropracticTroutdale, OR 97060
## 78 ELITE MEDICAL CENTERPortland, OR 97233 (Mill Park area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 23 \n$62,000 a year $62000 62000 NA
## 33 \n$36,000 - $60,000 a year $36000 - $60000 36000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 23 49000 60000 49000 60000 36000
## 33 49000 60000 49000 60000 36000
## maximumMaxSalary
## 23 60000
## 33 60000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$14 - $45 an hour $14 - $45 14 45.00
## 2 \n$20 - $35 an hour $20 - $35 20 35.00
## 3 \n$34 - $35 an hour $34 - $35 34 35.00
## 4 \n$30 - $40 an hour $30 - $40 30 40.00
## 5 \n$20 - $52 an hour $20 - $52 20 52.00
## 6 \n$35 - $40 an hour $35 - $40 35 40.00
## 7 \n$24 - $32 an hour $24 - $32 24 32.00
## 8 \n$30 - $60 an hour $30 - $60 30 60.00
## 9 \n$28 - $32 an hour $28 - $32 28 32.00
## 10 \n$18 - $40 an hour $18 - $40 18 40.00
## 11 \n$50 - $100 an hour $50 - $100 50 100.00
## 12 \n$45 - $55 an hour $45 - $55 45 55.00
## 13 \n$30 - $35 an hour $30 - $35 30 35.00
## 14 \n$50 - $100 an hour $50 - $100 50 100.00
## 15 \n$29 - $44 an hour $29 - $44 29 44.00
## 16 \n$33 - $40 an hour $33 - $40 33 40.00
## 17 \n$30 - $40 an hour $30 - $40 30 40.00
## 18 \n$45 - $55 an hour $45 - $55 45 55.00
## 19 \n$35 - $40 an hour $35 - $40 35 40.00
## 20 \n$15 - $40 an hour $15 - $40 15 40.00
## 21 \n$50 - $59 an hour $50 - $59 50 59.00
## 22 \n$20.00 - $28.61 an hour $20.00 - $28.61 20 28.61
## 24 \n$25 - $50 an hour $25 - $50 25 50.00
## 25 \n$32 - $35 an hour $32 - $35 32 35.00
## 26 \n$50 - $100 an hour $50 - $100 50 100.00
## 27 \n$45 - $55 an hour $45 - $55 45 55.00
## 28 \n$25 - $50 an hour $25 - $50 25 50.00
## 29 \n$15 - $40 an hour $15 - $40 15 40.00
## 30 \n$35 - $40 an hour $35 - $40 35 40.00
## 31 \n$28 - $30 an hour $28 - $30 28 30.00
## 32 \n$32 - $38 an hour $32 - $38 32 38.00
## 34 \n$28 - $35 an hour $28 - $35 28 35.00
## 35 \nFrom $30 an hour $30 30 NA
## 36 \n$30 - $40 an hour $30 - $40 30 40.00
## 37 \n$30 - $40 an hour $30 - $40 30 40.00
## 38 \n$25 - $35 an hour $25 - $35 25 35.00
## 39 \n$35 - $40 an hour $35 - $40 35 40.00
## 40 \n$28 - $35 an hour $28 - $35 28 35.00
## 41 \n$25 - $50 an hour $25 - $50 25 50.00
## 42 \nFrom $30 an hour $30 30 NA
## 43 \n$25 - $35 an hour $25 - $35 25 35.00
## 44 \n$24 - $32 an hour $24 - $32 24 32.00
## 45 \n$35 - $40 an hour $35 - $40 35 40.00
## 46 \n$30 - $40 an hour $30 - $40 30 40.00
## 47 \n$20 - $52 an hour $20 - $52 20 52.00
## 48 \nUp to $30 an hour ++ $30 30 NA
## 49 \n$20 - $35 an hour $20 - $35 20 35.00
## 50 \n$34 - $35 an hour $34 - $35 34 35.00
## 51 \n$14 - $45 an hour $14 - $45 14 45.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 40 29.89796 45.10022 14
## 2 30 40 29.89796 45.10022 14
## 3 30 40 29.89796 45.10022 14
## 4 30 40 29.89796 45.10022 14
## 5 30 40 29.89796 45.10022 14
## 6 30 40 29.89796 45.10022 14
## 7 30 40 29.89796 45.10022 14
## 8 30 40 29.89796 45.10022 14
## 9 30 40 29.89796 45.10022 14
## 10 30 40 29.89796 45.10022 14
## 11 30 40 29.89796 45.10022 14
## 12 30 40 29.89796 45.10022 14
## 13 30 40 29.89796 45.10022 14
## 14 30 40 29.89796 45.10022 14
## 15 30 40 29.89796 45.10022 14
## 16 30 40 29.89796 45.10022 14
## 17 30 40 29.89796 45.10022 14
## 18 30 40 29.89796 45.10022 14
## 19 30 40 29.89796 45.10022 14
## 20 30 40 29.89796 45.10022 14
## 21 30 40 29.89796 45.10022 14
## 22 30 40 29.89796 45.10022 14
## 24 30 40 29.89796 45.10022 14
## 25 30 40 29.89796 45.10022 14
## 26 30 40 29.89796 45.10022 14
## 27 30 40 29.89796 45.10022 14
## 28 30 40 29.89796 45.10022 14
## 29 30 40 29.89796 45.10022 14
## 30 30 40 29.89796 45.10022 14
## 31 30 40 29.89796 45.10022 14
## 32 30 40 29.89796 45.10022 14
## 34 30 40 29.89796 45.10022 14
## 35 30 40 29.89796 45.10022 14
## 36 30 40 29.89796 45.10022 14
## 37 30 40 29.89796 45.10022 14
## 38 30 40 29.89796 45.10022 14
## 39 30 40 29.89796 45.10022 14
## 40 30 40 29.89796 45.10022 14
## 41 30 40 29.89796 45.10022 14
## 42 30 40 29.89796 45.10022 14
## 43 30 40 29.89796 45.10022 14
## 44 30 40 29.89796 45.10022 14
## 45 30 40 29.89796 45.10022 14
## 46 30 40 29.89796 45.10022 14
## 47 30 40 29.89796 45.10022 14
## 48 30 40 29.89796 45.10022 14
## 49 30 40 29.89796 45.10022 14
## 50 30 40 29.89796 45.10022 14
## 51 30 40 29.89796 45.10022 14
## maximumMaxSalary
## 1 100
## 2 100
## 3 100
## 4 100
## 5 100
## 6 100
## 7 100
## 8 100
## 9 100
## 10 100
## 11 100
## 12 100
## 13 100
## 14 100
## 15 100
## 16 100
## 17 100
## 18 100
## 19 100
## 20 100
## 21 100
## 22 100
## 24 100
## 25 100
## 26 100
## 27 100
## 28 100
## 29 100
## 30 100
## 31 100
## 32 100
## 34 100
## 35 100
## 36 100
## 37 100
## 38 100
## 39 100
## 40 100
## 41 100
## 42 100
## 43 100
## 44 100
## 45 100
## 46 100
## 47 100
## 48 100
## 49 100
## 50 100
## 51 100
##
## [[7]]
## city state
## 1 Portland OR
## 2 Portland OR
## 3 Portland OR
## 4 Portland OR
## 5 Portland OR
## 6 Portland OR
## 7 Portland OR
## 8 Portland OR
## 9 Portland OR
## 10 Portland OR
## 11 Portland OR
## 12 Portland OR
## 13 Portland OR
## 14 Portland OR
## 15 Portland OR
## 16 Portland OR
## 17 Portland OR
## 18 Portland OR
## 19 Portland OR
## 20 Portland OR
## 21 Portland OR
## 22 Portland OR
## 23 Portland OR
## 24 Portland OR
## 25 Portland OR
## 26 Portland OR
## 27 Portland OR
## 28 Portland OR
## 29 Portland OR
## 30 Portland OR
## 31 Portland OR
## 32 Portland OR
## 33 Portland OR
## 34 Portland OR
## 35 Portland OR
## 36 Portland OR
## 37 Portland OR
## 38 Portland OR
## 39 Portland OR
## 40 Portland OR
## 41 Portland OR
## 42 Portland OR
## 43 Portland OR
## 44 Portland OR
## 45 Portland OR
## 46 Portland OR
## 47 Portland OR
## 48 Portland OR
## 49 Portland OR
## 50 Portland OR
## 51 Portland OR
## 52 Portland OR
## 53 Portland OR
## 54 Portland OR
## 55 Portland OR
## 56 Portland OR
## 57 Portland OR
## 58 Portland OR
## 59 Portland OR
## 60 Portland OR
## 61 Portland OR
## 62 Portland OR
## 63 Portland OR
## 64 Portland OR
## 65 Portland OR
## 66 Portland OR
## 67 Portland OR
## 68 Portland OR
## 69 Portland OR
## 70 Portland OR
## 71 Portland OR
## 72 Portland OR
## 73 Portland OR
## 74 Portland OR
## 75 Portland OR
## 76 Portland OR
## 77 Portland OR
## 78 Portland OR
## jobTitle
## 1 Licensed Massage Therapist / LMT (1YR EXP REQ)
## 2 Licenced Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Massage therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 12 LMT Part-time/Full-time
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 LMT Part-time/Full-time
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist, LMT
## 24 Lead Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapists - Pearl District - Portland, OR
## 27 Licensed Massage Therapists
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Part time LMT
## 31 LMT Part-time/Full-time
## 32 Stretch Service Provider / Personal Trainer
## 33 Massage Therapist
## 34 Naturopathic Physician, acupuncturist, massage therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Licensed Massage Therapist
## 40 Part-time Licensed Massage Therapist for Holistic Clinic
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist FT or PT
## 43 Licensed Massage Therapist (LMT)-Hillsboro
## 44 Licensed Massage Therapist ME TeamLaszlo
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist (LMT)
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapist with health/dental insurance
## 51 Licensed Massage Therapist
## 52 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 53 Licensed Massage Therapist
## 54 Immediate Opening, LMT for Wilsonville Chiropractic Clinic $...
## 55 Total Body Stretch Service Provider
## 56 WA State Licensed Massage Therapist
## 57 Licensed Massage Therapist (LMT)
## 58 Massage Therapist retirement plan with match and health/dent...
## 59 Massage Therapist West Vancouver
## 60 Licensed Massage Therapist ME TeamLaszlo
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist (LMT)
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist with health/dental insurance
## 67 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 68 Total Body Stretch Service Provider
## 69 WA State Licensed Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage therapist
## 72 Licensed Massage Therapist (LMT)
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist (LMT)
## 76 Licenced Massage Therapist
## 77 Licensed Massage Therapist
## 78 Licensed Massage Therapist / LMT (1YR EXP REQ)
## HiringAgency
## 1 ELITE MEDICAL CENTERPortland, OR 97233 (Mill Park area)
## 2 Aspen ChiropracticPortland, OR 97236 (Hazelwood area)
## 3 Columbia Gorge ChiropracticTroutdale, OR 97060
## 4 TeamLaszlo4.0Portland, OR 97232 (Irvington area)
## 5 Elements Massage3.6Lake Oswego, OR 97035 (Mountain Park area)
## 6 Mississippi Chiropractic, P.C.Portland, OR 97227 (Boise area)
## 7 Milwaukie Chiropractic CenterMilwaukie, OR 97222 (Milwaukie Business-Indust area)
## 8 Santé Aesthetics and WellnessPortland, OR 97209 (Northwest area)
## 9 Root Whole Body3.4Portland, OR 97210 (Northwest area)
## 10 Portland Backsmith ChiropracticPortland, OR 97210 (Northwest area)
## 11 Newberg Family Chiropractic4.3Newberg, OR 97132
## 12 Integrated Rehabilitation, Inc.Portland, OR 97266 (Powellhurst Gilbert area)
## 13 Soothe3.7Portland, OR
## 14 Soma Wellness SpaHillsboro, OR 97124
## 15 Pacific West Chiropractic, LLC.Hillsboro, OR 97123 (Brookwood area)
## 16 Integrated Rehabilitation, Inc.Portland, OR 97266 (Powellhurst Gilbert area)
## 17 Recovery Chiropractic Inc.Oregon City, OR 97045
## 18 Zen Garden Massage & Spa5.0Lake Oswego, OR 97034 (First Addition-Forest Hills area)
## 19 Burnett Chiropractic & Massage, Inc.Tigard, OR 97223 (Tigard Triangle area)
## 20 Soma Wellness SpaHillsboro, OR 97124
## 21 Accident Care Chiropractic and Massage, PCGresham, OR 97030
## 22 Spa Sasse'Portland, OR 97205 (Downtown area)
## 23 rumi simone day spa4.0Lake Oswego, OR 97034 (Evergreen area)+2 locations
## 24 Cohesive therapyVancouver, WA 98663 (Arnada area)
## 25 Elements Massage3.6Hillsboro, OR 97124
## 26 Elements3.6Portland, OR 97209 (Pearl District area)+1 location
## 27 Zama Massage Therapeutic SpaPortland, OR 97232 (Irvington area)
## 28 A Better Way Massage, LLCSaint Helens, OR 97051
## 29 Hand and Stone3.0Lake Oswego, OR 97035 (Lake Forest area)+1 location
## 30 Bridgetown ChiropracticPortland, OR 97213 (Montavilla area)
## 31 Integrated Rehabilitation, Inc.Portland, OR 97266 (Powellhurst Gilbert area)
## 32 Massage Envy3.2Portland, OR 97232 (Irvington area)+1 location
## 33 Massage Envy3.2Portland, OR 97239 (Corbett-Terwilliger-Lair Hill area)+8 locations
## 34 Core health and spineHillsboro, OR 97124
## 35 Soothe3.7Portland, OR
## 36 Soma Wellness SpaHillsboro, OR 97124
## 37 Ripple WellnessWashougal, WA 98671
## 38 Spa Sasse'Portland, OR 97205 (Downtown area)
## 39 Accident Care Chiropractic and Massage, PCGresham, OR 97030
## 40 Healing Path Holistic Medicine ClinicMilwaukie, OR 97222 (Hector Campbell area)
## 41 Quantum Chiropractic3.8Vancouver, WA 98683 (Bennington area)
## 42 Massage Envy3.2Gresham, OR 97030 (Central City area)+1 location
## 43 Hand & Stone Massage and Facial Spa- Portland and...3.0Hillsboro, OR 97124+1 location
## 44 Massage Envy3.2Beaverton, OR 97005 (Central Beaverton area)
## 45 Natural Way ChiropracticVancouver, WA 98682
## 46 Nexus ChiropracticVancouver, WA 98684 (Fircrest area)
## 47 Natural Way ChiropracticVancouver, WA 98682
## 48 Team Laszlo Massage EnvyClackamas, OR 97015
## 49 Massage Envy3.2Sherwood, OR 97140
## 50 Hand & Stone - OR & WA3.0Happy Valley, OR 97086
## 51 Emerge Natural Health CareVancouver, WA 98660 (Esther Short area)
## 52 Villasport Athletic Club and Spa3.5Beaverton, OR 97005 (Central Beaverton area)
## 53 HNCHillsboro, OR 97123
## 54 Complete Care ChiropracticWilsonville, OR 97070
## 55 Massage Envy3.2Gresham, OR 97030 (Central City area)
## 56 Breathe Yoga and MassageVancouver, WA 98684 (Fircrest area)
## 57 NW Injury & Rehab Center4.2Vancouver, WA 98662 (Van Mall area)
## 58 Hand and Stone3.0Beaverton, OR 97005 (Central Beaverton area)
## 59 Massage Envy3.2Vancouver, WA 98665
## 60 Massage Envy3.2Beaverton, OR 97005 (Central Beaverton area)
## 61 Back & Neck Care ChiropracticVancouver, WA 98684 (Fircrest area)
## 62 Nexus ChiropracticVancouver, WA 98684 (Fircrest area)
## 63 Team Laszlo Massage EnvyClackamas, OR 97015
## 64 Massage Envy3.2Sherwood, OR 97140
## 65 Ripple WellnessWashougal, WA 98671
## 66 Hand & Stone - OR & WA3.0Happy Valley, OR 97086
## 67 Villasport Athletic Club and Spa3.5Beaverton, OR 97005 (Central Beaverton area)
## 68 Massage Envy3.2Gresham, OR 97030 (Central City area)
## 69 Breathe Yoga and MassageVancouver, WA 98684 (Fircrest area)
## 70 Santé Aesthetics and WellnessPortland, OR 97209 (Northwest area)
## 71 Milwaukie Chiropractic CenterMilwaukie, OR 97222 (Milwaukie Business-Indust area)
## 72 TeamLaszlo4.0Portland, OR 97232 (Irvington area)
## 73 Elements Massage3.6Lake Oswego, OR 97035 (Mountain Park area)
## 74 Mississippi Chiropractic, P.C.Portland, OR 97227 (Boise area)
## 75 Massage Envy Tanasbourne and Murray SchollsBeaverton, OR
## 76 Aspen ChiropracticPortland, OR 97236 (Hazelwood area)
## 77 Columbia Gorge ChiropracticTroutdale, OR 97060
## 78 ELITE MEDICAL CENTERPortland, OR 97233 (Mill Park area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 8 14 100 36000 60000
## 2 20 14 100 36000 60000
## 3 2 14 100 36000 60000
## 4 21 14 100 36000 60000
## 5 30 14 100 36000 60000
## 6 30 14 100 36000 60000
## 7 8 14 100 36000 60000
## 8 30 14 100 36000 60000
## 9 5 14 100 36000 60000
## 10 13 14 100 36000 60000
## 11 4 14 100 36000 60000
## 12 30 14 100 36000 60000
## 13 24 14 100 36000 60000
## 14 1 14 100 36000 60000
## 15 18 14 100 36000 60000
## 16 30 14 100 36000 60000
## 17 22 14 100 36000 60000
## 18 19 14 100 36000 60000
## 19 25 14 100 36000 60000
## 20 1 14 100 36000 60000
## 21 30 14 100 36000 60000
## 22 30 14 100 36000 60000
## 23 23 14 100 36000 60000
## 24 5 14 100 36000 60000
## 25 10 14 100 36000 60000
## 26 30 14 100 36000 60000
## 27 30 14 100 36000 60000
## 28 30 14 100 36000 60000
## 29 30 14 100 36000 60000
## 30 14 14 100 36000 60000
## 31 30 14 100 36000 60000
## 32 20 14 100 36000 60000
## 33 30 14 100 36000 60000
## 34 29 14 100 36000 60000
## 35 24 14 100 36000 60000
## 36 1 14 100 36000 60000
## 37 19 14 100 36000 60000
## 38 30 14 100 36000 60000
## 39 30 14 100 36000 60000
## 40 26 14 100 36000 60000
## 41 4 14 100 36000 60000
## 42 30 14 100 36000 60000
## 43 30 14 100 36000 60000
## 44 20 14 100 36000 60000
## 45 30 14 100 36000 60000
## 46 27 14 100 36000 60000
## 47 30 14 100 36000 60000
## 48 30 14 100 36000 60000
## 49 20 14 100 36000 60000
## 50 7 14 100 36000 60000
## 51 30 14 100 36000 60000
## 52 30 14 100 36000 60000
## 53 30 14 100 36000 60000
## 54 30 14 100 36000 60000
## 55 30 14 100 36000 60000
## 56 30 14 100 36000 60000
## 57 30 14 100 36000 60000
## 58 30 14 100 36000 60000
## 59 30 14 100 36000 60000
## 60 20 14 100 36000 60000
## 61 20 14 100 36000 60000
## 62 27 14 100 36000 60000
## 63 30 14 100 36000 60000
## 64 20 14 100 36000 60000
## 65 19 14 100 36000 60000
## 66 7 14 100 36000 60000
## 67 30 14 100 36000 60000
## 68 30 14 100 36000 60000
## 69 30 14 100 36000 60000
## 70 30 14 100 36000 60000
## 71 8 14 100 36000 60000
## 72 21 14 100 36000 60000
## 73 30 14 100 36000 60000
## 74 30 14 100 36000 60000
## 75 30 14 100 36000 60000
## 76 20 14 100 36000 60000
## 77 2 14 100 36000 60000
## 78 8 14 100 36000 60000
getIndeedJobData5pages('massage therapist', 'Salem','OR')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist (LMT)
## 4 Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 5 Licensed Massage Therapist (LMT)
## 6 Licensed Massage Therapist (LMT)
## 7 Massage Therapist Deep tissue
## 8 Stretch Provider / Personal Trainer
## 9 Licensed Massage Therapist (LMT)
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist (LMT)
## 12 Licensed Massage Therapist (LMT)
## 13 Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist Deep tissue
## 16 Stretch Provider / Personal Trainer
## 17 Licensed Massage Therapist (LMT)
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist (LMT)
## 20 Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 21 Licensed Massage Therapist (LMT)
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist Deep tissue
## 24 Stretch Provider / Personal Trainer
## 25 Licensed Massage Therapist (LMT)
## 26 Licensed Massage Therapist (LMT)
## 27 Licensed Massage Therapist (LMT)
## 28 Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 29 Licensed Massage Therapist (LMT)
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist Deep tissue
## 32 Stretch Provider / Personal Trainer
## 33 Licensed Massage Therapist (LMT)
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist (LMT)
## 36 Licensed Massage Therapist (LMT)
## 37 Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 38 Licensed Massage Therapist (LMT)
## 39 Massage Therapist Deep tissue
## 40 Stretch Provider / Personal Trainer
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 - $45 an hour $30 - $45 30 45 30
## 2 \n$18 - $40 an hour $18 - $40 18 40 30
## 3 \n$30 - $35 an hour $30 - $35 30 35 30
## 4 \n$30 - $45 an hour $30 - $45 30 45 30
## 5 \n$30 - $35 an hour $30 - $35 30 35 30
## 6 \n$18 - $40 an hour $18 - $40 18 40 30
## 7 \n$30 - $45 an hour $30 - $45 30 45 30
## 8 \n$18 - $40 an hour $18 - $40 18 40 30
## 9 \n$30 - $35 an hour $30 - $35 30 35 30
## 10 \n$30 - $45 an hour $30 - $45 30 45 30
## 11 \n$18 - $40 an hour $18 - $40 18 40 30
## 12 \n$30 - $35 an hour $30 - $35 30 35 30
## 13 \n$30 - $45 an hour $30 - $45 30 45 30
## 14 \n$30 - $35 an hour $30 - $35 30 35 30
## 15 \n$18 - $40 an hour $18 - $40 18 40 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 32.5 26 33 18 45
## 2 32.5 26 33 18 45
## 3 32.5 26 33 18 45
## 4 32.5 26 33 18 45
## 5 32.5 26 33 18 45
## 6 32.5 26 33 18 45
## 7 32.5 26 33 18 45
## 8 32.5 26 33 18 45
## 9 32.5 26 33 18 45
## 10 32.5 26 33 18 45
## 11 32.5 26 33 18 45
## 12 32.5 26 33 18 45
## 13 32.5 26 33 18 45
## 14 32.5 26 33 18 45
## 15 32.5 26 33 18 45
##
## [[3]]
## date_daysAgo
## 1 22
## 2 21
## 3 27
## 4 4
## 5 14
## 6 20
## 7 30
## 8 20
## 9 22
## 10 21
## 11 27
## 12 14
## 13 4
## 14 20
## 15 30
## 16 20
## 17 22
## 18 21
## 19 27
## 20 4
## 21 14
## 22 20
## 23 30
## 24 20
## 25 22
## 26 21
## 27 27
## 28 4
## 29 14
## 30 20
## 31 30
## 32 20
## 33 22
## 34 21
## 35 27
## 36 14
## 37 4
## 38 20
## 39 30
## 40 20
##
## [[4]]
## HiringAgency
## 1 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 2 TeamLaszlo4.0Keizer, OR 97303
## 3 Oregon Garden ResortSilverton, OR 97381
## 4 Newberg Family Chiropractic4.3Newberg, OR 97132
## 5 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 6 Massage Envy3.2Keizer, OR 97303
## 7 Massage Envy3.2Keizer, OR 97303
## 8 Massage Envy3.2Keizer, OR 97303
## 9 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 10 TeamLaszlo4.0Keizer, OR 97303
## 11 Oregon Garden ResortSilverton, OR 97381
## 12 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 13 Newberg Family Chiropractic4.3Newberg, OR 97132
## 14 Massage Envy3.2Keizer, OR 97303
## 15 Massage Envy3.2Keizer, OR 97303
## 16 Massage Envy3.2Keizer, OR 97303
## 17 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 18 TeamLaszlo4.0Keizer, OR 97303
## 19 Oregon Garden ResortSilverton, OR 97381
## 20 Newberg Family Chiropractic4.3Newberg, OR 97132
## 21 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 22 Massage Envy3.2Keizer, OR 97303
## 23 Massage Envy3.2Keizer, OR 97303
## 24 Massage Envy3.2Keizer, OR 97303
## 25 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 26 TeamLaszlo4.0Keizer, OR 97303
## 27 Oregon Garden ResortSilverton, OR 97381
## 28 Newberg Family Chiropractic4.3Newberg, OR 97132
## 29 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 30 Massage Envy3.2Keizer, OR 97303
## 31 Massage Envy3.2Keizer, OR 97303
## 32 Massage Envy3.2Keizer, OR 97303
## 33 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 34 TeamLaszlo4.0Keizer, OR 97303
## 35 Oregon Garden ResortSilverton, OR 97381
## 36 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 37 Newberg Family Chiropractic4.3Newberg, OR 97132
## 38 Massage Envy3.2Keizer, OR 97303
## 39 Massage Envy3.2Keizer, OR 97303
## 40 Massage Envy3.2Keizer, OR 97303
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 - $45 an hour $30 - $45 30 45 30
## 2 \n$18 - $40 an hour $18 - $40 18 40 30
## 3 \n$30 - $35 an hour $30 - $35 30 35 30
## 4 \n$30 - $45 an hour $30 - $45 30 45 30
## 5 \n$30 - $35 an hour $30 - $35 30 35 30
## 6 \n$18 - $40 an hour $18 - $40 18 40 30
## 7 \n$30 - $45 an hour $30 - $45 30 45 30
## 8 \n$18 - $40 an hour $18 - $40 18 40 30
## 9 \n$30 - $35 an hour $30 - $35 30 35 30
## 10 \n$30 - $45 an hour $30 - $45 30 45 30
## 11 \n$18 - $40 an hour $18 - $40 18 40 30
## 12 \n$30 - $35 an hour $30 - $35 30 35 30
## 13 \n$30 - $45 an hour $30 - $45 30 45 30
## 14 \n$30 - $35 an hour $30 - $35 30 35 30
## 15 \n$18 - $40 an hour $18 - $40 18 40 30
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 26 40 18 45
## 2 40 26 40 18 45
## 3 40 26 40 18 45
## 4 40 26 40 18 45
## 5 40 26 40 18 45
## 6 40 26 40 18 45
## 7 40 26 40 18 45
## 8 40 26 40 18 45
## 9 40 26 40 18 45
## 10 40 26 40 18 45
## 11 40 26 40 18 45
## 12 40 26 40 18 45
## 13 40 26 40 18 45
## 14 40 26 40 18 45
## 15 40 26 40 18 45
##
## [[7]]
## city state jobTitle
## 1 Salem OR Licensed Massage Therapist (LMT)
## 2 Salem OR Licensed Massage Therapist (LMT)
## 3 Salem OR Licensed Massage Therapist (LMT)
## 4 Salem OR Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 5 Salem OR Licensed Massage Therapist (LMT)
## 6 Salem OR Licensed Massage Therapist (LMT)
## 7 Salem OR Massage Therapist Deep tissue
## 8 Salem OR Stretch Provider / Personal Trainer
## 9 Salem OR Licensed Massage Therapist (LMT)
## 10 Salem OR Licensed Massage Therapist (LMT)
## 11 Salem OR Licensed Massage Therapist (LMT)
## 12 Salem OR Licensed Massage Therapist (LMT)
## 13 Salem OR Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 14 Salem OR Licensed Massage Therapist (LMT)
## 15 Salem OR Massage Therapist Deep tissue
## 16 Salem OR Stretch Provider / Personal Trainer
## 17 Salem OR Licensed Massage Therapist (LMT)
## 18 Salem OR Licensed Massage Therapist (LMT)
## 19 Salem OR Licensed Massage Therapist (LMT)
## 20 Salem OR Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 21 Salem OR Licensed Massage Therapist (LMT)
## 22 Salem OR Licensed Massage Therapist (LMT)
## 23 Salem OR Massage Therapist Deep tissue
## 24 Salem OR Stretch Provider / Personal Trainer
## 25 Salem OR Licensed Massage Therapist (LMT)
## 26 Salem OR Licensed Massage Therapist (LMT)
## 27 Salem OR Licensed Massage Therapist (LMT)
## 28 Salem OR Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 29 Salem OR Licensed Massage Therapist (LMT)
## 30 Salem OR Licensed Massage Therapist (LMT)
## 31 Salem OR Massage Therapist Deep tissue
## 32 Salem OR Stretch Provider / Personal Trainer
## 33 Salem OR Licensed Massage Therapist (LMT)
## 34 Salem OR Licensed Massage Therapist (LMT)
## 35 Salem OR Licensed Massage Therapist (LMT)
## 36 Salem OR Licensed Massage Therapist (LMT)
## 37 Salem OR Licensed Massage Therapist (LMT) / Chiropractic Assistant (C...
## 38 Salem OR Licensed Massage Therapist (LMT)
## 39 Salem OR Massage Therapist Deep tissue
## 40 Salem OR Stretch Provider / Personal Trainer
## HiringAgency
## 1 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 2 TeamLaszlo4.0Keizer, OR 97303
## 3 Oregon Garden ResortSilverton, OR 97381
## 4 Newberg Family Chiropractic4.3Newberg, OR 97132
## 5 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 6 Massage Envy3.2Keizer, OR 97303
## 7 Massage Envy3.2Keizer, OR 97303
## 8 Massage Envy3.2Keizer, OR 97303
## 9 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 10 TeamLaszlo4.0Keizer, OR 97303
## 11 Oregon Garden ResortSilverton, OR 97381
## 12 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 13 Newberg Family Chiropractic4.3Newberg, OR 97132
## 14 Massage Envy3.2Keizer, OR 97303
## 15 Massage Envy3.2Keizer, OR 97303
## 16 Massage Envy3.2Keizer, OR 97303
## 17 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 18 TeamLaszlo4.0Keizer, OR 97303
## 19 Oregon Garden ResortSilverton, OR 97381
## 20 Newberg Family Chiropractic4.3Newberg, OR 97132
## 21 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 22 Massage Envy3.2Keizer, OR 97303
## 23 Massage Envy3.2Keizer, OR 97303
## 24 Massage Envy3.2Keizer, OR 97303
## 25 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 26 TeamLaszlo4.0Keizer, OR 97303
## 27 Oregon Garden ResortSilverton, OR 97381
## 28 Newberg Family Chiropractic4.3Newberg, OR 97132
## 29 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 30 Massage Envy3.2Keizer, OR 97303
## 31 Massage Envy3.2Keizer, OR 97303
## 32 Massage Envy3.2Keizer, OR 97303
## 33 American Proactive Chiropractic Rehabilitation CenterSalem, OR 97301 (East Lancaster area)
## 34 TeamLaszlo4.0Keizer, OR 97303
## 35 Oregon Garden ResortSilverton, OR 97381
## 36 Advanced Chiropractic ClinicAlbany, OR 97321 (Willamette area)
## 37 Newberg Family Chiropractic4.3Newberg, OR 97132
## 38 Massage Envy3.2Keizer, OR 97303
## 39 Massage Envy3.2Keizer, OR 97303
## 40 Massage Envy3.2Keizer, OR 97303
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 22 18 45 NA NA
## 2 21 18 45 NA NA
## 3 27 18 45 NA NA
## 4 4 18 45 NA NA
## 5 14 18 45 NA NA
## 6 20 18 45 NA NA
## 7 30 18 45 NA NA
## 8 20 18 45 NA NA
## 9 22 18 45 NA NA
## 10 21 18 45 NA NA
## 11 27 18 45 NA NA
## 12 14 18 45 NA NA
## 13 4 18 45 NA NA
## 14 20 18 45 NA NA
## 15 30 18 45 NA NA
## 16 20 18 45 NA NA
## 17 22 18 45 NA NA
## 18 21 18 45 NA NA
## 19 27 18 45 NA NA
## 20 4 18 45 NA NA
## 21 14 18 45 NA NA
## 22 20 18 45 NA NA
## 23 30 18 45 NA NA
## 24 20 18 45 NA NA
## 25 22 18 45 NA NA
## 26 21 18 45 NA NA
## 27 27 18 45 NA NA
## 28 4 18 45 NA NA
## 29 14 18 45 NA NA
## 30 20 18 45 NA NA
## 31 30 18 45 NA NA
## 32 20 18 45 NA NA
## 33 22 18 45 NA NA
## 34 21 18 45 NA NA
## 35 27 18 45 NA NA
## 36 14 18 45 NA NA
## 37 4 18 45 NA NA
## 38 20 18 45 NA NA
## 39 30 18 45 NA NA
## 40 20 18 45 NA NA
getIndeedJobData5pages('massage therapist', 'Eugene','OR')
## Warning in getIndeedJobData5pages("massage therapist", "Eugene", "OR"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Eugene", "OR"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapist FT or PT
## 5 Licensed Massage Therapist (LMT)
## 6 Licensed Massage Therapist (LMT)
## 7 Massage Therapist
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 10 Licensed Massage Therapist (LMT)
## 11 Massage Therapist FT or PT
## 12 Licensed Massage Therapist (LMT)
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 17 Licensed Massage Therapist (LMT)
## 18 Massage Therapist FT or PT
## 19 Licensed Massage Therapist (LMT)
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 24 Licensed Massage Therapist (LMT)
## 25 Massage Therapist FT or PT
## 26 Licensed Massage Therapist (LMT)
## 27 Licensed Massage Therapist (LMT)
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 31 Licensed Massage Therapist (LMT)
## 32 Massage Therapist FT or PT
## 33 Licensed Massage Therapist (LMT)
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 2 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 3 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 4 \n$40 an hour $40 40 NA 33.5
## 5 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 6 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 7 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 8 \n$40 an hour $40 40 NA 33.5
## 9 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 10 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 11 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 12 \n$40 an hour $40 40 NA 33.5
## 13 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 14 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 15 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 16 \n$40 an hour $40 40 NA 33.5
## 17 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 18 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 19 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 20 \n$40 an hour $40 40 NA 33.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 35 31.75 34.57143 20 45
## 2 35 31.75 34.57143 20 45
## 3 35 31.75 34.57143 20 45
## 4 35 31.75 34.57143 20 45
## 5 35 31.75 34.57143 20 45
## 6 35 31.75 34.57143 20 45
## 7 35 31.75 34.57143 20 45
## 8 35 31.75 34.57143 20 45
## 9 35 31.75 34.57143 20 45
## 10 35 31.75 34.57143 20 45
## 11 35 31.75 34.57143 20 45
## 12 35 31.75 34.57143 20 45
## 13 35 31.75 34.57143 20 45
## 14 35 31.75 34.57143 20 45
## 15 35 31.75 34.57143 20 45
## 16 35 31.75 34.57143 20 45
## 17 35 31.75 34.57143 20 45
## 18 35 31.75 34.57143 20 45
## 19 35 31.75 34.57143 20 45
## 20 35 31.75 34.57143 20 45
##
## [[3]]
## date_daysAgo
## 1 21
## 2 7
## 3 12
## 4 Today
## 5 14
## 6 30
## 7 30
## 8 21
## 9 7
## 10 12
## 11 Today
## 12 14
## 13 30
## 14 30
## 15 21
## 16 7
## 17 12
## 18 Today
## 19 14
## 20 30
## 21 30
## 22 21
## 23 7
## 24 12
## 25 Today
## 26 14
## 27 30
## 28 30
## 29 21
## 30 7
## 31 12
## 32 Today
## 33 14
## 34 30
## 35 30
##
## [[4]]
## HiringAgency
## 1 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 2 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 3 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 4 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 5 Natural Life Chiropractic3.0Coburg, OR+1 location
## 6 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 7 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 8 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 9 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 10 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 11 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 12 Natural Life Chiropractic3.0Coburg, OR+1 location
## 13 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 14 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 15 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 16 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 17 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 18 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 19 Natural Life Chiropractic3.0Coburg, OR+1 location
## 20 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 21 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 22 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 23 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 24 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 25 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 26 Natural Life Chiropractic3.0Coburg, OR+1 location
## 27 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 28 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 29 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 30 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 31 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 32 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 33 Natural Life Chiropractic3.0Coburg, OR+1 location
## 34 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 35 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 2 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 3 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 4 \n$40 an hour $40 40 NA 33.5
## 5 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 6 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 7 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 8 \n$40 an hour $40 40 NA 33.5
## 9 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 10 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 11 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 12 \n$40 an hour $40 40 NA 33.5
## 13 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 14 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 15 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 16 \n$40 an hour $40 40 NA 33.5
## 17 \n$32 - $45 an hour $32 - $45 32 45 33.5
## 18 \n$20 - $25 an hour $20 - $25 20 25 33.5
## 19 \n$35 - $45 an hour $35 - $45 35 45 33.5
## 20 \n$40 an hour $40 40 NA 33.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 45 31.75 38.33333 20 45
## 2 45 31.75 38.33333 20 45
## 3 45 31.75 38.33333 20 45
## 4 45 31.75 38.33333 20 45
## 5 45 31.75 38.33333 20 45
## 6 45 31.75 38.33333 20 45
## 7 45 31.75 38.33333 20 45
## 8 45 31.75 38.33333 20 45
## 9 45 31.75 38.33333 20 45
## 10 45 31.75 38.33333 20 45
## 11 45 31.75 38.33333 20 45
## 12 45 31.75 38.33333 20 45
## 13 45 31.75 38.33333 20 45
## 14 45 31.75 38.33333 20 45
## 15 45 31.75 38.33333 20 45
## 16 45 31.75 38.33333 20 45
## 17 45 31.75 38.33333 20 45
## 18 45 31.75 38.33333 20 45
## 19 45 31.75 38.33333 20 45
## 20 45 31.75 38.33333 20 45
##
## [[7]]
## city state jobTitle
## 1 Eugene OR Licensed Massage Therapist
## 2 Eugene OR Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 3 Eugene OR Licensed Massage Therapist (LMT)
## 4 Eugene OR Massage Therapist FT or PT
## 5 Eugene OR Licensed Massage Therapist (LMT)
## 6 Eugene OR Licensed Massage Therapist (LMT)
## 7 Eugene OR Massage Therapist
## 8 Eugene OR Licensed Massage Therapist
## 9 Eugene OR Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 10 Eugene OR Licensed Massage Therapist (LMT)
## 11 Eugene OR Massage Therapist FT or PT
## 12 Eugene OR Licensed Massage Therapist (LMT)
## 13 Eugene OR Licensed Massage Therapist (LMT)
## 14 Eugene OR Massage Therapist
## 15 Eugene OR Licensed Massage Therapist
## 16 Eugene OR Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 17 Eugene OR Licensed Massage Therapist (LMT)
## 18 Eugene OR Massage Therapist FT or PT
## 19 Eugene OR Licensed Massage Therapist (LMT)
## 20 Eugene OR Licensed Massage Therapist (LMT)
## 21 Eugene OR Massage Therapist
## 22 Eugene OR Licensed Massage Therapist
## 23 Eugene OR Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 24 Eugene OR Licensed Massage Therapist (LMT)
## 25 Eugene OR Massage Therapist FT or PT
## 26 Eugene OR Licensed Massage Therapist (LMT)
## 27 Eugene OR Licensed Massage Therapist (LMT)
## 28 Eugene OR Massage Therapist
## 29 Eugene OR Licensed Massage Therapist
## 30 Eugene OR Licensed Massage Therapist at busy chiropractic clinic - Emp...
## 31 Eugene OR Licensed Massage Therapist (LMT)
## 32 Eugene OR Massage Therapist FT or PT
## 33 Eugene OR Licensed Massage Therapist (LMT)
## 34 Eugene OR Licensed Massage Therapist (LMT)
## 35 Eugene OR Massage Therapist
## HiringAgency
## 1 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 2 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 3 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 4 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 5 Natural Life Chiropractic3.0Coburg, OR+1 location
## 6 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 7 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 8 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 9 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 10 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 11 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 12 Natural Life Chiropractic3.0Coburg, OR+1 location
## 13 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 14 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 15 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 16 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 17 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 18 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 19 Natural Life Chiropractic3.0Coburg, OR+1 location
## 20 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 21 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 22 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 23 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 24 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 25 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 26 Natural Life Chiropractic3.0Coburg, OR+1 location
## 27 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 28 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 29 Well Balanced Center for Integrated CareEugene, OR 97402 (Jefferson Westside area)
## 30 Pure Life Chiropractic, LLCEugene, OR 97401 (Cal Young area)
## 31 Aspen ChiropracticEugene, OR 97401 (Downtown area)
## 32 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## 33 Natural Life Chiropractic3.0Coburg, OR+1 location
## 34 Body of Light Family ChiropracticEugene, OR 97401 (West University area)
## 35 Massage Envy3.2Eugene, OR 97401 (Cal Young area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 21 20 45 NA NA
## 2 7 20 45 NA NA
## 3 12 20 45 NA NA
## 4 Today 20 45 NA NA
## 5 14 20 45 NA NA
## 6 30 20 45 NA NA
## 7 30 20 45 NA NA
## 8 21 20 45 NA NA
## 9 7 20 45 NA NA
## 10 12 20 45 NA NA
## 11 Today 20 45 NA NA
## 12 14 20 45 NA NA
## 13 30 20 45 NA NA
## 14 30 20 45 NA NA
## 15 21 20 45 NA NA
## 16 7 20 45 NA NA
## 17 12 20 45 NA NA
## 18 Today 20 45 NA NA
## 19 14 20 45 NA NA
## 20 30 20 45 NA NA
## 21 30 20 45 NA NA
## 22 21 20 45 NA NA
## 23 7 20 45 NA NA
## 24 12 20 45 NA NA
## 25 Today 20 45 NA NA
## 26 14 20 45 NA NA
## 27 30 20 45 NA NA
## 28 30 20 45 NA NA
## 29 21 20 45 NA NA
## 30 7 20 45 NA NA
## 31 12 20 45 NA NA
## 32 Today 20 45 NA NA
## 33 14 20 45 NA NA
## 34 30 20 45 NA NA
## 35 30 20 45 NA NA
Pennsylvania Philadelphia, Pittsburgh, Allentown
getIndeedJobData5pages('massage therapist', 'Philadelphia','PA')
## Warning in getIndeedJobData5pages("massage therapist", "Philadelphia", "PA"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Philadelphia", "PA"):
## NAs introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Philadelphia", "PA"):
## NAs introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 4 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 5 Licensed Massage Therapist $250 Sign-On Bonus
## 6 Massage Therapist
## 7 Massage Therapist - Full Time
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist (LMT)
## 10 Licensed Massage Therapist (LMT)
## 11 Massage Therapist plus Healthcare! Phone interviews availabl...
## 12 Licensed Massage Therapist (FULL TIME OR PART TIME)
## 13 Licensed Massage Therapist
## 14 Massage Therapy Associate
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 19 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist $250 Sign-On Bonus
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist LMT
## 26 Licensed Massage Therapist (LMT)
## 27 Massage Therapist Sought for Mariano Holistic Life Center
## 28 MASSAGE THERAPIST
## 29 Massage Therapy Associate
## 30 Clinic seeking a Therapeutic (Medical) Massage Therapist
## 31 Licensed Massage Therapist
## 32 Massage Therapist plus Healthcare! Phone interviews availabl...
## 33 Massage Therapist - Full Time
## 34 Massage Therapist
## 35 Massage Therapist
## 36 Massage Therapist plus Healthcare! Phone interviews availabl...
## 37 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 38 Licensed Massage Therapist
## 39 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 40 Licensed Massage Therapist $250 Sign-On Bonus
## 41 Massage Therapist
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist (LMT)
## 47 Lead Massage Therapist
## 48 Massage Therapist
## 49 Licensed Massage Therapist (LMT)-Langhorne PA
## 50 Massage Therapist - Full Time
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Licensed Massage Therapist (LMT)
## 54 Program Specialist -Massage Therapist
## 55 Massage Therapist Hospice Volunteer - Train at Home Now, Hel...
## 56 Total Body Stretch Service Provider
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist for Busy Spa $$$Sign on Bonus$$$
## 60 Certified Massage Therapist
## 61 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 62 Licensed Massage Therapist $1500 Bonus
## 63 Massage Therapist - Independent Contractor
## 64 Licensed Massage Therapist (LMT) - Multiple locations
## 65 Licensed Massage Therapist-Part Time
## 66 Massage Therapist
## 67 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 68 Licensed Massage Therapist (LMT)
## 69 Program Specialist -Massage Therapist
## 70 Massage Therapist for Busy Spa $$$Sign on Bonus$$$
## 71 Massage Therapist Hospice Volunteer - Train at Home Now, Hel...
## 72 Total Body Stretch Service Provider
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist $1500 Bonus
## 76 Certified Massage Therapist
## 77 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 78 Massage Therapist - Independent Contractor
## 79 Licensed Massage Therapist-Part Time
## 80 Licensed Massage Therapist (LMT) - Multiple locations
## 81 Massage Therapist
## 82 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $40 an hour $20 - $40 20.0 40.00
## 2 \n$25 - $35 an hour $25 - $35 25.0 35.00
## 3 \n$20 - $22 an hour $20 - $22 20.0 22.00
## 4 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 5 \n$25 an hour $25 25.0 NA
## 6 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000.00
## 7 \n$40 - $45 an hour $40 - $45 40.0 45.00
## 8 \n$18 - $30 an hour $18 - $30 18.0 30.00
## 9 \n$50 - $65 an hour $50 - $65 50.0 65.00
## 10 \n$25 an hour $25 25.0 NA
## 11 \n$25 - $35 an hour $25 - $35 25.0 35.00
## 12 \n$20 - $22 an hour $20 - $22 20.0 22.00
## 13 \n$20 - $40 an hour $20 - $40 20.0 40.00
## 14 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 15 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000.00
## 16 \n$22.50 - $33.75 an hour $22.50 - $33.75 22.5 33.75
## 17 \n$33 - $47 an hour $33 - $47 33.0 47.00
## 18 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000.00
## 19 \n$25 an hour $25 25.0 NA
## 20 \n$25 - $35 an hour $25 - $35 25.0 35.00
## 21 \n$20 - $40 an hour $20 - $40 20.0 40.00
## 22 \n$20 - $22 an hour $20 - $22 20.0 22.00
## 23 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 24 \n$20,000 a year $20000 20000.0 NA
## 25 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000.00
## 26 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 27 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000.00
## 28 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000.00
## 29 \n$19 - $27 an hour $19 - $27 19.0 27.00
## 30 \n$34,000 - $39,000 a year $34000 - $39000 34000.0 39000.00
## 31 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000.00
## 32 \n$21 - $28 an hour $21 - $28 21.0 28.00
## 33 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000.00
## 34 \n$19 - $27 an hour $19 - $27 19.0 27.00
## 35 \n$34,000 - $39,000 a year $34000 - $39000 34000.0 39000.00
## 36 \n$21 - $28 an hour $21 - $28 21.0 28.00
## 37 \n$40,000 - $60,000 a year $40000 - $60000 40000.0 60000.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 35.5 11854.09 14819.53 18
## 2 25 35.5 11854.09 14819.53 18
## 3 25 35.5 11854.09 14819.53 18
## 4 25 35.5 11854.09 14819.53 18
## 5 25 35.5 11854.09 14819.53 18
## 6 25 35.5 11854.09 14819.53 18
## 7 25 35.5 11854.09 14819.53 18
## 8 25 35.5 11854.09 14819.53 18
## 9 25 35.5 11854.09 14819.53 18
## 10 25 35.5 11854.09 14819.53 18
## 11 25 35.5 11854.09 14819.53 18
## 12 25 35.5 11854.09 14819.53 18
## 13 25 35.5 11854.09 14819.53 18
## 14 25 35.5 11854.09 14819.53 18
## 15 25 35.5 11854.09 14819.53 18
## 16 25 35.5 11854.09 14819.53 18
## 17 25 35.5 11854.09 14819.53 18
## 18 25 35.5 11854.09 14819.53 18
## 19 25 35.5 11854.09 14819.53 18
## 20 25 35.5 11854.09 14819.53 18
## 21 25 35.5 11854.09 14819.53 18
## 22 25 35.5 11854.09 14819.53 18
## 23 25 35.5 11854.09 14819.53 18
## 24 25 35.5 11854.09 14819.53 18
## 25 25 35.5 11854.09 14819.53 18
## 26 25 35.5 11854.09 14819.53 18
## 27 25 35.5 11854.09 14819.53 18
## 28 25 35.5 11854.09 14819.53 18
## 29 25 35.5 11854.09 14819.53 18
## 30 25 35.5 11854.09 14819.53 18
## 31 25 35.5 11854.09 14819.53 18
## 32 25 35.5 11854.09 14819.53 18
## 33 25 35.5 11854.09 14819.53 18
## 34 25 35.5 11854.09 14819.53 18
## 35 25 35.5 11854.09 14819.53 18
## 36 25 35.5 11854.09 14819.53 18
## 37 25 35.5 11854.09 14819.53 18
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
## 31 60000
## 32 60000
## 33 60000
## 34 60000
## 35 60000
## 36 60000
## 37 60000
##
## [[3]]
## date_daysAgo
## 1 11
## 2 7
## 3 30
## 4 10
## 5 30
## 6 4
## 7 29
## 8 30
## 9 13
## 10 14
## 11 30
## 12 14
## 13 24
## 14 2
## 15 1
## 16 4
## 17 30
## 18 30
## 19 10
## 20 7
## 21 30
## 22 30
## 23 7
## 24 30
## 25 28
## 26 20
## 27 30
## 28 27
## 29 2
## 30 30
## 31 30
## 32 30
## 33 29
## 34 11
## 35 4
## 36 30
## 37 30
## 38 7
## 39 10
## 40 30
## 41 30
## 42 30
## 43 30
## 44 8
## 45 13
## 46 8
## 47 30
## 48 30
## 49 15
## 50 29
## 51 30
## 52 11
## 53 30
## 54 30
## 55 12
## 56 30
## 57 28
## 58 30
## 59 30
## 60 15
## 61 30
## 62 30
## 63 18
## 64 30
## 65 30
## 66 30
## 67 28
## 68 30
## 69 30
## 70 30
## 71 12
## 72 30
## 73 28
## 74 30
## 75 30
## 76 15
## 77 30
## 78 18
## 79 30
## 80 30
## 81 30
## 82 28
##
## [[4]]
## HiringAgency
## 1 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 2 Mellow Massage and YogaPhiladelphia, PA
## 3 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 4 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 5 Hand & Stone Massage and Facial Spa - Logan Square/Fairmount3.0Philadelphia, PA 19130 (Logan Square area)
## 6 Broomall Total Health CenterBroomall, PA 19008
## 7 Hand & Stone Massage and Facial Spa - Newtown (Bucks County)3.0Newtown, PA 18940
## 8 Passyunk ChiroPhiladelphia, PA 19102 (City Center West area)
## 9 Elements Massage3.6Horsham, PA 19044
## 10 McGlynn ChiropracticJamison, PA 18929
## 11 Hand and Stone Spa Center CityPhiladelphia, PA (Rittenhouse area)
## 12 Massage Envy3.2Jenkintown, PA 19046
## 13 Soothe3.7Philadelphia, PA
## 14 Philadelphia 76ers - HBSECamden, NJ 08103
## 15 Platoon FitnessBryn Mawr, PA 19010
## 16 Broomall Total Health CenterBroomall, PA 19008
## 17 Passyunk ChiroPhiladelphia, PA 19102 (City Center West area)
## 18 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 19 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 20 Mellow Massage and YogaPhiladelphia, PA
## 21 Hand & Stone Massage and Facial Spa - Logan Square/Fairmount3.0Philadelphia, PA 19130 (Logan Square area)
## 22 Elements3.6Horsham, PA 19044+1 location
## 23 FGG Spa, LLCPhiladelphia, PA 19093 (Cobbs Creek area)+4 locations
## 24 Life Time3.6Fort Washington, PA 19034
## 25 Hand & Stone - Blue Bell & Royersford3.0Blue Bell, PA 19422
## 26 Donna Skin & Body CarePhiladelphia, PA 19116 (Somerton area)
## 27 Mariano Holistic Life CenterMalvern, PA 19355
## 28 Elements Spa4.2Media, PA 19063
## 29 Philadelphia 76ers - HBSECamden, NJ 08103
## 30 Philly Injury DoctorsPhiladelphia, PA 19116 (Somerton area)
## 31 Spavia Day Spa3.3King of Prussia, PA 19406+1 location
## 32 Hand and Stone Spa Center CityPhiladelphia, PA (Rittenhouse area)
## 33 Hand & Stone Massage and Facial Spa - Newtown (Bucks County)3.0Newtown, PA 18940
## 34 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 35 Broomall Total Health CenterBroomall, PA 19008
## 36 Hand and Stone Spa Center CityPhiladelphia, PA (Rittenhouse area)
## 37 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 38 Mellow Massage and YogaPhiladelphia, PA
## 39 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 40 Hand & Stone Massage and Facial Spa - Logan Square/Fairmount3.0Philadelphia, PA 19130 (Logan Square area)
## 41 Massage Envy3.2Southampton, PA 18966+7 locations
## 42 Inline Spine Chiropractic, Rehabilitation and Mass...Phoenixville, PA 19460
## 43 Optimal Health CenterYardley, PA 19067
## 44 Neuromechanical Pain Management Associates5.0Levittown, PA 19054 (North Park area)
## 45 THOMPSON MEDICAL AND CHIROPRACTIC LLCMarlton, NJ 08053
## 46 Massage Envy3.2Chesterbrook, PA 19087
## 47 Hand and Stone3.0Blue Bell, PA 19422+1 location
## 48 Lincoln Tech3.5Moorestown, NJ 08057
## 49 Tucker Chiropractic CenterLanghorne, PA 19047
## 50 Hand & Stone Massage and Facial Spa - Newtown (Bucks County)3.0Newtown, PA 18940
## 51 Passyunk ChiroPhiladelphia, PA 19102 (City Center West area)
## 52 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 53 Spavia Day Spa - MoorestownMoorestown, NJ 08057
## 54 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 55 Holy Redeemer HomeCare and Hospice - the Greater C...Runnemede, NJ
## 56 Massage Envy3.2Ardmore, PA 19003+2 locations
## 57 Hand and Stone Massage and Facial Spa, Oaks/Phoeni...3.0Oaks, PA
## 58 Hand and Stone Spa-HainesportHainesport, NJ 08036
## 59 Hand and Stone Massage and Facial Spa3.0Marlton, NJ 08053
## 60 FGG Spa, LLCWilmington, DE 19803
## 61 Hand and Stone3.0Glassboro, NJ 08028
## 62 Hand and Stone3.0Delran, NJ 08075
## 63 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 64 Massage Envy3.2Ardmore, PA
## 65 Spa at Montchanin VillageWilmington, DE
## 66 Toppers Spa/Salon3.7Wayne, PA 19087
## 67 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 68 Spavia Day Spa - MoorestownMoorestown, NJ 08057
## 69 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 70 Hand and Stone Massage and Facial Spa3.0Marlton, NJ 08053
## 71 Holy Redeemer HomeCare and Hospice - the Greater C...Runnemede, NJ
## 72 Massage Envy3.2Ardmore, PA 19003+2 locations
## 73 Hand and Stone Massage and Facial Spa, Oaks/Phoeni...3.0Oaks, PA
## 74 Hand and Stone Spa-HainesportHainesport, NJ 08036
## 75 Hand and Stone3.0Delran, NJ 08075
## 76 FGG Spa, LLCWilmington, DE 19803
## 77 Hand and Stone3.0Glassboro, NJ 08028
## 78 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 79 Spa at Montchanin VillageWilmington, DE
## 80 Massage Envy3.2Ardmore, PA
## 81 Toppers Spa/Salon3.7Wayne, PA 19087
## 82 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 6 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 15 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 18 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 24 \n$20,000 a year $20000 20000 NA
## 25 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 27 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 28 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 30 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 31 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 33 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 35 \n$34,000 - $39,000 a year $34000 - $39000 34000 39000
## 37 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 6 40000 60000 36500 54363.64 20000
## 15 40000 60000 36500 54363.64 20000
## 18 40000 60000 36500 54363.64 20000
## 24 40000 60000 36500 54363.64 20000
## 25 40000 60000 36500 54363.64 20000
## 27 40000 60000 36500 54363.64 20000
## 28 40000 60000 36500 54363.64 20000
## 30 40000 60000 36500 54363.64 20000
## 31 40000 60000 36500 54363.64 20000
## 33 40000 60000 36500 54363.64 20000
## 35 40000 60000 36500 54363.64 20000
## 37 40000 60000 36500 54363.64 20000
## maximumMaxSalary
## 6 60000
## 15 60000
## 18 60000
## 24 60000
## 25 60000
## 27 60000
## 28 60000
## 30 60000
## 31 60000
## 33 60000
## 35 60000
## 37 60000
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $40 an hour $20 - $40 20.0 40.00
## 2 \n$25 - $35 an hour $25 - $35 25.0 35.00
## 3 \n$20 - $22 an hour $20 - $22 20.0 22.00
## 4 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 5 \n$25 an hour $25 25.0 NA
## 7 \n$40 - $45 an hour $40 - $45 40.0 45.00
## 8 \n$18 - $30 an hour $18 - $30 18.0 30.00
## 9 \n$50 - $65 an hour $50 - $65 50.0 65.00
## 10 \n$25 an hour $25 25.0 NA
## 11 \n$25 - $35 an hour $25 - $35 25.0 35.00
## 12 \n$20 - $22 an hour $20 - $22 20.0 22.00
## 13 \n$20 - $40 an hour $20 - $40 20.0 40.00
## 14 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 16 \n$22.50 - $33.75 an hour $22.50 - $33.75 22.5 33.75
## 17 \n$33 - $47 an hour $33 - $47 33.0 47.00
## 19 \n$25 an hour $25 25.0 NA
## 20 \n$25 - $35 an hour $25 - $35 25.0 35.00
## 21 \n$20 - $40 an hour $20 - $40 20.0 40.00
## 22 \n$20 - $22 an hour $20 - $22 20.0 22.00
## 23 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 26 \n$22 - $36 an hour $22 - $36 22.0 36.00
## 29 \n$19 - $27 an hour $19 - $27 19.0 27.00
## 32 \n$21 - $28 an hour $21 - $28 21.0 28.00
## 34 \n$19 - $27 an hour $19 - $27 19.0 27.00
## 36 \n$21 - $28 an hour $21 - $28 21.0 28.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22 35 24.06 34.80682 18
## 2 22 35 24.06 34.80682 18
## 3 22 35 24.06 34.80682 18
## 4 22 35 24.06 34.80682 18
## 5 22 35 24.06 34.80682 18
## 7 22 35 24.06 34.80682 18
## 8 22 35 24.06 34.80682 18
## 9 22 35 24.06 34.80682 18
## 10 22 35 24.06 34.80682 18
## 11 22 35 24.06 34.80682 18
## 12 22 35 24.06 34.80682 18
## 13 22 35 24.06 34.80682 18
## 14 22 35 24.06 34.80682 18
## 16 22 35 24.06 34.80682 18
## 17 22 35 24.06 34.80682 18
## 19 22 35 24.06 34.80682 18
## 20 22 35 24.06 34.80682 18
## 21 22 35 24.06 34.80682 18
## 22 22 35 24.06 34.80682 18
## 23 22 35 24.06 34.80682 18
## 26 22 35 24.06 34.80682 18
## 29 22 35 24.06 34.80682 18
## 32 22 35 24.06 34.80682 18
## 34 22 35 24.06 34.80682 18
## 36 22 35 24.06 34.80682 18
## maximumMaxSalary
## 1 65
## 2 65
## 3 65
## 4 65
## 5 65
## 7 65
## 8 65
## 9 65
## 10 65
## 11 65
## 12 65
## 13 65
## 14 65
## 16 65
## 17 65
## 19 65
## 20 65
## 21 65
## 22 65
## 23 65
## 26 65
## 29 65
## 32 65
## 34 65
## 36 65
##
## [[7]]
## city state
## 1 Philadelphia PA
## 2 Philadelphia PA
## 3 Philadelphia PA
## 4 Philadelphia PA
## 5 Philadelphia PA
## 6 Philadelphia PA
## 7 Philadelphia PA
## 8 Philadelphia PA
## 9 Philadelphia PA
## 10 Philadelphia PA
## 11 Philadelphia PA
## 12 Philadelphia PA
## 13 Philadelphia PA
## 14 Philadelphia PA
## 15 Philadelphia PA
## 16 Philadelphia PA
## 17 Philadelphia PA
## 18 Philadelphia PA
## 19 Philadelphia PA
## 20 Philadelphia PA
## 21 Philadelphia PA
## 22 Philadelphia PA
## 23 Philadelphia PA
## 24 Philadelphia PA
## 25 Philadelphia PA
## 26 Philadelphia PA
## 27 Philadelphia PA
## 28 Philadelphia PA
## 29 Philadelphia PA
## 30 Philadelphia PA
## 31 Philadelphia PA
## 32 Philadelphia PA
## 33 Philadelphia PA
## 34 Philadelphia PA
## 35 Philadelphia PA
## 36 Philadelphia PA
## 37 Philadelphia PA
## 38 Philadelphia PA
## 39 Philadelphia PA
## 40 Philadelphia PA
## 41 Philadelphia PA
## 42 Philadelphia PA
## 43 Philadelphia PA
## 44 Philadelphia PA
## 45 Philadelphia PA
## 46 Philadelphia PA
## 47 Philadelphia PA
## 48 Philadelphia PA
## 49 Philadelphia PA
## 50 Philadelphia PA
## 51 Philadelphia PA
## 52 Philadelphia PA
## 53 Philadelphia PA
## 54 Philadelphia PA
## 55 Philadelphia PA
## 56 Philadelphia PA
## 57 Philadelphia PA
## 58 Philadelphia PA
## 59 Philadelphia PA
## 60 Philadelphia PA
## 61 Philadelphia PA
## 62 Philadelphia PA
## 63 Philadelphia PA
## 64 Philadelphia PA
## 65 Philadelphia PA
## 66 Philadelphia PA
## 67 Philadelphia PA
## 68 Philadelphia PA
## 69 Philadelphia PA
## 70 Philadelphia PA
## 71 Philadelphia PA
## 72 Philadelphia PA
## 73 Philadelphia PA
## 74 Philadelphia PA
## 75 Philadelphia PA
## 76 Philadelphia PA
## 77 Philadelphia PA
## 78 Philadelphia PA
## 79 Philadelphia PA
## 80 Philadelphia PA
## 81 Philadelphia PA
## 82 Philadelphia PA
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 4 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 5 Licensed Massage Therapist $250 Sign-On Bonus
## 6 Massage Therapist
## 7 Massage Therapist - Full Time
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist (LMT)
## 10 Licensed Massage Therapist (LMT)
## 11 Massage Therapist plus Healthcare! Phone interviews availabl...
## 12 Licensed Massage Therapist (FULL TIME OR PART TIME)
## 13 Licensed Massage Therapist
## 14 Massage Therapy Associate
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 19 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist $250 Sign-On Bonus
## 22 Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist LMT
## 26 Licensed Massage Therapist (LMT)
## 27 Massage Therapist Sought for Mariano Holistic Life Center
## 28 MASSAGE THERAPIST
## 29 Massage Therapy Associate
## 30 Clinic seeking a Therapeutic (Medical) Massage Therapist
## 31 Licensed Massage Therapist
## 32 Massage Therapist plus Healthcare! Phone interviews availabl...
## 33 Massage Therapist - Full Time
## 34 Massage Therapist
## 35 Massage Therapist
## 36 Massage Therapist plus Healthcare! Phone interviews availabl...
## 37 Licensed Massage Therapist - South Philadelphia - $1,000 sig...
## 38 Licensed Massage Therapist
## 39 "Licensed Massage Therapist- (LMT) Hiring Bonus"
## 40 Licensed Massage Therapist $250 Sign-On Bonus
## 41 Massage Therapist
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist (LMT)
## 47 Lead Massage Therapist
## 48 Massage Therapist
## 49 Licensed Massage Therapist (LMT)-Langhorne PA
## 50 Massage Therapist - Full Time
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Licensed Massage Therapist (LMT)
## 54 Program Specialist -Massage Therapist
## 55 Massage Therapist Hospice Volunteer - Train at Home Now, Hel...
## 56 Total Body Stretch Service Provider
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist for Busy Spa $$$Sign on Bonus$$$
## 60 Certified Massage Therapist
## 61 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 62 Licensed Massage Therapist $1500 Bonus
## 63 Massage Therapist - Independent Contractor
## 64 Licensed Massage Therapist (LMT) - Multiple locations
## 65 Licensed Massage Therapist-Part Time
## 66 Massage Therapist
## 67 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## 68 Licensed Massage Therapist (LMT)
## 69 Program Specialist -Massage Therapist
## 70 Massage Therapist for Busy Spa $$$Sign on Bonus$$$
## 71 Massage Therapist Hospice Volunteer - Train at Home Now, Hel...
## 72 Total Body Stretch Service Provider
## 73 Licensed Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Therapist $1500 Bonus
## 76 Certified Massage Therapist
## 77 Part Time Licensed Massage Therapist NEW HIRE BONUS
## 78 Massage Therapist - Independent Contractor
## 79 Licensed Massage Therapist-Part Time
## 80 Licensed Massage Therapist (LMT) - Multiple locations
## 81 Massage Therapist
## 82 Salon & Spa Now Hiring. Hair Stylist,Massage therapist
## HiringAgency
## 1 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 2 Mellow Massage and YogaPhiladelphia, PA
## 3 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 4 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 5 Hand & Stone Massage and Facial Spa - Logan Square/Fairmount3.0Philadelphia, PA 19130 (Logan Square area)
## 6 Broomall Total Health CenterBroomall, PA 19008
## 7 Hand & Stone Massage and Facial Spa - Newtown (Bucks County)3.0Newtown, PA 18940
## 8 Passyunk ChiroPhiladelphia, PA 19102 (City Center West area)
## 9 Elements Massage3.6Horsham, PA 19044
## 10 McGlynn ChiropracticJamison, PA 18929
## 11 Hand and Stone Spa Center CityPhiladelphia, PA (Rittenhouse area)
## 12 Massage Envy3.2Jenkintown, PA 19046
## 13 Soothe3.7Philadelphia, PA
## 14 Philadelphia 76ers - HBSECamden, NJ 08103
## 15 Platoon FitnessBryn Mawr, PA 19010
## 16 Broomall Total Health CenterBroomall, PA 19008
## 17 Passyunk ChiroPhiladelphia, PA 19102 (City Center West area)
## 18 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 19 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 20 Mellow Massage and YogaPhiladelphia, PA
## 21 Hand & Stone Massage and Facial Spa - Logan Square/Fairmount3.0Philadelphia, PA 19130 (Logan Square area)
## 22 Elements3.6Horsham, PA 19044+1 location
## 23 FGG Spa, LLCPhiladelphia, PA 19093 (Cobbs Creek area)+4 locations
## 24 Life Time3.6Fort Washington, PA 19034
## 25 Hand & Stone - Blue Bell & Royersford3.0Blue Bell, PA 19422
## 26 Donna Skin & Body CarePhiladelphia, PA 19116 (Somerton area)
## 27 Mariano Holistic Life CenterMalvern, PA 19355
## 28 Elements Spa4.2Media, PA 19063
## 29 Philadelphia 76ers - HBSECamden, NJ 08103
## 30 Philly Injury DoctorsPhiladelphia, PA 19116 (Somerton area)
## 31 Spavia Day Spa3.3King of Prussia, PA 19406+1 location
## 32 Hand and Stone Spa Center CityPhiladelphia, PA (Rittenhouse area)
## 33 Hand & Stone Massage and Facial Spa - Newtown (Bucks County)3.0Newtown, PA 18940
## 34 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 35 Broomall Total Health CenterBroomall, PA 19008
## 36 Hand and Stone Spa Center CityPhiladelphia, PA (Rittenhouse area)
## 37 Hand and Stone - South Philadelphia3.0Philadelphia, PA 19147 (Riverfront area)
## 38 Mellow Massage and YogaPhiladelphia, PA
## 39 Hand and Stone Massage and Facial Spa-Brookhaven, PA3.0Brookhaven, PA 19015
## 40 Hand & Stone Massage and Facial Spa - Logan Square/Fairmount3.0Philadelphia, PA 19130 (Logan Square area)
## 41 Massage Envy3.2Southampton, PA 18966+7 locations
## 42 Inline Spine Chiropractic, Rehabilitation and Mass...Phoenixville, PA 19460
## 43 Optimal Health CenterYardley, PA 19067
## 44 Neuromechanical Pain Management Associates5.0Levittown, PA 19054 (North Park area)
## 45 THOMPSON MEDICAL AND CHIROPRACTIC LLCMarlton, NJ 08053
## 46 Massage Envy3.2Chesterbrook, PA 19087
## 47 Hand and Stone3.0Blue Bell, PA 19422+1 location
## 48 Lincoln Tech3.5Moorestown, NJ 08057
## 49 Tucker Chiropractic CenterLanghorne, PA 19047
## 50 Hand & Stone Massage and Facial Spa - Newtown (Bucks County)3.0Newtown, PA 18940
## 51 Passyunk ChiroPhiladelphia, PA 19102 (City Center West area)
## 52 Zarett Rehab & FitnessPhiladelphia, PA 19146 (Rittenhouse area)
## 53 Spavia Day Spa - MoorestownMoorestown, NJ 08057
## 54 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 55 Holy Redeemer HomeCare and Hospice - the Greater C...Runnemede, NJ
## 56 Massage Envy3.2Ardmore, PA 19003+2 locations
## 57 Hand and Stone Massage and Facial Spa, Oaks/Phoeni...3.0Oaks, PA
## 58 Hand and Stone Spa-HainesportHainesport, NJ 08036
## 59 Hand and Stone Massage and Facial Spa3.0Marlton, NJ 08053
## 60 FGG Spa, LLCWilmington, DE 19803
## 61 Hand and Stone3.0Glassboro, NJ 08028
## 62 Hand and Stone3.0Delran, NJ 08075
## 63 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 64 Massage Envy3.2Ardmore, PA
## 65 Spa at Montchanin VillageWilmington, DE
## 66 Toppers Spa/Salon3.7Wayne, PA 19087
## 67 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## 68 Spavia Day Spa - MoorestownMoorestown, NJ 08057
## 69 YMCA of Delaware4.0Wilmington, DE 19801 (Downtown area)
## 70 Hand and Stone Massage and Facial Spa3.0Marlton, NJ 08053
## 71 Holy Redeemer HomeCare and Hospice - the Greater C...Runnemede, NJ
## 72 Massage Envy3.2Ardmore, PA 19003+2 locations
## 73 Hand and Stone Massage and Facial Spa, Oaks/Phoeni...3.0Oaks, PA
## 74 Hand and Stone Spa-HainesportHainesport, NJ 08036
## 75 Hand and Stone3.0Delran, NJ 08075
## 76 FGG Spa, LLCWilmington, DE 19803
## 77 Hand and Stone3.0Glassboro, NJ 08028
## 78 Studio One Eleven day spa/hair studio for menWilmington, DE 19801 (Midtown Brandywine area)
## 79 Spa at Montchanin VillageWilmington, DE
## 80 Massage Envy3.2Ardmore, PA
## 81 Toppers Spa/Salon3.7Wayne, PA 19087
## 82 Cielo Salon & SpaWilmington, DE 19801 (Midtown Brandywine area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 11 18 65 20000 60000
## 2 7 18 65 20000 60000
## 3 30 18 65 20000 60000
## 4 10 18 65 20000 60000
## 5 30 18 65 20000 60000
## 6 4 18 65 20000 60000
## 7 29 18 65 20000 60000
## 8 30 18 65 20000 60000
## 9 13 18 65 20000 60000
## 10 14 18 65 20000 60000
## 11 30 18 65 20000 60000
## 12 14 18 65 20000 60000
## 13 24 18 65 20000 60000
## 14 2 18 65 20000 60000
## 15 1 18 65 20000 60000
## 16 4 18 65 20000 60000
## 17 30 18 65 20000 60000
## 18 30 18 65 20000 60000
## 19 10 18 65 20000 60000
## 20 7 18 65 20000 60000
## 21 30 18 65 20000 60000
## 22 30 18 65 20000 60000
## 23 7 18 65 20000 60000
## 24 30 18 65 20000 60000
## 25 28 18 65 20000 60000
## 26 20 18 65 20000 60000
## 27 30 18 65 20000 60000
## 28 27 18 65 20000 60000
## 29 2 18 65 20000 60000
## 30 30 18 65 20000 60000
## 31 30 18 65 20000 60000
## 32 30 18 65 20000 60000
## 33 29 18 65 20000 60000
## 34 11 18 65 20000 60000
## 35 4 18 65 20000 60000
## 36 30 18 65 20000 60000
## 37 30 18 65 20000 60000
## 38 7 18 65 20000 60000
## 39 10 18 65 20000 60000
## 40 30 18 65 20000 60000
## 41 30 18 65 20000 60000
## 42 30 18 65 20000 60000
## 43 30 18 65 20000 60000
## 44 8 18 65 20000 60000
## 45 13 18 65 20000 60000
## 46 8 18 65 20000 60000
## 47 30 18 65 20000 60000
## 48 30 18 65 20000 60000
## 49 15 18 65 20000 60000
## 50 29 18 65 20000 60000
## 51 30 18 65 20000 60000
## 52 11 18 65 20000 60000
## 53 30 18 65 20000 60000
## 54 30 18 65 20000 60000
## 55 12 18 65 20000 60000
## 56 30 18 65 20000 60000
## 57 28 18 65 20000 60000
## 58 30 18 65 20000 60000
## 59 30 18 65 20000 60000
## 60 15 18 65 20000 60000
## 61 30 18 65 20000 60000
## 62 30 18 65 20000 60000
## 63 18 18 65 20000 60000
## 64 30 18 65 20000 60000
## 65 30 18 65 20000 60000
## 66 30 18 65 20000 60000
## 67 28 18 65 20000 60000
## 68 30 18 65 20000 60000
## 69 30 18 65 20000 60000
## 70 30 18 65 20000 60000
## 71 12 18 65 20000 60000
## 72 30 18 65 20000 60000
## 73 28 18 65 20000 60000
## 74 30 18 65 20000 60000
## 75 30 18 65 20000 60000
## 76 15 18 65 20000 60000
## 77 30 18 65 20000 60000
## 78 18 18 65 20000 60000
## 79 30 18 65 20000 60000
## 80 30 18 65 20000 60000
## 81 30 18 65 20000 60000
## 82 28 18 65 20000 60000
getIndeedJobData5pages('massage therapist', 'Pittsburgh','PA')
## Warning in getIndeedJobData5pages("massage therapist", "Pittsburgh", "PA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Pittsburgh", "PA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist -McCandless, Monroeville or Robinson
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Wellness professionals - massage therapist, acupuncturist, y...
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist For Busy Chiropractic Office
## 13 Licensed Massage Therapist
## 14 Full Time/Part Time Licensed Massage Therapist
## 15 Massage Therapist - PT or FT, Vacation, be part of a GREAT t...
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist (LMT)
## 20 Massage Therapist - PT or FT, Vacation, be part of a GREAT t...
## 21 Full Time/Part Time Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist Full and Part time
## 25 Lead Massage Therapist
## 26 Total Body Stretch Service Provider
## 27 Massage Therapist -McCandless, Monroeville or Robinson
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist For Busy Chiropractic Office
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist
## 39 Mobile Massage Therapist
## 40 Licensed Massage Therapist/LMT
## 41 Licensed Massage Therapist (LMT)
## 42 Salon Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapist Full and Part time
## 45 Lead Massage Therapist
## 46 Total Body Stretch Service Provider
## 47 Licensed Massage Therapist For Busy Chiropractic Office
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist
## 54 Mobile Massage Therapist
## 55 Licensed Massage Therapist/LMT
## 56 Licensed Massage Therapist (LMT)
## 57 Salon Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist Full and Part time
## 60 Lead Massage Therapist
## 61 Total Body Stretch Service Provider
## 62 Licensed Massage Therapist For Busy Chiropractic Office
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Mobile Massage Therapist
## 70 Licensed Massage Therapist/LMT
## 71 Licensed Massage Therapist (LMT)
## 72 Salon Massage Therapist
## 73 Licensed Massage Therapist
## 74 Massage Therapist Full and Part time
## 75 Lead Massage Therapist
## 76 Total Body Stretch Service Provider
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30 - $50 an hour $30 - $50 30 50
## 2 \n$20 - $38 an hour $20 - $38 20 38
## 3 \n$20 - $38 an hour $20 - $38 20 38
## 4 \n$35 - $50 an hour $35 - $50 35 50
## 5 \n$45 - $65 an hour $45 - $65 45 65
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \nUp to $25 an hour $25 25 NA
## 8 \n$30 an hour $30 30 NA
## 9 \n$25 - $30 an hour $25 - $30 25 30
## 10 \n$20 - $35 an hour $20 - $35 20 35
## 11 \n$20 - $38 an hour $20 - $38 20 38
## 12 \n$45 - $65 an hour $45 - $65 45 65
## 13 \n$30 - $50 an hour $30 - $50 30 50
## 14 \n$20 - $35 an hour $20 - $35 20 35
## 15 \n$35 - $50 an hour $35 - $50 35 50
## 16 \n$20 - $38 an hour $20 - $38 20 38
## 17 \n$20 an hour $20 20 NA
## 18 \n$30 an hour $30 30 NA
## 19 \n$25 - $30 an hour $25 - $30 25 30
## 20 \n$20 - $50 an hour $20 - $50 20 50
## 21 \n$45 - $70 an hour $45 - $70 45 70
## 22 \n$20 - $25 an hour $20 - $25 20 25
## 23 \n$25 - $35 an hour $25 - $35 25 35
## 24 \n$30 an hour $30 30 NA
## 25 \n$25 - $30 an hour $25 - $30 25 30
## 26 \n$20 - $50 an hour $20 - $50 20 50
## 27 \n$45 - $70 an hour $45 - $70 45 70
## 28 \n$20 - $25 an hour $20 - $25 20 25
## 29 \n$25 - $35 an hour $25 - $35 25 35
## 30 \n$30 an hour $30 30 NA
## 31 \n$25 - $30 an hour $25 - $30 25 30
## 32 \n$20 - $50 an hour $20 - $50 20 50
## 33 \n$45 - $70 an hour $45 - $70 45 70
## 34 \n$20 - $25 an hour $20 - $25 20 25
## 35 \n$25 - $35 an hour $25 - $35 25 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 30 169.5714 299.1719 20
## 2 25 30 169.5714 299.1719 20
## 3 25 30 169.5714 299.1719 20
## 4 25 30 169.5714 299.1719 20
## 5 25 30 169.5714 299.1719 20
## 6 25 30 169.5714 299.1719 20
## 7 25 30 169.5714 299.1719 20
## 8 25 30 169.5714 299.1719 20
## 9 25 30 169.5714 299.1719 20
## 10 25 30 169.5714 299.1719 20
## 11 25 30 169.5714 299.1719 20
## 12 25 30 169.5714 299.1719 20
## 13 25 30 169.5714 299.1719 20
## 14 25 30 169.5714 299.1719 20
## 15 25 30 169.5714 299.1719 20
## 16 25 30 169.5714 299.1719 20
## 17 25 30 169.5714 299.1719 20
## 18 25 30 169.5714 299.1719 20
## 19 25 30 169.5714 299.1719 20
## 20 25 30 169.5714 299.1719 20
## 21 25 30 169.5714 299.1719 20
## 22 25 30 169.5714 299.1719 20
## 23 25 30 169.5714 299.1719 20
## 24 25 30 169.5714 299.1719 20
## 25 25 30 169.5714 299.1719 20
## 26 25 30 169.5714 299.1719 20
## 27 25 30 169.5714 299.1719 20
## 28 25 30 169.5714 299.1719 20
## 29 25 30 169.5714 299.1719 20
## 30 25 30 169.5714 299.1719 20
## 31 25 30 169.5714 299.1719 20
## 32 25 30 169.5714 299.1719 20
## 33 25 30 169.5714 299.1719 20
## 34 25 30 169.5714 299.1719 20
## 35 25 30 169.5714 299.1719 20
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
## 34 12000
## 35 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 30
## 4 30
## 5 30
## 6 13
## 7 16
## 8 5
## 9 30
## 10 Today
## 11 13
## 12 25
## 13 30
## 14 30
## 15 30
## 16 30
## 17 13
## 18 16
## 19 30
## 20 30
## 21 30
## 22 30
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 30
## 29 24
## 30 12
## 31 7
## 32 25
## 33 30
## 34 7
## 35 30
## 36 10
## 37 30
## 38 12
## 39 30
## 40 30
## 41 27
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 25
## 48 30
## 49 7
## 50 30
## 51 10
## 52 30
## 53 12
## 54 30
## 55 30
## 56 27
## 57 30
## 58 30
## 59 30
## 60 30
## 61 30
## 62 25
## 63 30
## 64 7
## 65 30
## 66 10
## 67 30
## 68 12
## 69 30
## 70 30
## 71 27
## 72 30
## 73 30
## 74 30
## 75 30
## 76 30
##
## [[4]]
## HiringAgency
## 1 Massage Envy3.2Pittsburgh, PA
## 2 Massage Envy - Greensburg3.2Gibsonia, PA
## 3 The Body Bar Fitness & SpaPittsburgh, PA 15237
## 4 The Body Bar Massage & TanningCranberry Township, PA 16066
## 5 Massage Envy - Greensburg3.2Greensburg, PA 15601
## 6 Spa 54Robinson Township, PA
## 7 Hampton Holistic CenterPittsburgh, PA 15237
## 8 Indo-Pak Massage TherapyPittsburgh, PA•Remote work available
## 9 WPIWSwissvale, PA
## 10 Massage Envy3.2Bethel Park, PA 15102+5 locations
## 11 GRE Massage TherapyOakmont, PA 15139
## 12 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 13 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 14 Hand & Stone Massage and Facial Spa3.0Pittsburgh, PA 15222 (Central Business District area)
## 15 LaVida Massage3.7Pittsburgh, PA 15232 (Shadyside area)
## 16 The Body Bar Massage & TanningCranberry Township, PA 16066
## 17 Spa 54Robinson Township, PA
## 18 Hampton Holistic CenterPittsburgh, PA 15237
## 19 Massage Envy - Greensburg3.2Gibsonia, PA
## 20 LaVida Massage3.7Pittsburgh, PA 15232 (Shadyside area)
## 21 Hand & Stone Massage and Facial Spa3.0Pittsburgh, PA 15222 (Central Business District area)
## 22 Massage Envy - Greensburg3.2Greensburg, PA 15601
## 23 The Body Bar Fitness & SpaPittsburgh, PA 15237
## 24 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 25 Massage Envy3.2Wexford, PA 15090
## 26 Massage Envy3.2McMurray, PA 15317
## 27 Massage Envy3.2Pittsburgh, PA
## 28 Element Day SpaTownship of Moon, PA 15108
## 29 Soothe3.7Pittsburgh, PA
## 30 Atrium Staffing3.8Monroe, PA
## 31 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 32 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 33 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 34 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 35 Vita MassagePittsburgh, PA 15218
## 36 Hand & Stone - Downtown PittsburghPittsburgh, PA 15222 (Strip District area)
## 37 Sage Organic SpaPittsburgh, PA 15241
## 38 Onyx WellnessLeechburg, PA 15656
## 39 Indo-Pak Massage TherapyPittsburgh, PA
## 40 Frazetta Family ChiropracticSpringdale, PA 15144
## 41 Massage Envy Spa3.2Mount Lebanon, PA+1 location
## 42 JCPenney3.7Pittsburgh, PA 15237
## 43 Serene Hair Studio and SpaMars, PA 16046
## 44 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 45 Massage Envy3.2Wexford, PA 15090
## 46 Massage Envy3.2McMurray, PA 15317
## 47 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 48 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 49 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 50 Vita MassagePittsburgh, PA 15218
## 51 Hand & Stone - Downtown PittsburghPittsburgh, PA 15222 (Strip District area)
## 52 Sage Organic SpaPittsburgh, PA 15241
## 53 Onyx WellnessLeechburg, PA 15656
## 54 Indo-Pak Massage TherapyPittsburgh, PA
## 55 Frazetta Family ChiropracticSpringdale, PA 15144
## 56 Massage Envy Spa3.2Mount Lebanon, PA+1 location
## 57 JCPenney3.7Pittsburgh, PA 15237
## 58 Serene Hair Studio and SpaMars, PA 16046
## 59 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 60 Massage Envy3.2Wexford, PA 15090
## 61 Massage Envy3.2McMurray, PA 15317
## 62 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 63 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 64 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 65 Vita MassagePittsburgh, PA 15218
## 66 Hand & Stone - Downtown PittsburghPittsburgh, PA 15222 (Strip District area)
## 67 Sage Organic SpaPittsburgh, PA 15241
## 68 Onyx WellnessLeechburg, PA 15656
## 69 Indo-Pak Massage TherapyPittsburgh, PA
## 70 Frazetta Family ChiropracticSpringdale, PA 15144
## 71 Massage Envy Spa3.2Mount Lebanon, PA+1 location
## 72 JCPenney3.7Pittsburgh, PA 15237
## 73 Serene Hair Studio and SpaMars, PA 16046
## 74 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 75 Massage Envy3.2Wexford, PA 15090
## 76 Massage Envy3.2McMurray, PA 15317
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 - $50 an hour $30 - $50 30 50 25
## 2 \n$20 - $38 an hour $20 - $38 20 38 25
## 3 \n$20 - $38 an hour $20 - $38 20 38 25
## 4 \n$35 - $50 an hour $35 - $50 35 50 25
## 5 \n$45 - $65 an hour $45 - $65 45 65 25
## 7 \nUp to $25 an hour $25 25 NA 25
## 8 \n$30 an hour $30 30 NA 25
## 9 \n$25 - $30 an hour $25 - $30 25 30 25
## 10 \n$20 - $35 an hour $20 - $35 20 35 25
## 11 \n$20 - $38 an hour $20 - $38 20 38 25
## 12 \n$45 - $65 an hour $45 - $65 45 65 25
## 13 \n$30 - $50 an hour $30 - $50 30 50 25
## 14 \n$20 - $35 an hour $20 - $35 20 35 25
## 15 \n$35 - $50 an hour $35 - $50 35 50 25
## 16 \n$20 - $38 an hour $20 - $38 20 38 25
## 17 \n$20 an hour $20 20 NA 25
## 18 \n$30 an hour $30 30 NA 25
## 19 \n$25 - $30 an hour $25 - $30 25 30 25
## 20 \n$20 - $50 an hour $20 - $50 20 50 25
## 21 \n$45 - $70 an hour $45 - $70 45 70 25
## 22 \n$20 - $25 an hour $20 - $25 20 25 25
## 23 \n$25 - $35 an hour $25 - $35 25 35 25
## 24 \n$30 an hour $30 30 NA 25
## 25 \n$25 - $30 an hour $25 - $30 25 30 25
## 26 \n$20 - $50 an hour $20 - $50 20 50 25
## 27 \n$45 - $70 an hour $45 - $70 45 70 25
## 28 \n$20 - $25 an hour $20 - $25 20 25 25
## 29 \n$25 - $35 an hour $25 - $35 25 35 25
## 30 \n$30 an hour $30 30 NA 25
## 31 \n$25 - $30 an hour $25 - $30 25 30 25
## 32 \n$20 - $50 an hour $20 - $50 20 50 25
## 33 \n$45 - $70 an hour $45 - $70 45 70 25
## 34 \n$20 - $25 an hour $20 - $25 20 25 25
## 35 \n$25 - $35 an hour $25 - $35 25 35 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 38 27.5 43.28571 20 70
## 2 38 27.5 43.28571 20 70
## 3 38 27.5 43.28571 20 70
## 4 38 27.5 43.28571 20 70
## 5 38 27.5 43.28571 20 70
## 7 38 27.5 43.28571 20 70
## 8 38 27.5 43.28571 20 70
## 9 38 27.5 43.28571 20 70
## 10 38 27.5 43.28571 20 70
## 11 38 27.5 43.28571 20 70
## 12 38 27.5 43.28571 20 70
## 13 38 27.5 43.28571 20 70
## 14 38 27.5 43.28571 20 70
## 15 38 27.5 43.28571 20 70
## 16 38 27.5 43.28571 20 70
## 17 38 27.5 43.28571 20 70
## 18 38 27.5 43.28571 20 70
## 19 38 27.5 43.28571 20 70
## 20 38 27.5 43.28571 20 70
## 21 38 27.5 43.28571 20 70
## 22 38 27.5 43.28571 20 70
## 23 38 27.5 43.28571 20 70
## 24 38 27.5 43.28571 20 70
## 25 38 27.5 43.28571 20 70
## 26 38 27.5 43.28571 20 70
## 27 38 27.5 43.28571 20 70
## 28 38 27.5 43.28571 20 70
## 29 38 27.5 43.28571 20 70
## 30 38 27.5 43.28571 20 70
## 31 38 27.5 43.28571 20 70
## 32 38 27.5 43.28571 20 70
## 33 38 27.5 43.28571 20 70
## 34 38 27.5 43.28571 20 70
## 35 38 27.5 43.28571 20 70
##
## [[7]]
## city state
## 1 Pittsburgh PA
## 2 Pittsburgh PA
## 3 Pittsburgh PA
## 4 Pittsburgh PA
## 5 Pittsburgh PA
## 6 Pittsburgh PA
## 7 Pittsburgh PA
## 8 Pittsburgh PA
## 9 Pittsburgh PA
## 10 Pittsburgh PA
## 11 Pittsburgh PA
## 12 Pittsburgh PA
## 13 Pittsburgh PA
## 14 Pittsburgh PA
## 15 Pittsburgh PA
## 16 Pittsburgh PA
## 17 Pittsburgh PA
## 18 Pittsburgh PA
## 19 Pittsburgh PA
## 20 Pittsburgh PA
## 21 Pittsburgh PA
## 22 Pittsburgh PA
## 23 Pittsburgh PA
## 24 Pittsburgh PA
## 25 Pittsburgh PA
## 26 Pittsburgh PA
## 27 Pittsburgh PA
## 28 Pittsburgh PA
## 29 Pittsburgh PA
## 30 Pittsburgh PA
## 31 Pittsburgh PA
## 32 Pittsburgh PA
## 33 Pittsburgh PA
## 34 Pittsburgh PA
## 35 Pittsburgh PA
## 36 Pittsburgh PA
## 37 Pittsburgh PA
## 38 Pittsburgh PA
## 39 Pittsburgh PA
## 40 Pittsburgh PA
## 41 Pittsburgh PA
## 42 Pittsburgh PA
## 43 Pittsburgh PA
## 44 Pittsburgh PA
## 45 Pittsburgh PA
## 46 Pittsburgh PA
## 47 Pittsburgh PA
## 48 Pittsburgh PA
## 49 Pittsburgh PA
## 50 Pittsburgh PA
## 51 Pittsburgh PA
## 52 Pittsburgh PA
## 53 Pittsburgh PA
## 54 Pittsburgh PA
## 55 Pittsburgh PA
## 56 Pittsburgh PA
## 57 Pittsburgh PA
## 58 Pittsburgh PA
## 59 Pittsburgh PA
## 60 Pittsburgh PA
## 61 Pittsburgh PA
## 62 Pittsburgh PA
## 63 Pittsburgh PA
## 64 Pittsburgh PA
## 65 Pittsburgh PA
## 66 Pittsburgh PA
## 67 Pittsburgh PA
## 68 Pittsburgh PA
## 69 Pittsburgh PA
## 70 Pittsburgh PA
## 71 Pittsburgh PA
## 72 Pittsburgh PA
## 73 Pittsburgh PA
## 74 Pittsburgh PA
## 75 Pittsburgh PA
## 76 Pittsburgh PA
## jobTitle
## 1 Massage Therapist -McCandless, Monroeville or Robinson
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist - Independent Contractor
## 9 Wellness professionals - massage therapist, acupuncturist, y...
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist For Busy Chiropractic Office
## 13 Licensed Massage Therapist
## 14 Full Time/Part Time Licensed Massage Therapist
## 15 Massage Therapist - PT or FT, Vacation, be part of a GREAT t...
## 16 Licensed Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist (LMT)
## 20 Massage Therapist - PT or FT, Vacation, be part of a GREAT t...
## 21 Full Time/Part Time Licensed Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Massage Therapist Full and Part time
## 25 Lead Massage Therapist
## 26 Total Body Stretch Service Provider
## 27 Massage Therapist -McCandless, Monroeville or Robinson
## 28 Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist For Busy Chiropractic Office
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist
## 39 Mobile Massage Therapist
## 40 Licensed Massage Therapist/LMT
## 41 Licensed Massage Therapist (LMT)
## 42 Salon Massage Therapist
## 43 Licensed Massage Therapist
## 44 Massage Therapist Full and Part time
## 45 Lead Massage Therapist
## 46 Total Body Stretch Service Provider
## 47 Licensed Massage Therapist For Busy Chiropractic Office
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist
## 54 Mobile Massage Therapist
## 55 Licensed Massage Therapist/LMT
## 56 Licensed Massage Therapist (LMT)
## 57 Salon Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist Full and Part time
## 60 Lead Massage Therapist
## 61 Total Body Stretch Service Provider
## 62 Licensed Massage Therapist For Busy Chiropractic Office
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Mobile Massage Therapist
## 70 Licensed Massage Therapist/LMT
## 71 Licensed Massage Therapist (LMT)
## 72 Salon Massage Therapist
## 73 Licensed Massage Therapist
## 74 Massage Therapist Full and Part time
## 75 Lead Massage Therapist
## 76 Total Body Stretch Service Provider
## HiringAgency
## 1 Massage Envy3.2Pittsburgh, PA
## 2 Massage Envy - Greensburg3.2Gibsonia, PA
## 3 The Body Bar Fitness & SpaPittsburgh, PA 15237
## 4 The Body Bar Massage & TanningCranberry Township, PA 16066
## 5 Massage Envy - Greensburg3.2Greensburg, PA 15601
## 6 Spa 54Robinson Township, PA
## 7 Hampton Holistic CenterPittsburgh, PA 15237
## 8 Indo-Pak Massage TherapyPittsburgh, PA•Remote work available
## 9 WPIWSwissvale, PA
## 10 Massage Envy3.2Bethel Park, PA 15102+5 locations
## 11 GRE Massage TherapyOakmont, PA 15139
## 12 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 13 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 14 Hand & Stone Massage and Facial Spa3.0Pittsburgh, PA 15222 (Central Business District area)
## 15 LaVida Massage3.7Pittsburgh, PA 15232 (Shadyside area)
## 16 The Body Bar Massage & TanningCranberry Township, PA 16066
## 17 Spa 54Robinson Township, PA
## 18 Hampton Holistic CenterPittsburgh, PA 15237
## 19 Massage Envy - Greensburg3.2Gibsonia, PA
## 20 LaVida Massage3.7Pittsburgh, PA 15232 (Shadyside area)
## 21 Hand & Stone Massage and Facial Spa3.0Pittsburgh, PA 15222 (Central Business District area)
## 22 Massage Envy - Greensburg3.2Greensburg, PA 15601
## 23 The Body Bar Fitness & SpaPittsburgh, PA 15237
## 24 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 25 Massage Envy3.2Wexford, PA 15090
## 26 Massage Envy3.2McMurray, PA 15317
## 27 Massage Envy3.2Pittsburgh, PA
## 28 Element Day SpaTownship of Moon, PA 15108
## 29 Soothe3.7Pittsburgh, PA
## 30 Atrium Staffing3.8Monroe, PA
## 31 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 32 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 33 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 34 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 35 Vita MassagePittsburgh, PA 15218
## 36 Hand & Stone - Downtown PittsburghPittsburgh, PA 15222 (Strip District area)
## 37 Sage Organic SpaPittsburgh, PA 15241
## 38 Onyx WellnessLeechburg, PA 15656
## 39 Indo-Pak Massage TherapyPittsburgh, PA
## 40 Frazetta Family ChiropracticSpringdale, PA 15144
## 41 Massage Envy Spa3.2Mount Lebanon, PA+1 location
## 42 JCPenney3.7Pittsburgh, PA 15237
## 43 Serene Hair Studio and SpaMars, PA 16046
## 44 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 45 Massage Envy3.2Wexford, PA 15090
## 46 Massage Envy3.2McMurray, PA 15317
## 47 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 48 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 49 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 50 Vita MassagePittsburgh, PA 15218
## 51 Hand & Stone - Downtown PittsburghPittsburgh, PA 15222 (Strip District area)
## 52 Sage Organic SpaPittsburgh, PA 15241
## 53 Onyx WellnessLeechburg, PA 15656
## 54 Indo-Pak Massage TherapyPittsburgh, PA
## 55 Frazetta Family ChiropracticSpringdale, PA 15144
## 56 Massage Envy Spa3.2Mount Lebanon, PA+1 location
## 57 JCPenney3.7Pittsburgh, PA 15237
## 58 Serene Hair Studio and SpaMars, PA 16046
## 59 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 60 Massage Envy3.2Wexford, PA 15090
## 61 Massage Envy3.2McMurray, PA 15317
## 62 Leefer Chiropractic Life CenterPittsburgh, PA 15236
## 63 Excel Chiropractic and RehabilitationPittsburgh, PA 15205
## 64 Hand and Stone Spa3.0Pittsburgh, PA 15289
## 65 Vita MassagePittsburgh, PA 15218
## 66 Hand & Stone - Downtown PittsburghPittsburgh, PA 15222 (Strip District area)
## 67 Sage Organic SpaPittsburgh, PA 15241
## 68 Onyx WellnessLeechburg, PA 15656
## 69 Indo-Pak Massage TherapyPittsburgh, PA
## 70 Frazetta Family ChiropracticSpringdale, PA 15144
## 71 Massage Envy Spa3.2Mount Lebanon, PA+1 location
## 72 JCPenney3.7Pittsburgh, PA 15237
## 73 Serene Hair Studio and SpaMars, PA 16046
## 74 Massage Envy3.2Pittsburgh, PA 15217 (Squirrel Hill South area)
## 75 Massage Envy3.2Wexford, PA 15090
## 76 Massage Envy3.2McMurray, PA 15317
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 20 70 NA NA
## 2 30 20 70 NA NA
## 3 30 20 70 NA NA
## 4 30 20 70 NA NA
## 5 30 20 70 NA NA
## 6 13 20 70 NA NA
## 7 16 20 70 NA NA
## 8 5 20 70 NA NA
## 9 30 20 70 NA NA
## 10 Today 20 70 NA NA
## 11 13 20 70 NA NA
## 12 25 20 70 NA NA
## 13 30 20 70 NA NA
## 14 30 20 70 NA NA
## 15 30 20 70 NA NA
## 16 30 20 70 NA NA
## 17 13 20 70 NA NA
## 18 16 20 70 NA NA
## 19 30 20 70 NA NA
## 20 30 20 70 NA NA
## 21 30 20 70 NA NA
## 22 30 20 70 NA NA
## 23 30 20 70 NA NA
## 24 30 20 70 NA NA
## 25 30 20 70 NA NA
## 26 30 20 70 NA NA
## 27 30 20 70 NA NA
## 28 30 20 70 NA NA
## 29 24 20 70 NA NA
## 30 12 20 70 NA NA
## 31 7 20 70 NA NA
## 32 25 20 70 NA NA
## 33 30 20 70 NA NA
## 34 7 20 70 NA NA
## 35 30 20 70 NA NA
## 36 10 20 70 NA NA
## 37 30 20 70 NA NA
## 38 12 20 70 NA NA
## 39 30 20 70 NA NA
## 40 30 20 70 NA NA
## 41 27 20 70 NA NA
## 42 30 20 70 NA NA
## 43 30 20 70 NA NA
## 44 30 20 70 NA NA
## 45 30 20 70 NA NA
## 46 30 20 70 NA NA
## 47 25 20 70 NA NA
## 48 30 20 70 NA NA
## 49 7 20 70 NA NA
## 50 30 20 70 NA NA
## 51 10 20 70 NA NA
## 52 30 20 70 NA NA
## 53 12 20 70 NA NA
## 54 30 20 70 NA NA
## 55 30 20 70 NA NA
## 56 27 20 70 NA NA
## 57 30 20 70 NA NA
## 58 30 20 70 NA NA
## 59 30 20 70 NA NA
## 60 30 20 70 NA NA
## 61 30 20 70 NA NA
## 62 25 20 70 NA NA
## 63 30 20 70 NA NA
## 64 7 20 70 NA NA
## 65 30 20 70 NA NA
## 66 10 20 70 NA NA
## 67 30 20 70 NA NA
## 68 12 20 70 NA NA
## 69 30 20 70 NA NA
## 70 30 20 70 NA NA
## 71 27 20 70 NA NA
## 72 30 20 70 NA NA
## 73 30 20 70 NA NA
## 74 30 20 70 NA NA
## 75 30 20 70 NA NA
## 76 30 20 70 NA NA
getIndeedJobData5pages('massage therapist', 'Allentown','PA')
## Warning in getIndeedJobData5pages("massage therapist", "Allentown", "PA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Allentown", "PA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Allentown", "PA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist $500 Bonus
## 4 Licensed Massage Therapist- Chiropractic Office
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Massage Therapist
## 12 Licensed Massage Therapist (LMT)
## 13 Part Time Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 Massage Therapist
## 17 Licensed Massage Therapist- Chiropractic Office
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist
## 24 Licensed Massage Therapist (LMT)
## 25 Part Time Licensed Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist $500 Bonus
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Massage Therapist $500 Bonus
## 32 Licensed Massage Therapist (LMT)
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Licensed Massage Therapist (LMT)
## 37 Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Part Time Licensed Massage Therapist
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist- Chiropractic Office
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist (LMT)
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist- Chiropractic Office
## 47 Massage Therapist
## 48 Massage Therapist $500 Bonus
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Licensed Massage Therapist- $500 Sign On Bonus for July & Au...
## 54 Licensed Massage Therapist (LMT)
## 55 Massage Therapist
## 56 Licensed Massage Therapist (LMT)
## 57 Part Time Licensed Massage Therapist
## 58 Massage Therapist
## 59 Licensed Massage Therapist (LMT)
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist- Chiropractic Office
## 62 Massage Therapist
## 63 Massage Therapist $500 Bonus
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Licensed Massage Therapist
## 67 Massage Therapist
## 68 Licensed Massage Therapist- $500 Sign On Bonus for July & Au...
## 69 Licensed Massage Therapist (LMT)
## 70 Massage Therapist
## 71 Licensed Massage Therapist (LMT)
## 72 Part Time Licensed Massage Therapist
## 73 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $28 an hour $22 - $28 22.00 28.00
## 2 \n$25 an hour $25 25.00 NA
## 3 \n$32,752 - $63,081 a year $32752 - $63081 32752.00 63081.00
## 4 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 5 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 6 \n$35,000 a year $35000 35000.00 NA
## 7 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 8 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000.00
## 9 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 10 \n$30 an hour $30 30.00 NA
## 11 \n$35 an hour $35 35.00 NA
## 12 \n$35 an hour $35 35.00 NA
## 13 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 14 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 15 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 16 \n$22 - $28 an hour $22 - $28 22.00 28.00
## 17 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000.00
## 18 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 19 \n$30 an hour $30 30.00 NA
## 20 \n$35 an hour $35 35.00 NA
## 21 \n$35 an hour $35 35.00 NA
## 22 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 23 \n$32,752 - $63,081 a year $32752 - $63081 32752.00 63081.00
## 24 \n$25 an hour $25 25.00 NA
## 25 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 26 \n$32,752 - $63,081 a year $32752 - $63081 32752.00 63081.00
## 27 \n$22 - $28 an hour $22 - $28 22.00 28.00
## 28 \n$40,000 - $60,000 a year $40000 - $60000 40000.00 60000.00
## 29 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 30 \n$30 an hour $30 30.00 NA
## 31 \n$35 an hour $35 35.00 NA
## 32 \n$35 an hour $35 35.00 NA
## 33 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 34 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 35 \n$25 an hour $25 25.00 NA
## 36 \n$25 an hour $25 25.00 NA
## 37 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 38 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 39 \n$32,752 - $63,081 a year $32752 - $63081 32752.00 63081.00
## 40 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 41 \n$35,000 a year $35000 35000.00 NA
## 42 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 43 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 44 \n$30 an hour $30 30.00 NA
## 45 \n$35 an hour $35 35.00 NA
## 46 \n$35 an hour $35 35.00 NA
## 47 \n$25 an hour $25 25.00 NA
## 48 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 49 \n$25,000 - $62,000 a year $25000 - $62000 25000.00 62000.00
## 50 \n$32,752 - $63,081 a year $32752 - $63081 32752.00 63081.00
## 51 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 52 \n$35,000 a year $35000 35000.00 NA
## 53 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 54 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 55 \n$30 an hour $30 30.00 NA
## 56 \n$35 an hour $35 35.00 NA
## 57 \n$35 an hour $35 35.00 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 32.5 9032.612 14516.28 18.58
## 2 30 32.5 9032.612 14516.28 18.58
## 3 30 32.5 9032.612 14516.28 18.58
## 4 30 32.5 9032.612 14516.28 18.58
## 5 30 32.5 9032.612 14516.28 18.58
## 6 30 32.5 9032.612 14516.28 18.58
## 7 30 32.5 9032.612 14516.28 18.58
## 8 30 32.5 9032.612 14516.28 18.58
## 9 30 32.5 9032.612 14516.28 18.58
## 10 30 32.5 9032.612 14516.28 18.58
## 11 30 32.5 9032.612 14516.28 18.58
## 12 30 32.5 9032.612 14516.28 18.58
## 13 30 32.5 9032.612 14516.28 18.58
## 14 30 32.5 9032.612 14516.28 18.58
## 15 30 32.5 9032.612 14516.28 18.58
## 16 30 32.5 9032.612 14516.28 18.58
## 17 30 32.5 9032.612 14516.28 18.58
## 18 30 32.5 9032.612 14516.28 18.58
## 19 30 32.5 9032.612 14516.28 18.58
## 20 30 32.5 9032.612 14516.28 18.58
## 21 30 32.5 9032.612 14516.28 18.58
## 22 30 32.5 9032.612 14516.28 18.58
## 23 30 32.5 9032.612 14516.28 18.58
## 24 30 32.5 9032.612 14516.28 18.58
## 25 30 32.5 9032.612 14516.28 18.58
## 26 30 32.5 9032.612 14516.28 18.58
## 27 30 32.5 9032.612 14516.28 18.58
## 28 30 32.5 9032.612 14516.28 18.58
## 29 30 32.5 9032.612 14516.28 18.58
## 30 30 32.5 9032.612 14516.28 18.58
## 31 30 32.5 9032.612 14516.28 18.58
## 32 30 32.5 9032.612 14516.28 18.58
## 33 30 32.5 9032.612 14516.28 18.58
## 34 30 32.5 9032.612 14516.28 18.58
## 35 30 32.5 9032.612 14516.28 18.58
## 36 30 32.5 9032.612 14516.28 18.58
## 37 30 32.5 9032.612 14516.28 18.58
## 38 30 32.5 9032.612 14516.28 18.58
## 39 30 32.5 9032.612 14516.28 18.58
## 40 30 32.5 9032.612 14516.28 18.58
## 41 30 32.5 9032.612 14516.28 18.58
## 42 30 32.5 9032.612 14516.28 18.58
## 43 30 32.5 9032.612 14516.28 18.58
## 44 30 32.5 9032.612 14516.28 18.58
## 45 30 32.5 9032.612 14516.28 18.58
## 46 30 32.5 9032.612 14516.28 18.58
## 47 30 32.5 9032.612 14516.28 18.58
## 48 30 32.5 9032.612 14516.28 18.58
## 49 30 32.5 9032.612 14516.28 18.58
## 50 30 32.5 9032.612 14516.28 18.58
## 51 30 32.5 9032.612 14516.28 18.58
## 52 30 32.5 9032.612 14516.28 18.58
## 53 30 32.5 9032.612 14516.28 18.58
## 54 30 32.5 9032.612 14516.28 18.58
## 55 30 32.5 9032.612 14516.28 18.58
## 56 30 32.5 9032.612 14516.28 18.58
## 57 30 32.5 9032.612 14516.28 18.58
## maximumMaxSalary
## 1 63081
## 2 63081
## 3 63081
## 4 63081
## 5 63081
## 6 63081
## 7 63081
## 8 63081
## 9 63081
## 10 63081
## 11 63081
## 12 63081
## 13 63081
## 14 63081
## 15 63081
## 16 63081
## 17 63081
## 18 63081
## 19 63081
## 20 63081
## 21 63081
## 22 63081
## 23 63081
## 24 63081
## 25 63081
## 26 63081
## 27 63081
## 28 63081
## 29 63081
## 30 63081
## 31 63081
## 32 63081
## 33 63081
## 34 63081
## 35 63081
## 36 63081
## 37 63081
## 38 63081
## 39 63081
## 40 63081
## 41 63081
## 42 63081
## 43 63081
## 44 63081
## 45 63081
## 46 63081
## 47 63081
## 48 63081
## 49 63081
## 50 63081
## 51 63081
## 52 63081
## 53 63081
## 54 63081
## 55 63081
## 56 63081
## 57 63081
##
## [[3]]
## date_daysAgo
## 1 1
## 2 30
## 3 13
## 4 30
## 5 30
## 6 30
## 7 Just posted
## 8 9
## 9 30
## 10 30
## 11 30
## 12 26
## 13 20
## 14 30
## 15 13
## 16 30
## 17 30
## 18 13
## 19 1
## 20 9
## 21 30
## 22 30
## 23 30
## 24 26
## 25 20
## 26 30
## 27 30
## 28 13
## 29 30
## 30 30
## 31 13
## 32 13
## 33 1
## 34 9
## 35 30
## 36 30
## 37 30
## 38 26
## 39 20
## 40 30
## 41 30
## 42 30
## 43 30
## 44 13
## 45 30
## 46 30
## 47 30
## 48 13
## 49 30
## 50 30
## 51 Just posted
## 52 30
## 53 7
## 54 30
## 55 30
## 56 26
## 57 20
## 58 30
## 59 13
## 60 30
## 61 30
## 62 30
## 63 13
## 64 30
## 65 30
## 66 Just posted
## 67 30
## 68 7
## 69 30
## 70 30
## 71 26
## 72 20
## 73 30
##
## [[4]]
## HiringAgency
## 1 PH SecretsBethlehem, PA 18018
## 2 New Hanover ChiropracticGilbertsville, PA 19525
## 3 Yuvan Day Spa & SalonEaston, PA 18045
## 4 Parks Chiropractic, P.C.Boyertown, PA 19512
## 5 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 6 Elements3.6Allentown, PA 18104
## 7 Kimmel ChiropracticHarleysville, PA 19438
## 8 Hand & Stone - Easton & Allentown3.0Allentown, PA 18106+3 locations
## 9 Steel FitnessAllentown, PA 18104
## 10 Advanced Health Chiropractic P.C.Easton, PA 18045
## 11 Massage Envy3.2Allentown, PA 18104
## 12 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 13 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 14 Elements Massage3.6Allentown, PA 18104
## 15 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 16 Elements Massage3.6Allentown, PA 18104
## 17 Parks Chiropractic, P.C.Boyertown, PA 19512
## 18 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 19 PH SecretsBethlehem, PA 18018
## 20 Hand & Stone - Easton & Allentown3.0Allentown, PA 18106+3 locations
## 21 Steel FitnessAllentown, PA 18104
## 22 Advanced Health Chiropractic P.C.Easton, PA 18045
## 23 Massage Envy3.2Allentown, PA 18104
## 24 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 25 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 26 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
## 27 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 28 Yuvan Day Spa & SalonEaston, PA 18045
## 29 New Hanover ChiropracticGilbertsville, PA 19525
## 30 Elements Massage3.6Allentown, PA 18104
## 31 Yuvan Day Spa & SalonEaston, PA 18045
## 32 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 33 PH SecretsBethlehem, PA 18018
## 34 Hand & Stone - Easton & Allentown3.0Allentown, PA 18106+3 locations
## 35 Steel FitnessAllentown, PA 18104
## 36 Advanced Health Chiropractic P.C.Easton, PA 18045
## 37 Massage Envy3.2Allentown, PA 18104
## 38 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 39 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 40 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
## 41 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 42 Parks Chiropractic, P.C.Boyertown, PA 19512
## 43 New Hanover ChiropracticGilbertsville, PA 19525
## 44 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 45 New Hanover ChiropracticGilbertsville, PA 19525
## 46 Parks Chiropractic, P.C.Boyertown, PA 19512
## 47 Elements Massage3.6Allentown, PA 18104
## 48 Yuvan Day Spa & SalonEaston, PA 18045
## 49 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 50 Elements3.6Allentown, PA 18104
## 51 Kimmel ChiropracticHarleysville, PA 19438
## 52 Steel FitnessAllentown, PA 18104
## 53 Hand and Stone Spa3.0Center Valley, PA 18034
## 54 Advanced Health Chiropractic P.C.Easton, PA 18045
## 55 Massage Envy3.2Allentown, PA 18104
## 56 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 57 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 58 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
## 59 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 60 New Hanover ChiropracticGilbertsville, PA 19525
## 61 Parks Chiropractic, P.C.Boyertown, PA 19512
## 62 Elements Massage3.6Allentown, PA 18104
## 63 Yuvan Day Spa & SalonEaston, PA 18045
## 64 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 65 Elements3.6Allentown, PA 18104
## 66 Kimmel ChiropracticHarleysville, PA 19438
## 67 Steel FitnessAllentown, PA 18104
## 68 Hand and Stone Spa3.0Center Valley, PA 18034
## 69 Advanced Health Chiropractic P.C.Easton, PA 18045
## 70 Massage Envy3.2Allentown, PA 18104
## 71 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 72 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 73 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$32,752 - $63,081 a year $32752 - $63081 32752 63081
## 6 \n$35,000 a year $35000 35000 NA
## 8 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 13 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 14 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 17 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 23 \n$32,752 - $63,081 a year $32752 - $63081 32752 63081
## 25 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 26 \n$32,752 - $63,081 a year $32752 - $63081 32752 63081
## 28 \n$40,000 - $60,000 a year $40000 - $60000 40000 60000
## 38 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 39 \n$32,752 - $63,081 a year $32752 - $63081 32752 63081
## 41 \n$35,000 a year $35000 35000 NA
## 49 \n$25,000 - $62,000 a year $25000 - $62000 25000 62000
## 50 \n$32,752 - $63,081 a year $32752 - $63081 32752 63081
## 52 \n$35,000 a year $35000 35000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 32752 62000 32110 61954.23 25000
## 6 32752 62000 32110 61954.23 25000
## 8 32752 62000 32110 61954.23 25000
## 13 32752 62000 32110 61954.23 25000
## 14 32752 62000 32110 61954.23 25000
## 17 32752 62000 32110 61954.23 25000
## 23 32752 62000 32110 61954.23 25000
## 25 32752 62000 32110 61954.23 25000
## 26 32752 62000 32110 61954.23 25000
## 28 32752 62000 32110 61954.23 25000
## 38 32752 62000 32110 61954.23 25000
## 39 32752 62000 32110 61954.23 25000
## 41 32752 62000 32110 61954.23 25000
## 49 32752 62000 32110 61954.23 25000
## 50 32752 62000 32110 61954.23 25000
## 52 32752 62000 32110 61954.23 25000
## maximumMaxSalary
## 3 63081
## 6 63081
## 8 63081
## 13 63081
## 14 63081
## 17 63081
## 23 63081
## 25 63081
## 26 63081
## 28 63081
## 38 63081
## 39 63081
## 41 63081
## 49 63081
## 50 63081
## 52 63081
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$22 - $28 an hour $22 - $28 22.00 28.00
## 2 \n$25 an hour $25 25.00 NA
## 4 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 5 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 7 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 9 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 10 \n$30 an hour $30 30.00 NA
## 11 \n$35 an hour $35 35.00 NA
## 12 \n$35 an hour $35 35.00 NA
## 15 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 16 \n$22 - $28 an hour $22 - $28 22.00 28.00
## 18 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 19 \n$30 an hour $30 30.00 NA
## 20 \n$35 an hour $35 35.00 NA
## 21 \n$35 an hour $35 35.00 NA
## 22 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 24 \n$25 an hour $25 25.00 NA
## 27 \n$22 - $28 an hour $22 - $28 22.00 28.00
## 29 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 30 \n$30 an hour $30 30.00 NA
## 31 \n$35 an hour $35 35.00 NA
## 32 \n$35 an hour $35 35.00 NA
## 33 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 34 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 35 \n$25 an hour $25 25.00 NA
## 36 \n$25 an hour $25 25.00 NA
## 37 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 40 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 42 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 43 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 44 \n$30 an hour $30 30.00 NA
## 45 \n$35 an hour $35 35.00 NA
## 46 \n$35 an hour $35 35.00 NA
## 47 \n$25 an hour $25 25.00 NA
## 48 \n$23 - $25 an hour $23 - $25 23.00 25.00
## 51 \n$18.58 - $51.28 an hour $18.58 - $51.28 18.58 51.28
## 53 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 54 \n$25.00 - $32.50 an hour $25.00 - $32.50 25.00 32.50
## 55 \n$30 an hour $30 30.00 NA
## 56 \n$35 an hour $35 35.00 NA
## 57 \n$35 an hour $35 35.00 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 30 26.80244 34.18571 18.58
## 2 25 30 26.80244 34.18571 18.58
## 4 25 30 26.80244 34.18571 18.58
## 5 25 30 26.80244 34.18571 18.58
## 7 25 30 26.80244 34.18571 18.58
## 9 25 30 26.80244 34.18571 18.58
## 10 25 30 26.80244 34.18571 18.58
## 11 25 30 26.80244 34.18571 18.58
## 12 25 30 26.80244 34.18571 18.58
## 15 25 30 26.80244 34.18571 18.58
## 16 25 30 26.80244 34.18571 18.58
## 18 25 30 26.80244 34.18571 18.58
## 19 25 30 26.80244 34.18571 18.58
## 20 25 30 26.80244 34.18571 18.58
## 21 25 30 26.80244 34.18571 18.58
## 22 25 30 26.80244 34.18571 18.58
## 24 25 30 26.80244 34.18571 18.58
## 27 25 30 26.80244 34.18571 18.58
## 29 25 30 26.80244 34.18571 18.58
## 30 25 30 26.80244 34.18571 18.58
## 31 25 30 26.80244 34.18571 18.58
## 32 25 30 26.80244 34.18571 18.58
## 33 25 30 26.80244 34.18571 18.58
## 34 25 30 26.80244 34.18571 18.58
## 35 25 30 26.80244 34.18571 18.58
## 36 25 30 26.80244 34.18571 18.58
## 37 25 30 26.80244 34.18571 18.58
## 40 25 30 26.80244 34.18571 18.58
## 42 25 30 26.80244 34.18571 18.58
## 43 25 30 26.80244 34.18571 18.58
## 44 25 30 26.80244 34.18571 18.58
## 45 25 30 26.80244 34.18571 18.58
## 46 25 30 26.80244 34.18571 18.58
## 47 25 30 26.80244 34.18571 18.58
## 48 25 30 26.80244 34.18571 18.58
## 51 25 30 26.80244 34.18571 18.58
## 53 25 30 26.80244 34.18571 18.58
## 54 25 30 26.80244 34.18571 18.58
## 55 25 30 26.80244 34.18571 18.58
## 56 25 30 26.80244 34.18571 18.58
## 57 25 30 26.80244 34.18571 18.58
## maximumMaxSalary
## 1 51.28
## 2 51.28
## 4 51.28
## 5 51.28
## 7 51.28
## 9 51.28
## 10 51.28
## 11 51.28
## 12 51.28
## 15 51.28
## 16 51.28
## 18 51.28
## 19 51.28
## 20 51.28
## 21 51.28
## 22 51.28
## 24 51.28
## 27 51.28
## 29 51.28
## 30 51.28
## 31 51.28
## 32 51.28
## 33 51.28
## 34 51.28
## 35 51.28
## 36 51.28
## 37 51.28
## 40 51.28
## 42 51.28
## 43 51.28
## 44 51.28
## 45 51.28
## 46 51.28
## 47 51.28
## 48 51.28
## 51 51.28
## 53 51.28
## 54 51.28
## 55 51.28
## 56 51.28
## 57 51.28
##
## [[7]]
## city state
## 1 Allentown PA
## 2 Allentown PA
## 3 Allentown PA
## 4 Allentown PA
## 5 Allentown PA
## 6 Allentown PA
## 7 Allentown PA
## 8 Allentown PA
## 9 Allentown PA
## 10 Allentown PA
## 11 Allentown PA
## 12 Allentown PA
## 13 Allentown PA
## 14 Allentown PA
## 15 Allentown PA
## 16 Allentown PA
## 17 Allentown PA
## 18 Allentown PA
## 19 Allentown PA
## 20 Allentown PA
## 21 Allentown PA
## 22 Allentown PA
## 23 Allentown PA
## 24 Allentown PA
## 25 Allentown PA
## 26 Allentown PA
## 27 Allentown PA
## 28 Allentown PA
## 29 Allentown PA
## 30 Allentown PA
## 31 Allentown PA
## 32 Allentown PA
## 33 Allentown PA
## 34 Allentown PA
## 35 Allentown PA
## 36 Allentown PA
## 37 Allentown PA
## 38 Allentown PA
## 39 Allentown PA
## 40 Allentown PA
## 41 Allentown PA
## 42 Allentown PA
## 43 Allentown PA
## 44 Allentown PA
## 45 Allentown PA
## 46 Allentown PA
## 47 Allentown PA
## 48 Allentown PA
## 49 Allentown PA
## 50 Allentown PA
## 51 Allentown PA
## 52 Allentown PA
## 53 Allentown PA
## 54 Allentown PA
## 55 Allentown PA
## 56 Allentown PA
## 57 Allentown PA
## 58 Allentown PA
## 59 Allentown PA
## 60 Allentown PA
## 61 Allentown PA
## 62 Allentown PA
## 63 Allentown PA
## 64 Allentown PA
## 65 Allentown PA
## 66 Allentown PA
## 67 Allentown PA
## 68 Allentown PA
## 69 Allentown PA
## 70 Allentown PA
## 71 Allentown PA
## 72 Allentown PA
## 73 Allentown PA
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist $500 Bonus
## 4 Licensed Massage Therapist- Chiropractic Office
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Massage Therapist
## 12 Licensed Massage Therapist (LMT)
## 13 Part Time Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 Massage Therapist
## 17 Licensed Massage Therapist- Chiropractic Office
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist
## 24 Licensed Massage Therapist (LMT)
## 25 Part Time Licensed Massage Therapist
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapist $500 Bonus
## 29 Licensed Massage Therapist
## 30 Massage Therapist
## 31 Massage Therapist $500 Bonus
## 32 Licensed Massage Therapist (LMT)
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Massage Therapist
## 36 Licensed Massage Therapist (LMT)
## 37 Massage Therapist
## 38 Licensed Massage Therapist (LMT)
## 39 Part Time Licensed Massage Therapist
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist- Chiropractic Office
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist (LMT)
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist- Chiropractic Office
## 47 Massage Therapist
## 48 Massage Therapist $500 Bonus
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist
## 52 Massage Therapist
## 53 Licensed Massage Therapist- $500 Sign On Bonus for July & Au...
## 54 Licensed Massage Therapist (LMT)
## 55 Massage Therapist
## 56 Licensed Massage Therapist (LMT)
## 57 Part Time Licensed Massage Therapist
## 58 Massage Therapist
## 59 Licensed Massage Therapist (LMT)
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist- Chiropractic Office
## 62 Massage Therapist
## 63 Massage Therapist $500 Bonus
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Licensed Massage Therapist
## 67 Massage Therapist
## 68 Licensed Massage Therapist- $500 Sign On Bonus for July & Au...
## 69 Licensed Massage Therapist (LMT)
## 70 Massage Therapist
## 71 Licensed Massage Therapist (LMT)
## 72 Part Time Licensed Massage Therapist
## 73 Massage Therapist
## HiringAgency
## 1 PH SecretsBethlehem, PA 18018
## 2 New Hanover ChiropracticGilbertsville, PA 19525
## 3 Yuvan Day Spa & SalonEaston, PA 18045
## 4 Parks Chiropractic, P.C.Boyertown, PA 19512
## 5 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 6 Elements3.6Allentown, PA 18104
## 7 Kimmel ChiropracticHarleysville, PA 19438
## 8 Hand & Stone - Easton & Allentown3.0Allentown, PA 18106+3 locations
## 9 Steel FitnessAllentown, PA 18104
## 10 Advanced Health Chiropractic P.C.Easton, PA 18045
## 11 Massage Envy3.2Allentown, PA 18104
## 12 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 13 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 14 Elements Massage3.6Allentown, PA 18104
## 15 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 16 Elements Massage3.6Allentown, PA 18104
## 17 Parks Chiropractic, P.C.Boyertown, PA 19512
## 18 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 19 PH SecretsBethlehem, PA 18018
## 20 Hand & Stone - Easton & Allentown3.0Allentown, PA 18106+3 locations
## 21 Steel FitnessAllentown, PA 18104
## 22 Advanced Health Chiropractic P.C.Easton, PA 18045
## 23 Massage Envy3.2Allentown, PA 18104
## 24 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 25 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 26 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
## 27 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 28 Yuvan Day Spa & SalonEaston, PA 18045
## 29 New Hanover ChiropracticGilbertsville, PA 19525
## 30 Elements Massage3.6Allentown, PA 18104
## 31 Yuvan Day Spa & SalonEaston, PA 18045
## 32 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 33 PH SecretsBethlehem, PA 18018
## 34 Hand & Stone - Easton & Allentown3.0Allentown, PA 18106+3 locations
## 35 Steel FitnessAllentown, PA 18104
## 36 Advanced Health Chiropractic P.C.Easton, PA 18045
## 37 Massage Envy3.2Allentown, PA 18104
## 38 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 39 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 40 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
## 41 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 42 Parks Chiropractic, P.C.Boyertown, PA 19512
## 43 New Hanover ChiropracticGilbertsville, PA 19525
## 44 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 45 New Hanover ChiropracticGilbertsville, PA 19525
## 46 Parks Chiropractic, P.C.Boyertown, PA 19512
## 47 Elements Massage3.6Allentown, PA 18104
## 48 Yuvan Day Spa & SalonEaston, PA 18045
## 49 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 50 Elements3.6Allentown, PA 18104
## 51 Kimmel ChiropracticHarleysville, PA 19438
## 52 Steel FitnessAllentown, PA 18104
## 53 Hand and Stone Spa3.0Center Valley, PA 18034
## 54 Advanced Health Chiropractic P.C.Easton, PA 18045
## 55 Massage Envy3.2Allentown, PA 18104
## 56 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 57 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 58 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
## 59 Hand and Stone Massage & Facial Spa3.0Bethlehem, PA 18020
## 60 New Hanover ChiropracticGilbertsville, PA 19525
## 61 Parks Chiropractic, P.C.Boyertown, PA 19512
## 62 Elements Massage3.6Allentown, PA 18104
## 63 Yuvan Day Spa & SalonEaston, PA 18045
## 64 Hand and Stone Massage and Facial Spa Quakertown3.0Quakertown, PA 18951
## 65 Elements3.6Allentown, PA 18104
## 66 Kimmel ChiropracticHarleysville, PA 19438
## 67 Steel FitnessAllentown, PA 18104
## 68 Hand and Stone Spa3.0Center Valley, PA 18034
## 69 Advanced Health Chiropractic P.C.Easton, PA 18045
## 70 Massage Envy3.2Allentown, PA 18104
## 71 Greenleaf Soft Tissue TherapyBangor, PA 18013
## 72 Back in Line Chiropractic and Wellness CenterEaston, PA 18042 (College Hill area)
## 73 Lords and Ladies Salons and Medical SpaGilbertsville, PA 19525+3 locations
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 1 18.58 51.28 25000 63081
## 2 30 18.58 51.28 25000 63081
## 3 13 18.58 51.28 25000 63081
## 4 30 18.58 51.28 25000 63081
## 5 30 18.58 51.28 25000 63081
## 6 30 18.58 51.28 25000 63081
## 7 Just posted 18.58 51.28 25000 63081
## 8 9 18.58 51.28 25000 63081
## 9 30 18.58 51.28 25000 63081
## 10 30 18.58 51.28 25000 63081
## 11 30 18.58 51.28 25000 63081
## 12 26 18.58 51.28 25000 63081
## 13 20 18.58 51.28 25000 63081
## 14 30 18.58 51.28 25000 63081
## 15 13 18.58 51.28 25000 63081
## 16 30 18.58 51.28 25000 63081
## 17 30 18.58 51.28 25000 63081
## 18 13 18.58 51.28 25000 63081
## 19 1 18.58 51.28 25000 63081
## 20 9 18.58 51.28 25000 63081
## 21 30 18.58 51.28 25000 63081
## 22 30 18.58 51.28 25000 63081
## 23 30 18.58 51.28 25000 63081
## 24 26 18.58 51.28 25000 63081
## 25 20 18.58 51.28 25000 63081
## 26 30 18.58 51.28 25000 63081
## 27 30 18.58 51.28 25000 63081
## 28 13 18.58 51.28 25000 63081
## 29 30 18.58 51.28 25000 63081
## 30 30 18.58 51.28 25000 63081
## 31 13 18.58 51.28 25000 63081
## 32 13 18.58 51.28 25000 63081
## 33 1 18.58 51.28 25000 63081
## 34 9 18.58 51.28 25000 63081
## 35 30 18.58 51.28 25000 63081
## 36 30 18.58 51.28 25000 63081
## 37 30 18.58 51.28 25000 63081
## 38 26 18.58 51.28 25000 63081
## 39 20 18.58 51.28 25000 63081
## 40 30 18.58 51.28 25000 63081
## 41 30 18.58 51.28 25000 63081
## 42 30 18.58 51.28 25000 63081
## 43 30 18.58 51.28 25000 63081
## 44 13 18.58 51.28 25000 63081
## 45 30 18.58 51.28 25000 63081
## 46 30 18.58 51.28 25000 63081
## 47 30 18.58 51.28 25000 63081
## 48 13 18.58 51.28 25000 63081
## 49 30 18.58 51.28 25000 63081
## 50 30 18.58 51.28 25000 63081
## 51 Just posted 18.58 51.28 25000 63081
## 52 30 18.58 51.28 25000 63081
## 53 7 18.58 51.28 25000 63081
## 54 30 18.58 51.28 25000 63081
## 55 30 18.58 51.28 25000 63081
## 56 26 18.58 51.28 25000 63081
## 57 20 18.58 51.28 25000 63081
## 58 30 18.58 51.28 25000 63081
## 59 13 18.58 51.28 25000 63081
## 60 30 18.58 51.28 25000 63081
## 61 30 18.58 51.28 25000 63081
## 62 30 18.58 51.28 25000 63081
## 63 13 18.58 51.28 25000 63081
## 64 30 18.58 51.28 25000 63081
## 65 30 18.58 51.28 25000 63081
## 66 Just posted 18.58 51.28 25000 63081
## 67 30 18.58 51.28 25000 63081
## 68 7 18.58 51.28 25000 63081
## 69 30 18.58 51.28 25000 63081
## 70 30 18.58 51.28 25000 63081
## 71 26 18.58 51.28 25000 63081
## 72 20 18.58 51.28 25000 63081
## 73 30 18.58 51.28 25000 63081
Rhode Island Providence, Cranston, Warwick
getIndeedJobData5pages('massage therapist', 'Providence','RI')
## Warning in getIndeedJobData5pages("massage therapist", "Providence", "RI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Providence", "RI"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist and/or Licencsed Esthetciian
## 2 Spa Massage Therapist
## 3 Spa Fjor Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist
## 6 Massage Therapist/Nail Technician/Esthetician/Manager
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Liscensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 LMT Licensed Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist [CUSTOMIZATION REQUIRED]
## 15 Total Body Stretch Service Provider/Certified Personal Train...
## 16 Spa Fjor Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist/Nail Technician/Esthetician/Manager
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Liscensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 LMT Licensed Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapist [CUSTOMIZATION REQUIRED]
## 27 Total Body Stretch Service Provider/Certified Personal Train...
## 28 Licensed Massage Therapists
## 29 Licensed Massage Therapist (LMT)
## 30 Massage Therapist- Full Time *Flexible*
## 31 Massage Therapist/Nail Technician/Esthetician/Manager
## 32 Licensed Massage Therapist
## 33 Spa Massage Therapist
## 34 Liscensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 LMT Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist [CUSTOMIZATION REQUIRED]
## 39 Total Body Stretch Service Provider/Certified Personal Train...
## 40 Licensed Massage Therapists
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist- Full Time *Flexible*
## 43 Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist (LMT)
## 46 Spa Fjor Massage Therapist
## 47 Massage Therapist
## 48 Massage Therapist/Nail Technician/Esthetician/Manager
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Liscensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 LMT Licensed Massage Therapist
## 55 Massage Therapist
## 56 Massage Therapist [CUSTOMIZATION REQUIRED]
## 57 Total Body Stretch Service Provider/Certified Personal Train...
## 58 Licensed Massage Therapists
## 59 Licensed Massage Therapist (LMT)
## 60 Massage Therapist- Full Time *Flexible*
## 61 Spa Fjor Massage Therapist
## 62 Massage Therapist
## 63 Massage Therapist/Nail Technician/Esthetician/Manager
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Liscensed Massage Therapist
## 68 Licensed Massage Therapist
## 69 LMT Licensed Massage Therapist
## 70 Massage Therapist
## 71 Massage Therapist [CUSTOMIZATION REQUIRED]
## 72 Total Body Stretch Service Provider/Certified Personal Train...
## 73 Licensed Massage Therapists
## 74 Licensed Massage Therapist (LMT)
## 75 Massage Therapist- Full Time *Flexible*
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$38,942 - $62,507 a year $38942 - $62507 38942.00 62507
## 2 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 3 \n$35 an hour $35 35.00 NA
## 4 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 5 \n$50 - $75 an hour $50 - $75 50.00 75
## 6 \n$10.25 an hour $10.25 10.25 NA
## 7 \n$35 an hour $35 35.00 NA
## 8 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 9 \n$50 - $75 an hour $50 - $75 50.00 75
## 10 \n$10.25 an hour $10.25 10.25 NA
## 11 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 12 \n$18 an hour $18 18.00 NA
## 13 \n$10.25 an hour $10.25 10.25 NA
## 14 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 15 \n$18 an hour $18 18.00 NA
## 16 \n$35 an hour $35 35.00 NA
## 17 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 18 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 19 \n$35 an hour $35 35.00 NA
## 20 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 21 \n$50 - $75 an hour $50 - $75 50.00 75
## 22 \n$10.25 an hour $10.25 10.25 NA
## 23 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 24 \n$18 an hour $18 18.00 NA
## 25 \n$35 an hour $35 35.00 NA
## 26 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 27 \n$50 - $75 an hour $50 - $75 50.00 75
## 28 \n$10.25 an hour $10.25 10.25 NA
## 29 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 30 \n$18 an hour $18 18.00 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 50 25000 12648.01 20701.03 10.25
## 2 50 25000 12648.01 20701.03 10.25
## 3 50 25000 12648.01 20701.03 10.25
## 4 50 25000 12648.01 20701.03 10.25
## 5 50 25000 12648.01 20701.03 10.25
## 6 50 25000 12648.01 20701.03 10.25
## 7 50 25000 12648.01 20701.03 10.25
## 8 50 25000 12648.01 20701.03 10.25
## 9 50 25000 12648.01 20701.03 10.25
## 10 50 25000 12648.01 20701.03 10.25
## 11 50 25000 12648.01 20701.03 10.25
## 12 50 25000 12648.01 20701.03 10.25
## 13 50 25000 12648.01 20701.03 10.25
## 14 50 25000 12648.01 20701.03 10.25
## 15 50 25000 12648.01 20701.03 10.25
## 16 50 25000 12648.01 20701.03 10.25
## 17 50 25000 12648.01 20701.03 10.25
## 18 50 25000 12648.01 20701.03 10.25
## 19 50 25000 12648.01 20701.03 10.25
## 20 50 25000 12648.01 20701.03 10.25
## 21 50 25000 12648.01 20701.03 10.25
## 22 50 25000 12648.01 20701.03 10.25
## 23 50 25000 12648.01 20701.03 10.25
## 24 50 25000 12648.01 20701.03 10.25
## 25 50 25000 12648.01 20701.03 10.25
## 26 50 25000 12648.01 20701.03 10.25
## 27 50 25000 12648.01 20701.03 10.25
## 28 50 25000 12648.01 20701.03 10.25
## 29 50 25000 12648.01 20701.03 10.25
## 30 50 25000 12648.01 20701.03 10.25
## maximumMaxSalary
## 1 62507
## 2 62507
## 3 62507
## 4 62507
## 5 62507
## 6 62507
## 7 62507
## 8 62507
## 9 62507
## 10 62507
## 11 62507
## 12 62507
## 13 62507
## 14 62507
## 15 62507
## 16 62507
## 17 62507
## 18 62507
## 19 62507
## 20 62507
## 21 62507
## 22 62507
## 23 62507
## 24 62507
## 25 62507
## 26 62507
## 27 62507
## 28 62507
## 29 62507
## 30 62507
##
## [[3]]
## date_daysAgo
## 1 10
## 2 6
## 3 5
## 4 16
## 5 30
## 6 30
## 7 30
## 8 18
## 9 16
## 10 30
## 11 30
## 12 30
## 13 30
## 14 30
## 15 30
## 16 5
## 17 30
## 18 30
## 19 30
## 20 18
## 21 30
## 22 16
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 30
## 29 26
## 30 30
## 31 30
## 32 30
## 33 6
## 34 16
## 35 30
## 36 30
## 37 30
## 38 30
## 39 30
## 40 30
## 41 26
## 42 30
## 43 30
## 44 30
## 45 16
## 46 5
## 47 30
## 48 30
## 49 30
## 50 18
## 51 30
## 52 16
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 30
## 59 26
## 60 30
## 61 5
## 62 30
## 63 30
## 64 30
## 65 18
## 66 30
## 67 16
## 68 30
## 69 30
## 70 30
## 71 30
## 72 30
## 73 30
## 74 26
## 75 30
##
## [[4]]
## HiringAgency
## 1 Citron SpaProvidence, RI 02906 (Wayland area)
## 2 Marriott International, Inc4.1Providence, RI+1 location
## 3 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 4 Elements Massage3.6Mansfield, MA 02048
## 5 LaRose Muscular TherapyMilford, MA 01757
## 6 Elite SpaSeekonk, MA
## 7 Elements Massage3.6Mansfield, MA 02048
## 8 Spa Newport 5 locationsNewport, RI
## 9 Form Massage TherapyNewport, RI
## 10 Bellezza Day SpaFranklin, MA 02038
## 11 Relaxation WorksRaynham, MA 02767
## 12 Body Matters Day SpaNewport, RI
## 13 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 14 Massage Envy3.2North Attleboro, MA 02760
## 15 Massage Envy3.2East Providence, RI 02914
## 16 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 17 LaRose Muscular TherapyMilford, MA 01757
## 18 Elite SpaSeekonk, MA
## 19 Elements Massage3.6Mansfield, MA 02048
## 20 Spa Newport 5 locationsNewport, RI
## 21 Bellezza Day SpaFranklin, MA 02038
## 22 Form Massage TherapyNewport, RI
## 23 Relaxation WorksRaynham, MA 02767
## 24 Body Matters Day SpaNewport, RI
## 25 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 26 Massage Envy3.2North Attleboro, MA 02760
## 27 Massage Envy3.2East Providence, RI 02914
## 28 Elements3.6Mansfield, MA 02048
## 29 Relaxation WorksRaynham, MA 02767
## 30 Massage Envy3.2Brockton, MA 02301
## 31 Elite SpaSeekonk, MA
## 32 Bellezza Day SpaFranklin, MA 02038
## 33 Marriott International, Inc4.1Newport, RI 02840 (Long Wharf area)
## 34 Form Massage TherapyNewport, RI
## 35 Relaxation WorksRaynham, MA 02767
## 36 Body Matters Day SpaNewport, RI
## 37 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 38 Massage Envy3.2North Attleboro, MA 02760
## 39 Massage Envy3.2East Providence, RI 02914
## 40 Elements3.6Mansfield, MA 02048
## 41 Relaxation WorksRaynham, MA 02767
## 42 Massage Envy3.2Brockton, MA 02301
## 43 LaRose Muscular TherapyMilford, MA 01757
## 44 Elements Massage3.6Mansfield, MA 02048
## 45 Elements Massage3.6Mansfield, MA 02048
## 46 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 47 LaRose Muscular TherapyMilford, MA 01757
## 48 Elite SpaSeekonk, MA
## 49 Elements Massage3.6Mansfield, MA 02048
## 50 Spa Newport 5 locationsNewport, RI
## 51 Bellezza Day SpaFranklin, MA 02038
## 52 Form Massage TherapyNewport, RI
## 53 Relaxation WorksRaynham, MA 02767
## 54 Body Matters Day SpaNewport, RI
## 55 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 56 Massage Envy3.2North Attleboro, MA 02760
## 57 Massage Envy3.2East Providence, RI 02914
## 58 Elements3.6Mansfield, MA 02048
## 59 Relaxation WorksRaynham, MA 02767
## 60 Massage Envy3.2Brockton, MA 02301
## 61 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 62 LaRose Muscular TherapyMilford, MA 01757
## 63 Elite SpaSeekonk, MA
## 64 Elements Massage3.6Mansfield, MA 02048
## 65 Spa Newport 5 locationsNewport, RI
## 66 Bellezza Day SpaFranklin, MA 02038
## 67 Form Massage TherapyNewport, RI
## 68 Relaxation WorksRaynham, MA 02767
## 69 Body Matters Day SpaNewport, RI
## 70 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 71 Massage Envy3.2North Attleboro, MA 02760
## 72 Massage Envy3.2East Providence, RI 02914
## 73 Elements3.6Mansfield, MA 02048
## 74 Relaxation WorksRaynham, MA 02767
## 75 Massage Envy3.2Brockton, MA 02301
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$38,942 - $62,507 a year $38942 - $62507 38942 62507
## 2 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 4 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 8 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 11 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 14 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 17 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 18 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 20 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 23 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 26 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 29 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30000 50000 31578.5 47708.92 25000
## 2 30000 50000 31578.5 47708.92 25000
## 4 30000 50000 31578.5 47708.92 25000
## 8 30000 50000 31578.5 47708.92 25000
## 11 30000 50000 31578.5 47708.92 25000
## 14 30000 50000 31578.5 47708.92 25000
## 17 30000 50000 31578.5 47708.92 25000
## 18 30000 50000 31578.5 47708.92 25000
## 20 30000 50000 31578.5 47708.92 25000
## 23 30000 50000 31578.5 47708.92 25000
## 26 30000 50000 31578.5 47708.92 25000
## 29 30000 50000 31578.5 47708.92 25000
## maximumMaxSalary
## 1 62507
## 2 62507
## 4 62507
## 8 62507
## 11 62507
## 14 62507
## 17 62507
## 18 62507
## 20 62507
## 23 62507
## 26 62507
## 29 62507
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 3 \n$35 an hour $35 35.00 NA 26.5
## 5 \n$50 - $75 an hour $50 - $75 50.00 75 26.5
## 6 \n$10.25 an hour $10.25 10.25 NA 26.5
## 7 \n$35 an hour $35 35.00 NA 26.5
## 9 \n$50 - $75 an hour $50 - $75 50.00 75 26.5
## 10 \n$10.25 an hour $10.25 10.25 NA 26.5
## 12 \n$18 an hour $18 18.00 NA 26.5
## 13 \n$10.25 an hour $10.25 10.25 NA 26.5
## 15 \n$18 an hour $18 18.00 NA 26.5
## 16 \n$35 an hour $35 35.00 NA 26.5
## 19 \n$35 an hour $35 35.00 NA 26.5
## 21 \n$50 - $75 an hour $50 - $75 50.00 75 26.5
## 22 \n$10.25 an hour $10.25 10.25 NA 26.5
## 24 \n$18 an hour $18 18.00 NA 26.5
## 25 \n$35 an hour $35 35.00 NA 26.5
## 27 \n$50 - $75 an hour $50 - $75 50.00 75 26.5
## 28 \n$10.25 an hour $10.25 10.25 NA 26.5
## 30 \n$18 an hour $18 18.00 NA 26.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 3 75 27.68056 75 10.25 75
## 5 75 27.68056 75 10.25 75
## 6 75 27.68056 75 10.25 75
## 7 75 27.68056 75 10.25 75
## 9 75 27.68056 75 10.25 75
## 10 75 27.68056 75 10.25 75
## 12 75 27.68056 75 10.25 75
## 13 75 27.68056 75 10.25 75
## 15 75 27.68056 75 10.25 75
## 16 75 27.68056 75 10.25 75
## 19 75 27.68056 75 10.25 75
## 21 75 27.68056 75 10.25 75
## 22 75 27.68056 75 10.25 75
## 24 75 27.68056 75 10.25 75
## 25 75 27.68056 75 10.25 75
## 27 75 27.68056 75 10.25 75
## 28 75 27.68056 75 10.25 75
## 30 75 27.68056 75 10.25 75
##
## [[7]]
## city state
## 1 Providence RI
## 2 Providence RI
## 3 Providence RI
## 4 Providence RI
## 5 Providence RI
## 6 Providence RI
## 7 Providence RI
## 8 Providence RI
## 9 Providence RI
## 10 Providence RI
## 11 Providence RI
## 12 Providence RI
## 13 Providence RI
## 14 Providence RI
## 15 Providence RI
## 16 Providence RI
## 17 Providence RI
## 18 Providence RI
## 19 Providence RI
## 20 Providence RI
## 21 Providence RI
## 22 Providence RI
## 23 Providence RI
## 24 Providence RI
## 25 Providence RI
## 26 Providence RI
## 27 Providence RI
## 28 Providence RI
## 29 Providence RI
## 30 Providence RI
## 31 Providence RI
## 32 Providence RI
## 33 Providence RI
## 34 Providence RI
## 35 Providence RI
## 36 Providence RI
## 37 Providence RI
## 38 Providence RI
## 39 Providence RI
## 40 Providence RI
## 41 Providence RI
## 42 Providence RI
## 43 Providence RI
## 44 Providence RI
## 45 Providence RI
## 46 Providence RI
## 47 Providence RI
## 48 Providence RI
## 49 Providence RI
## 50 Providence RI
## 51 Providence RI
## 52 Providence RI
## 53 Providence RI
## 54 Providence RI
## 55 Providence RI
## 56 Providence RI
## 57 Providence RI
## 58 Providence RI
## 59 Providence RI
## 60 Providence RI
## 61 Providence RI
## 62 Providence RI
## 63 Providence RI
## 64 Providence RI
## 65 Providence RI
## 66 Providence RI
## 67 Providence RI
## 68 Providence RI
## 69 Providence RI
## 70 Providence RI
## 71 Providence RI
## 72 Providence RI
## 73 Providence RI
## 74 Providence RI
## 75 Providence RI
## jobTitle
## 1 Licensed Massage Therapist and/or Licencsed Esthetciian
## 2 Spa Massage Therapist
## 3 Spa Fjor Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist
## 6 Massage Therapist/Nail Technician/Esthetician/Manager
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Liscensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 LMT Licensed Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist [CUSTOMIZATION REQUIRED]
## 15 Total Body Stretch Service Provider/Certified Personal Train...
## 16 Spa Fjor Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist/Nail Technician/Esthetician/Manager
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Liscensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 LMT Licensed Massage Therapist
## 25 Massage Therapist
## 26 Massage Therapist [CUSTOMIZATION REQUIRED]
## 27 Total Body Stretch Service Provider/Certified Personal Train...
## 28 Licensed Massage Therapists
## 29 Licensed Massage Therapist (LMT)
## 30 Massage Therapist- Full Time *Flexible*
## 31 Massage Therapist/Nail Technician/Esthetician/Manager
## 32 Licensed Massage Therapist
## 33 Spa Massage Therapist
## 34 Liscensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 LMT Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist [CUSTOMIZATION REQUIRED]
## 39 Total Body Stretch Service Provider/Certified Personal Train...
## 40 Licensed Massage Therapists
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist- Full Time *Flexible*
## 43 Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist (LMT)
## 46 Spa Fjor Massage Therapist
## 47 Massage Therapist
## 48 Massage Therapist/Nail Technician/Esthetician/Manager
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Liscensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 LMT Licensed Massage Therapist
## 55 Massage Therapist
## 56 Massage Therapist [CUSTOMIZATION REQUIRED]
## 57 Total Body Stretch Service Provider/Certified Personal Train...
## 58 Licensed Massage Therapists
## 59 Licensed Massage Therapist (LMT)
## 60 Massage Therapist- Full Time *Flexible*
## 61 Spa Fjor Massage Therapist
## 62 Massage Therapist
## 63 Massage Therapist/Nail Technician/Esthetician/Manager
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Liscensed Massage Therapist
## 68 Licensed Massage Therapist
## 69 LMT Licensed Massage Therapist
## 70 Massage Therapist
## 71 Massage Therapist [CUSTOMIZATION REQUIRED]
## 72 Total Body Stretch Service Provider/Certified Personal Train...
## 73 Licensed Massage Therapists
## 74 Licensed Massage Therapist (LMT)
## 75 Massage Therapist- Full Time *Flexible*
## HiringAgency
## 1 Citron SpaProvidence, RI 02906 (Wayland area)
## 2 Marriott International, Inc4.1Providence, RI+1 location
## 3 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 4 Elements Massage3.6Mansfield, MA 02048
## 5 LaRose Muscular TherapyMilford, MA 01757
## 6 Elite SpaSeekonk, MA
## 7 Elements Massage3.6Mansfield, MA 02048
## 8 Spa Newport 5 locationsNewport, RI
## 9 Form Massage TherapyNewport, RI
## 10 Bellezza Day SpaFranklin, MA 02038
## 11 Relaxation WorksRaynham, MA 02767
## 12 Body Matters Day SpaNewport, RI
## 13 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 14 Massage Envy3.2North Attleboro, MA 02760
## 15 Massage Envy3.2East Providence, RI 02914
## 16 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 17 LaRose Muscular TherapyMilford, MA 01757
## 18 Elite SpaSeekonk, MA
## 19 Elements Massage3.6Mansfield, MA 02048
## 20 Spa Newport 5 locationsNewport, RI
## 21 Bellezza Day SpaFranklin, MA 02038
## 22 Form Massage TherapyNewport, RI
## 23 Relaxation WorksRaynham, MA 02767
## 24 Body Matters Day SpaNewport, RI
## 25 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 26 Massage Envy3.2North Attleboro, MA 02760
## 27 Massage Envy3.2East Providence, RI 02914
## 28 Elements3.6Mansfield, MA 02048
## 29 Relaxation WorksRaynham, MA 02767
## 30 Massage Envy3.2Brockton, MA 02301
## 31 Elite SpaSeekonk, MA
## 32 Bellezza Day SpaFranklin, MA 02038
## 33 Marriott International, Inc4.1Newport, RI 02840 (Long Wharf area)
## 34 Form Massage TherapyNewport, RI
## 35 Relaxation WorksRaynham, MA 02767
## 36 Body Matters Day SpaNewport, RI
## 37 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 38 Massage Envy3.2North Attleboro, MA 02760
## 39 Massage Envy3.2East Providence, RI 02914
## 40 Elements3.6Mansfield, MA 02048
## 41 Relaxation WorksRaynham, MA 02767
## 42 Massage Envy3.2Brockton, MA 02301
## 43 LaRose Muscular TherapyMilford, MA 01757
## 44 Elements Massage3.6Mansfield, MA 02048
## 45 Elements Massage3.6Mansfield, MA 02048
## 46 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 47 LaRose Muscular TherapyMilford, MA 01757
## 48 Elite SpaSeekonk, MA
## 49 Elements Massage3.6Mansfield, MA 02048
## 50 Spa Newport 5 locationsNewport, RI
## 51 Bellezza Day SpaFranklin, MA 02038
## 52 Form Massage TherapyNewport, RI
## 53 Relaxation WorksRaynham, MA 02767
## 54 Body Matters Day SpaNewport, RI
## 55 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 56 Massage Envy3.2North Attleboro, MA 02760
## 57 Massage Envy3.2East Providence, RI 02914
## 58 Elements3.6Mansfield, MA 02048
## 59 Relaxation WorksRaynham, MA 02767
## 60 Massage Envy3.2Brockton, MA 02301
## 61 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 62 LaRose Muscular TherapyMilford, MA 01757
## 63 Elite SpaSeekonk, MA
## 64 Elements Massage3.6Mansfield, MA 02048
## 65 Spa Newport 5 locationsNewport, RI
## 66 Bellezza Day SpaFranklin, MA 02038
## 67 Form Massage TherapyNewport, RI
## 68 Relaxation WorksRaynham, MA 02767
## 69 Body Matters Day SpaNewport, RI
## 70 Massage Envy3.2North Attleboro, MA 02760+3 locations
## 71 Massage Envy3.2North Attleboro, MA 02760
## 72 Massage Envy3.2East Providence, RI 02914
## 73 Elements3.6Mansfield, MA 02048
## 74 Relaxation WorksRaynham, MA 02767
## 75 Massage Envy3.2Brockton, MA 02301
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 10 10.25 75 25000 62507
## 2 6 10.25 75 25000 62507
## 3 5 10.25 75 25000 62507
## 4 16 10.25 75 25000 62507
## 5 30 10.25 75 25000 62507
## 6 30 10.25 75 25000 62507
## 7 30 10.25 75 25000 62507
## 8 18 10.25 75 25000 62507
## 9 16 10.25 75 25000 62507
## 10 30 10.25 75 25000 62507
## 11 30 10.25 75 25000 62507
## 12 30 10.25 75 25000 62507
## 13 30 10.25 75 25000 62507
## 14 30 10.25 75 25000 62507
## 15 30 10.25 75 25000 62507
## 16 5 10.25 75 25000 62507
## 17 30 10.25 75 25000 62507
## 18 30 10.25 75 25000 62507
## 19 30 10.25 75 25000 62507
## 20 18 10.25 75 25000 62507
## 21 30 10.25 75 25000 62507
## 22 16 10.25 75 25000 62507
## 23 30 10.25 75 25000 62507
## 24 30 10.25 75 25000 62507
## 25 30 10.25 75 25000 62507
## 26 30 10.25 75 25000 62507
## 27 30 10.25 75 25000 62507
## 28 30 10.25 75 25000 62507
## 29 26 10.25 75 25000 62507
## 30 30 10.25 75 25000 62507
## 31 30 10.25 75 25000 62507
## 32 30 10.25 75 25000 62507
## 33 6 10.25 75 25000 62507
## 34 16 10.25 75 25000 62507
## 35 30 10.25 75 25000 62507
## 36 30 10.25 75 25000 62507
## 37 30 10.25 75 25000 62507
## 38 30 10.25 75 25000 62507
## 39 30 10.25 75 25000 62507
## 40 30 10.25 75 25000 62507
## 41 26 10.25 75 25000 62507
## 42 30 10.25 75 25000 62507
## 43 30 10.25 75 25000 62507
## 44 30 10.25 75 25000 62507
## 45 16 10.25 75 25000 62507
## 46 5 10.25 75 25000 62507
## 47 30 10.25 75 25000 62507
## 48 30 10.25 75 25000 62507
## 49 30 10.25 75 25000 62507
## 50 18 10.25 75 25000 62507
## 51 30 10.25 75 25000 62507
## 52 16 10.25 75 25000 62507
## 53 30 10.25 75 25000 62507
## 54 30 10.25 75 25000 62507
## 55 30 10.25 75 25000 62507
## 56 30 10.25 75 25000 62507
## 57 30 10.25 75 25000 62507
## 58 30 10.25 75 25000 62507
## 59 26 10.25 75 25000 62507
## 60 30 10.25 75 25000 62507
## 61 5 10.25 75 25000 62507
## 62 30 10.25 75 25000 62507
## 63 30 10.25 75 25000 62507
## 64 30 10.25 75 25000 62507
## 65 18 10.25 75 25000 62507
## 66 30 10.25 75 25000 62507
## 67 16 10.25 75 25000 62507
## 68 30 10.25 75 25000 62507
## 69 30 10.25 75 25000 62507
## 70 30 10.25 75 25000 62507
## 71 30 10.25 75 25000 62507
## 72 30 10.25 75 25000 62507
## 73 30 10.25 75 25000 62507
## 74 26 10.25 75 25000 62507
## 75 30 10.25 75 25000 62507
getIndeedJobData5pages('massage therapist', 'Cranston','RI')
## Warning in getIndeedJobData5pages("massage therapist", "Cranston", "RI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Cranston", "RI"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist and/or Licencsed Esthetciian
## 2 Spa Massage Therapist
## 3 Spa Fjor Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Licensed Massage Therapist
## 6 Liscensed Massage Therapist
## 7 LMT Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist/Nail Technician/Esthetician/Manager
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Massage Therapist [CUSTOMIZATION REQUIRED]
## 14 Total Body Stretch Service Provider/Certified Personal Train...
## 15 Licensed Massage Therapists
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist/Nail Technician/Esthetician/Manager
## 18 Licensed Massage Therapist
## 19 Liscensed Massage Therapist
## 20 LMT Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Massage Therapist [CUSTOMIZATION REQUIRED]
## 24 Total Body Stretch Service Provider/Certified Personal Train...
## 25 Licensed Massage Therapists
## 26 Licensed Massage Therapist (LMT)
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Spa Massage Therapist
## 30 Spa Massage Therapist
## 31 Spa Fjor Massage Therapist
## 32 Licensed Massage Therapist (LMT)
## 33 Licensed Massage Therapist
## 34 Liscensed Massage Therapist
## 35 LMT Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist/Nail Technician/Esthetician/Manager
## 38 Licensed Massage Therapist
## 39 Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist [CUSTOMIZATION REQUIRED]
## 42 Total Body Stretch Service Provider/Certified Personal Train...
## 43 Licensed Massage Therapists
## 44 Licensed Massage Therapist (LMT)
## 45 Licensed Massage Therapist
## 46 Liscensed Massage Therapist
## 47 LMT Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Massage Therapist
## 50 Massage Therapist [CUSTOMIZATION REQUIRED]
## 51 Total Body Stretch Service Provider/Certified Personal Train...
## 52 Licensed Massage Therapists
## 53 Licensed Massage Therapist (LMT)
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Spa Massage Therapist
## 57 Licensed Massage Therapist (LMT)
## 58 Massage Therapist/Nail Technician/Esthetician/Manager
## 59 Spa Massage Therapist
## 60 Spa Fjor Massage Therapist
## 61 Licensed Massage Therapist (LMT)
## 62 Licensed Massage Therapist
## 63 Liscensed Massage Therapist
## 64 LMT Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Massage Therapist/Nail Technician/Esthetician/Manager
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Licensed Massage Therapist
## 70 Massage Therapist [CUSTOMIZATION REQUIRED]
## 71 Total Body Stretch Service Provider/Certified Personal Train...
## 72 Licensed Massage Therapists
## 73 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$38,942 - $62,507 a year $38942 - $62507 38942.00 62507
## 2 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 3 \n$50 - $75 an hour $50 - $75 50.00 75
## 4 \n$10.25 an hour $10.25 10.25 NA
## 5 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 6 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 7 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 8 \n$50 - $75 an hour $50 - $75 50.00 75
## 9 \n$10.25 an hour $10.25 10.25 NA
## 10 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 11 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 12 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 13 \n$50 - $75 an hour $50 - $75 50.00 75
## 14 \n$10.25 an hour $10.25 10.25 NA
## 15 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 16 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 17 \n$50 - $75 an hour $50 - $75 50.00 75
## 18 \n$10.25 an hour $10.25 10.25 NA
## 19 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## 20 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 21 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 22 \n$45,000 - $60,000 a year $45000 - $60000 45000.00 60000
## 23 \n$50 - $75 an hour $50 - $75 50.00 75
## 24 \n$10.25 an hour $10.25 10.25 NA
## 25 \n$30,000 - $50,000 a year $30000 - $50000 30000.00 50000
## 26 \n$25,000 - $35,000 a year $25000 - $35000 25000.00 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25000 30000 20740.12 28236.71 10.25
## 2 25000 30000 20740.12 28236.71 10.25
## 3 25000 30000 20740.12 28236.71 10.25
## 4 25000 30000 20740.12 28236.71 10.25
## 5 25000 30000 20740.12 28236.71 10.25
## 6 25000 30000 20740.12 28236.71 10.25
## 7 25000 30000 20740.12 28236.71 10.25
## 8 25000 30000 20740.12 28236.71 10.25
## 9 25000 30000 20740.12 28236.71 10.25
## 10 25000 30000 20740.12 28236.71 10.25
## 11 25000 30000 20740.12 28236.71 10.25
## 12 25000 30000 20740.12 28236.71 10.25
## 13 25000 30000 20740.12 28236.71 10.25
## 14 25000 30000 20740.12 28236.71 10.25
## 15 25000 30000 20740.12 28236.71 10.25
## 16 25000 30000 20740.12 28236.71 10.25
## 17 25000 30000 20740.12 28236.71 10.25
## 18 25000 30000 20740.12 28236.71 10.25
## 19 25000 30000 20740.12 28236.71 10.25
## 20 25000 30000 20740.12 28236.71 10.25
## 21 25000 30000 20740.12 28236.71 10.25
## 22 25000 30000 20740.12 28236.71 10.25
## 23 25000 30000 20740.12 28236.71 10.25
## 24 25000 30000 20740.12 28236.71 10.25
## 25 25000 30000 20740.12 28236.71 10.25
## 26 25000 30000 20740.12 28236.71 10.25
## maximumMaxSalary
## 1 62507
## 2 62507
## 3 62507
## 4 62507
## 5 62507
## 6 62507
## 7 62507
## 8 62507
## 9 62507
## 10 62507
## 11 62507
## 12 62507
## 13 62507
## 14 62507
## 15 62507
## 16 62507
## 17 62507
## 18 62507
## 19 62507
## 20 62507
## 21 62507
## 22 62507
## 23 62507
## 24 62507
## 25 62507
## 26 62507
##
## [[3]]
## date_daysAgo
## 1 10
## 2 6
## 3 5
## 4 16
## 5 18
## 6 16
## 7 30
## 8 30
## 9 30
## 10 30
## 11 30
## 12 30
## 13 30
## 14 30
## 15 30
## 16 16
## 17 30
## 18 18
## 19 16
## 20 30
## 21 30
## 22 30
## 23 30
## 24 30
## 25 30
## 26 26
## 27 30
## 28 30
## 29 6
## 30 6
## 31 5
## 32 16
## 33 18
## 34 16
## 35 30
## 36 30
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 26
## 45 18
## 46 16
## 47 30
## 48 30
## 49 30
## 50 30
## 51 30
## 52 30
## 53 26
## 54 30
## 55 30
## 56 6
## 57 16
## 58 30
## 59 6
## 60 5
## 61 16
## 62 18
## 63 16
## 64 30
## 65 30
## 66 30
## 67 30
## 68 30
## 69 30
## 70 30
## 71 30
## 72 30
## 73 26
##
## [[4]]
## HiringAgency
## 1 Citron SpaProvidence, RI 02906 (Wayland area)
## 2 Marriott International, Inc4.1Providence, RI+1 location
## 3 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 4 Elements Massage3.6Mansfield, MA 02048
## 5 Spa Newport 5 locationsNewport, RI
## 6 Form Massage TherapyNewport, RI
## 7 Body Matters Day SpaNewport, RI
## 8 Relaxation WorksRaynham, MA 02767
## 9 Elite SpaSeekonk, MA
## 10 Elements Massage3.6Mansfield, MA 02048
## 11 Massage Envy3.2North Attleboro, MA 02760+1 location
## 12 Bellezza Day SpaFranklin, MA 02038
## 13 Massage Envy3.2North Attleboro, MA 02760
## 14 Massage Envy3.2East Providence, RI 02914
## 15 Elements3.6Mansfield, MA 02048
## 16 Elements Massage3.6Mansfield, MA 02048
## 17 Elite SpaSeekonk, MA
## 18 Spa Newport 5 locationsNewport, RI
## 19 Form Massage TherapyNewport, RI
## 20 Body Matters Day SpaNewport, RI
## 21 Relaxation WorksRaynham, MA 02767
## 22 Massage Envy3.2North Attleboro, MA 02760+1 location
## 23 Massage Envy3.2North Attleboro, MA 02760
## 24 Massage Envy3.2East Providence, RI 02914
## 25 Elements3.6Mansfield, MA 02048
## 26 Relaxation WorksRaynham, MA 02767
## 27 Bellezza Day SpaFranklin, MA 02038
## 28 Elements Massage3.6Mansfield, MA 02048
## 29 Marriott International, Inc4.1Newport, RI 02840 (Long Wharf area)
## 30 Marriott International, Inc4.1Providence, RI+1 location
## 31 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 32 Elements Massage3.6Mansfield, MA 02048
## 33 Spa Newport 5 locationsNewport, RI
## 34 Form Massage TherapyNewport, RI
## 35 Body Matters Day SpaNewport, RI
## 36 Relaxation WorksRaynham, MA 02767
## 37 Elite SpaSeekonk, MA
## 38 Elements Massage3.6Mansfield, MA 02048
## 39 Massage Envy3.2North Attleboro, MA 02760+1 location
## 40 Bellezza Day SpaFranklin, MA 02038
## 41 Massage Envy3.2North Attleboro, MA 02760
## 42 Massage Envy3.2East Providence, RI 02914
## 43 Elements3.6Mansfield, MA 02048
## 44 Relaxation WorksRaynham, MA 02767
## 45 Spa Newport 5 locationsNewport, RI
## 46 Form Massage TherapyNewport, RI
## 47 Body Matters Day SpaNewport, RI
## 48 Relaxation WorksRaynham, MA 02767
## 49 Massage Envy3.2North Attleboro, MA 02760+1 location
## 50 Massage Envy3.2North Attleboro, MA 02760
## 51 Massage Envy3.2East Providence, RI 02914
## 52 Elements3.6Mansfield, MA 02048
## 53 Relaxation WorksRaynham, MA 02767
## 54 Bellezza Day SpaFranklin, MA 02038
## 55 Elements Massage3.6Mansfield, MA 02048
## 56 Marriott International, Inc4.1Newport, RI 02840 (Long Wharf area)
## 57 Elements Massage3.6Mansfield, MA 02048
## 58 Elite SpaSeekonk, MA
## 59 Marriott International, Inc4.1Providence, RI+1 location
## 60 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 61 Elements Massage3.6Mansfield, MA 02048
## 62 Spa Newport 5 locationsNewport, RI
## 63 Form Massage TherapyNewport, RI
## 64 Body Matters Day SpaNewport, RI
## 65 Relaxation WorksRaynham, MA 02767
## 66 Elite SpaSeekonk, MA
## 67 Elements Massage3.6Mansfield, MA 02048
## 68 Massage Envy3.2North Attleboro, MA 02760+1 location
## 69 Bellezza Day SpaFranklin, MA 02038
## 70 Massage Envy3.2North Attleboro, MA 02760
## 71 Massage Envy3.2East Providence, RI 02914
## 72 Elements3.6Mansfield, MA 02048
## 73 Relaxation WorksRaynham, MA 02767
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$38,942 - $62,507 a year $38942 - $62507 38942 62507
## 2 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 5 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 6 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 7 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 10 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 11 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 12 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 15 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 16 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 19 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 20 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 21 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 22 \n$45,000 - $60,000 a year $45000 - $60000 45000 60000
## 25 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 26 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30000 50000 33683.88 49219.19 25000
## 2 30000 50000 33683.88 49219.19 25000
## 5 30000 50000 33683.88 49219.19 25000
## 6 30000 50000 33683.88 49219.19 25000
## 7 30000 50000 33683.88 49219.19 25000
## 10 30000 50000 33683.88 49219.19 25000
## 11 30000 50000 33683.88 49219.19 25000
## 12 30000 50000 33683.88 49219.19 25000
## 15 30000 50000 33683.88 49219.19 25000
## 16 30000 50000 33683.88 49219.19 25000
## 19 30000 50000 33683.88 49219.19 25000
## 20 30000 50000 33683.88 49219.19 25000
## 21 30000 50000 33683.88 49219.19 25000
## 22 30000 50000 33683.88 49219.19 25000
## 25 30000 50000 33683.88 49219.19 25000
## 26 30000 50000 33683.88 49219.19 25000
## maximumMaxSalary
## 1 62507
## 2 62507
## 5 62507
## 6 62507
## 7 62507
## 10 62507
## 11 62507
## 12 62507
## 15 62507
## 16 62507
## 19 62507
## 20 62507
## 21 62507
## 22 62507
## 25 62507
## 26 62507
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 3 \n$50 - $75 an hour $50 - $75 50.00 75 30.125
## 4 \n$10.25 an hour $10.25 10.25 NA 30.125
## 8 \n$50 - $75 an hour $50 - $75 50.00 75 30.125
## 9 \n$10.25 an hour $10.25 10.25 NA 30.125
## 13 \n$50 - $75 an hour $50 - $75 50.00 75 30.125
## 14 \n$10.25 an hour $10.25 10.25 NA 30.125
## 17 \n$50 - $75 an hour $50 - $75 50.00 75 30.125
## 18 \n$10.25 an hour $10.25 10.25 NA 30.125
## 23 \n$50 - $75 an hour $50 - $75 50.00 75 30.125
## 24 \n$10.25 an hour $10.25 10.25 NA 30.125
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 3 75 30.125 75 10.25 75
## 4 75 30.125 75 10.25 75
## 8 75 30.125 75 10.25 75
## 9 75 30.125 75 10.25 75
## 13 75 30.125 75 10.25 75
## 14 75 30.125 75 10.25 75
## 17 75 30.125 75 10.25 75
## 18 75 30.125 75 10.25 75
## 23 75 30.125 75 10.25 75
## 24 75 30.125 75 10.25 75
##
## [[7]]
## city state
## 1 Cranston RI
## 2 Cranston RI
## 3 Cranston RI
## 4 Cranston RI
## 5 Cranston RI
## 6 Cranston RI
## 7 Cranston RI
## 8 Cranston RI
## 9 Cranston RI
## 10 Cranston RI
## 11 Cranston RI
## 12 Cranston RI
## 13 Cranston RI
## 14 Cranston RI
## 15 Cranston RI
## 16 Cranston RI
## 17 Cranston RI
## 18 Cranston RI
## 19 Cranston RI
## 20 Cranston RI
## 21 Cranston RI
## 22 Cranston RI
## 23 Cranston RI
## 24 Cranston RI
## 25 Cranston RI
## 26 Cranston RI
## 27 Cranston RI
## 28 Cranston RI
## 29 Cranston RI
## 30 Cranston RI
## 31 Cranston RI
## 32 Cranston RI
## 33 Cranston RI
## 34 Cranston RI
## 35 Cranston RI
## 36 Cranston RI
## 37 Cranston RI
## 38 Cranston RI
## 39 Cranston RI
## 40 Cranston RI
## 41 Cranston RI
## 42 Cranston RI
## 43 Cranston RI
## 44 Cranston RI
## 45 Cranston RI
## 46 Cranston RI
## 47 Cranston RI
## 48 Cranston RI
## 49 Cranston RI
## 50 Cranston RI
## 51 Cranston RI
## 52 Cranston RI
## 53 Cranston RI
## 54 Cranston RI
## 55 Cranston RI
## 56 Cranston RI
## 57 Cranston RI
## 58 Cranston RI
## 59 Cranston RI
## 60 Cranston RI
## 61 Cranston RI
## 62 Cranston RI
## 63 Cranston RI
## 64 Cranston RI
## 65 Cranston RI
## 66 Cranston RI
## 67 Cranston RI
## 68 Cranston RI
## 69 Cranston RI
## 70 Cranston RI
## 71 Cranston RI
## 72 Cranston RI
## 73 Cranston RI
## jobTitle
## 1 Licensed Massage Therapist and/or Licencsed Esthetciian
## 2 Spa Massage Therapist
## 3 Spa Fjor Massage Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Licensed Massage Therapist
## 6 Liscensed Massage Therapist
## 7 LMT Licensed Massage Therapist
## 8 Licensed Massage Therapist
## 9 Massage Therapist/Nail Technician/Esthetician/Manager
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Massage Therapist [CUSTOMIZATION REQUIRED]
## 14 Total Body Stretch Service Provider/Certified Personal Train...
## 15 Licensed Massage Therapists
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist/Nail Technician/Esthetician/Manager
## 18 Licensed Massage Therapist
## 19 Liscensed Massage Therapist
## 20 LMT Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Massage Therapist [CUSTOMIZATION REQUIRED]
## 24 Total Body Stretch Service Provider/Certified Personal Train...
## 25 Licensed Massage Therapists
## 26 Licensed Massage Therapist (LMT)
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Spa Massage Therapist
## 30 Spa Massage Therapist
## 31 Spa Fjor Massage Therapist
## 32 Licensed Massage Therapist (LMT)
## 33 Licensed Massage Therapist
## 34 Liscensed Massage Therapist
## 35 LMT Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist/Nail Technician/Esthetician/Manager
## 38 Licensed Massage Therapist
## 39 Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist [CUSTOMIZATION REQUIRED]
## 42 Total Body Stretch Service Provider/Certified Personal Train...
## 43 Licensed Massage Therapists
## 44 Licensed Massage Therapist (LMT)
## 45 Licensed Massage Therapist
## 46 Liscensed Massage Therapist
## 47 LMT Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Massage Therapist
## 50 Massage Therapist [CUSTOMIZATION REQUIRED]
## 51 Total Body Stretch Service Provider/Certified Personal Train...
## 52 Licensed Massage Therapists
## 53 Licensed Massage Therapist (LMT)
## 54 Licensed Massage Therapist
## 55 Licensed Massage Therapist
## 56 Spa Massage Therapist
## 57 Licensed Massage Therapist (LMT)
## 58 Massage Therapist/Nail Technician/Esthetician/Manager
## 59 Spa Massage Therapist
## 60 Spa Fjor Massage Therapist
## 61 Licensed Massage Therapist (LMT)
## 62 Licensed Massage Therapist
## 63 Liscensed Massage Therapist
## 64 LMT Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Massage Therapist/Nail Technician/Esthetician/Manager
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Licensed Massage Therapist
## 70 Massage Therapist [CUSTOMIZATION REQUIRED]
## 71 Total Body Stretch Service Provider/Certified Personal Train...
## 72 Licensed Massage Therapists
## 73 Licensed Massage Therapist (LMT)
## HiringAgency
## 1 Citron SpaProvidence, RI 02906 (Wayland area)
## 2 Marriott International, Inc4.1Providence, RI+1 location
## 3 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 4 Elements Massage3.6Mansfield, MA 02048
## 5 Spa Newport 5 locationsNewport, RI
## 6 Form Massage TherapyNewport, RI
## 7 Body Matters Day SpaNewport, RI
## 8 Relaxation WorksRaynham, MA 02767
## 9 Elite SpaSeekonk, MA
## 10 Elements Massage3.6Mansfield, MA 02048
## 11 Massage Envy3.2North Attleboro, MA 02760+1 location
## 12 Bellezza Day SpaFranklin, MA 02038
## 13 Massage Envy3.2North Attleboro, MA 02760
## 14 Massage Envy3.2East Providence, RI 02914
## 15 Elements3.6Mansfield, MA 02048
## 16 Elements Massage3.6Mansfield, MA 02048
## 17 Elite SpaSeekonk, MA
## 18 Spa Newport 5 locationsNewport, RI
## 19 Form Massage TherapyNewport, RI
## 20 Body Matters Day SpaNewport, RI
## 21 Relaxation WorksRaynham, MA 02767
## 22 Massage Envy3.2North Attleboro, MA 02760+1 location
## 23 Massage Envy3.2North Attleboro, MA 02760
## 24 Massage Envy3.2East Providence, RI 02914
## 25 Elements3.6Mansfield, MA 02048
## 26 Relaxation WorksRaynham, MA 02767
## 27 Bellezza Day SpaFranklin, MA 02038
## 28 Elements Massage3.6Mansfield, MA 02048
## 29 Marriott International, Inc4.1Newport, RI 02840 (Long Wharf area)
## 30 Marriott International, Inc4.1Providence, RI+1 location
## 31 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 32 Elements Massage3.6Mansfield, MA 02048
## 33 Spa Newport 5 locationsNewport, RI
## 34 Form Massage TherapyNewport, RI
## 35 Body Matters Day SpaNewport, RI
## 36 Relaxation WorksRaynham, MA 02767
## 37 Elite SpaSeekonk, MA
## 38 Elements Massage3.6Mansfield, MA 02048
## 39 Massage Envy3.2North Attleboro, MA 02760+1 location
## 40 Bellezza Day SpaFranklin, MA 02038
## 41 Massage Envy3.2North Attleboro, MA 02760
## 42 Massage Envy3.2East Providence, RI 02914
## 43 Elements3.6Mansfield, MA 02048
## 44 Relaxation WorksRaynham, MA 02767
## 45 Spa Newport 5 locationsNewport, RI
## 46 Form Massage TherapyNewport, RI
## 47 Body Matters Day SpaNewport, RI
## 48 Relaxation WorksRaynham, MA 02767
## 49 Massage Envy3.2North Attleboro, MA 02760+1 location
## 50 Massage Envy3.2North Attleboro, MA 02760
## 51 Massage Envy3.2East Providence, RI 02914
## 52 Elements3.6Mansfield, MA 02048
## 53 Relaxation WorksRaynham, MA 02767
## 54 Bellezza Day SpaFranklin, MA 02038
## 55 Elements Massage3.6Mansfield, MA 02048
## 56 Marriott International, Inc4.1Newport, RI 02840 (Long Wharf area)
## 57 Elements Massage3.6Mansfield, MA 02048
## 58 Elite SpaSeekonk, MA
## 59 Marriott International, Inc4.1Providence, RI+1 location
## 60 Hotel Viking3.7Newport, RI 02840 (Historic Hill area)
## 61 Elements Massage3.6Mansfield, MA 02048
## 62 Spa Newport 5 locationsNewport, RI
## 63 Form Massage TherapyNewport, RI
## 64 Body Matters Day SpaNewport, RI
## 65 Relaxation WorksRaynham, MA 02767
## 66 Elite SpaSeekonk, MA
## 67 Elements Massage3.6Mansfield, MA 02048
## 68 Massage Envy3.2North Attleboro, MA 02760+1 location
## 69 Bellezza Day SpaFranklin, MA 02038
## 70 Massage Envy3.2North Attleboro, MA 02760
## 71 Massage Envy3.2East Providence, RI 02914
## 72 Elements3.6Mansfield, MA 02048
## 73 Relaxation WorksRaynham, MA 02767
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 10 10.25 75 25000 62507
## 2 6 10.25 75 25000 62507
## 3 5 10.25 75 25000 62507
## 4 16 10.25 75 25000 62507
## 5 18 10.25 75 25000 62507
## 6 16 10.25 75 25000 62507
## 7 30 10.25 75 25000 62507
## 8 30 10.25 75 25000 62507
## 9 30 10.25 75 25000 62507
## 10 30 10.25 75 25000 62507
## 11 30 10.25 75 25000 62507
## 12 30 10.25 75 25000 62507
## 13 30 10.25 75 25000 62507
## 14 30 10.25 75 25000 62507
## 15 30 10.25 75 25000 62507
## 16 16 10.25 75 25000 62507
## 17 30 10.25 75 25000 62507
## 18 18 10.25 75 25000 62507
## 19 16 10.25 75 25000 62507
## 20 30 10.25 75 25000 62507
## 21 30 10.25 75 25000 62507
## 22 30 10.25 75 25000 62507
## 23 30 10.25 75 25000 62507
## 24 30 10.25 75 25000 62507
## 25 30 10.25 75 25000 62507
## 26 26 10.25 75 25000 62507
## 27 30 10.25 75 25000 62507
## 28 30 10.25 75 25000 62507
## 29 6 10.25 75 25000 62507
## 30 6 10.25 75 25000 62507
## 31 5 10.25 75 25000 62507
## 32 16 10.25 75 25000 62507
## 33 18 10.25 75 25000 62507
## 34 16 10.25 75 25000 62507
## 35 30 10.25 75 25000 62507
## 36 30 10.25 75 25000 62507
## 37 30 10.25 75 25000 62507
## 38 30 10.25 75 25000 62507
## 39 30 10.25 75 25000 62507
## 40 30 10.25 75 25000 62507
## 41 30 10.25 75 25000 62507
## 42 30 10.25 75 25000 62507
## 43 30 10.25 75 25000 62507
## 44 26 10.25 75 25000 62507
## 45 18 10.25 75 25000 62507
## 46 16 10.25 75 25000 62507
## 47 30 10.25 75 25000 62507
## 48 30 10.25 75 25000 62507
## 49 30 10.25 75 25000 62507
## 50 30 10.25 75 25000 62507
## 51 30 10.25 75 25000 62507
## 52 30 10.25 75 25000 62507
## 53 26 10.25 75 25000 62507
## 54 30 10.25 75 25000 62507
## 55 30 10.25 75 25000 62507
## 56 6 10.25 75 25000 62507
## 57 16 10.25 75 25000 62507
## 58 30 10.25 75 25000 62507
## 59 6 10.25 75 25000 62507
## 60 5 10.25 75 25000 62507
## 61 16 10.25 75 25000 62507
## 62 18 10.25 75 25000 62507
## 63 16 10.25 75 25000 62507
## 64 30 10.25 75 25000 62507
## 65 30 10.25 75 25000 62507
## 66 30 10.25 75 25000 62507
## 67 30 10.25 75 25000 62507
## 68 30 10.25 75 25000 62507
## 69 30 10.25 75 25000 62507
## 70 30 10.25 75 25000 62507
## 71 30 10.25 75 25000 62507
## 72 30 10.25 75 25000 62507
## 73 26 10.25 75 25000 62507
getIndeedJobData5pages('massage therapist', 'Allentown','RI')
## [[1]]
## [1] jobTitle
## <0 rows> (or 0-length row.names)
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## [1] date_daysAgo
## <0 rows> (or 0-length row.names)
##
## [[4]]
## [1] HiringAgency
## <0 rows> (or 0-length row.names)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## [1] city state jobTitle HiringAgency
## [5] date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary
## [9] MaxAnnualSalary
## <0 rows> (or 0-length row.names)
South Carolina Charleston, Columbia, North Charleston
getIndeedJobData5pages('massage therapist', 'Charleston','SC')
## Warning in getIndeedJobData5pages("massage therapist", "Charleston", "SC"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Charleston", "SC"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist - Independent Contractor
## 4 Licensed Massage Therapist (LMT)
## 5 MASSAGE THERAPIST
## 6 Massage Therapist - Independent Contractor
## 7 Massage Therapist - LMT
## 8 Liscensed Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist LMT (Full Time and Part Time)
## 11 Licensed Massage Therapist (LMT)
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist, LMT
## 15 Licensed Massage Therapist
## 16 Massage Therapist - Independent Contractor
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist, LMT
## 19 Licensed Massage Therapist (LMT)
## 20 Licensed Massage Therapist (LMT)
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist (LMT)
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist
## 25 Massage Therapist, Mount Pleasant
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Mobile Massage Therapist
## 29 Massage Therapist
## 30 Licensed Massage Therapists Needed
## 31 Massage Therapist - Independent Contractor
## 32 Massage Therapist - Independent Contractor
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist, LMT
## 38 Massage Therapist, Mount Pleasant
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Mobile Massage Therapist
## 42 Massage Therapist
## 43 Licensed Massage Therapists Needed
## 44 Massage Therapist - Independent Contractor
## 45 Massage Therapist - Independent Contractor
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist (LMT)
## 48 Massage Therapist - Independent Contractor
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist, LMT
## 52 Licensed Massage Therapist (LMT)
## 53 Liscensed Massage Therapist
## 54 Massage Therapist
## 55 Massage Therapist LMT (Full Time and Part Time)
## 56 Licensed Massage Therapist (LMT)
## 57 Massage Therapist
## 58 Massage Therapist, Mount Pleasant
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Mobile Massage Therapist
## 62 Licensed Massage Therapist
## 63 Massage Therapist
## 64 Licensed Massage Therapists Needed
## 65 Massage Therapist - Independent Contractor
## 66 Massage Therapist - Independent Contractor
## 67 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35 - $40 an hour $35 - $40 35 40
## 2 \n$21 - $40 an hour $21 - $40 21 40
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$25 - $35 an hour $25 - $35 25 35
## 5 \n$25 an hour $25 25 NA
## 6 \n$2,000 - $4,000 a month $2000 - $4000 2000 4000
## 7 \n$25 - $35 an hour $25 - $35 25 35
## 8 \n$25 - $35 an hour $25 - $35 25 35
## 9 \n$35 - $40 an hour $35 - $40 35 40
## 10 \n$35 - $40 an hour $35 - $40 35 40
## 11 \n$45 - $70 an hour $45 - $70 45 70
## 12 \n$24 - $38 an hour $24 - $38 24 38
## 13 \n$25 - $35 an hour $25 - $35 25 35
## 14 \n$45 - $70 an hour $45 - $70 45 70
## 15 \n$24 - $38 an hour $24 - $38 24 38
## 16 \n$25 - $35 an hour $25 - $35 25 35
## 17 \n$35 - $40 an hour $35 - $40 35 40
## 18 \n$25 an hour $25 25 NA
## 19 \n$2,000 - $4,000 a month $2000 - $4000 2000 4000
## 20 \n$45 - $70 an hour $45 - $70 45 70
## 21 \n$24 - $38 an hour $24 - $38 24 38
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 36.5 454.4286 756.05 21
## 2 25 36.5 454.4286 756.05 21
## 3 25 36.5 454.4286 756.05 21
## 4 25 36.5 454.4286 756.05 21
## 5 25 36.5 454.4286 756.05 21
## 6 25 36.5 454.4286 756.05 21
## 7 25 36.5 454.4286 756.05 21
## 8 25 36.5 454.4286 756.05 21
## 9 25 36.5 454.4286 756.05 21
## 10 25 36.5 454.4286 756.05 21
## 11 25 36.5 454.4286 756.05 21
## 12 25 36.5 454.4286 756.05 21
## 13 25 36.5 454.4286 756.05 21
## 14 25 36.5 454.4286 756.05 21
## 15 25 36.5 454.4286 756.05 21
## 16 25 36.5 454.4286 756.05 21
## 17 25 36.5 454.4286 756.05 21
## 18 25 36.5 454.4286 756.05 21
## 19 25 36.5 454.4286 756.05 21
## 20 25 36.5 454.4286 756.05 21
## 21 25 36.5 454.4286 756.05 21
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 Today
## 4 28
## 5 17
## 6 5
## 7 20
## 8 8
## 9 30
## 10 30
## 11 30
## 12 30
## 13 30
## 14 30
## 15 30
## 16 Today
## 17 7
## 18 30
## 19 30
## 20 23
## 21 30
## 22 30
## 23 Today
## 24 30
## 25 13
## 26 7
## 27 30
## 28 30
## 29 30
## 30 30
## 31 21
## 32 26
## 33 30
## 34 23
## 35 7
## 36 30
## 37 30
## 38 13
## 39 7
## 40 30
## 41 30
## 42 30
## 43 30
## 44 21
## 45 26
## 46 30
## 47 23
## 48 Today
## 49 30
## 50 30
## 51 30
## 52 30
## 53 8
## 54 30
## 55 30
## 56 30
## 57 30
## 58 13
## 59 7
## 60 30
## 61 30
## 62 7
## 63 30
## 64 30
## 65 21
## 66 26
## 67 23
##
## [[4]]
## HiringAgency
## 1 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 2 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 3 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 4 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 5 Wild Dunes Resort4.0Isle of Palms, SC
## 6 Indo-Pak Massage TherapyNorth Charleston, SC+1 location•Remote work available
## 7 Sessions Chiropractic ClinicNorth Charleston, SC
## 8 Trident ChiropracticNorth Charleston, SC 29406
## 9 Elements3.6Mount Pleasant, SC 29466
## 10 Kiawah Island Club4.2Kiawah Island, SC 29455
## 11 Book a BirdieCharleston, SC
## 12 Kiawah Island Club4.2Johns Island, SC 29455
## 13 Urban Nirvana Spas & SalonsCharleston, SC
## 14 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 15 Urban Nirvana Spas & SalonsCharleston, SC
## 16 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 17 Hand and Stone Spa3.0Summerville, SC 29485
## 18 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 19 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 20 Simply Your Spa3.7Charleston, SC 29407
## 21 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 22 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 23 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 24 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 25 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 26 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 27 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 28 Indo-Pak Massage TherapyMount Pleasant, SC
## 29 Massage Envy3.2Mount Pleasant, SC 29464+2 locations
## 30 Zen Massage MooresvilleNorth Charleston, SC 29406
## 31 Carolina Spine and SportCharleston, SC 29407
## 32 SIZODAZ SALONSummerville, SC 29485
## 33 Hand and Stone3.0Summerville, SC 29483
## 34 Simply Your Spa3.7Charleston, SC 29407
## 35 Hand and Stone Spa3.0Summerville, SC 29485
## 36 Urban Nirvana Spas & SalonsCharleston, SC
## 37 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 38 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 39 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 40 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 41 Indo-Pak Massage TherapyMount Pleasant, SC
## 42 Massage Envy3.2Mount Pleasant, SC 29464+2 locations
## 43 Zen Massage MooresvilleNorth Charleston, SC 29406
## 44 Carolina Spine and SportCharleston, SC 29407
## 45 SIZODAZ SALONSummerville, SC 29485
## 46 Hand and Stone3.0Summerville, SC 29483
## 47 Simply Your Spa3.7Charleston, SC 29407
## 48 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 49 Urban Nirvana Spas & SalonsCharleston, SC
## 50 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 51 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 52 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 53 Trident ChiropracticNorth Charleston, SC 29406
## 54 Elements3.6Mount Pleasant, SC 29466
## 55 Kiawah Island Club4.2Kiawah Island, SC 29455
## 56 Book a BirdieCharleston, SC
## 57 Kiawah Island Club4.2Johns Island, SC 29455
## 58 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 59 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 60 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 61 Indo-Pak Massage TherapyMount Pleasant, SC
## 62 Hand and Stone Spa3.0Summerville, SC 29485
## 63 Massage Envy3.2Mount Pleasant, SC 29464+2 locations
## 64 Zen Massage MooresvilleNorth Charleston, SC 29406
## 65 Carolina Spine and SportCharleston, SC 29407
## 66 SIZODAZ SALONSummerville, SC 29485
## 67 Simply Your Spa3.7Charleston, SC 29407
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$35 - $40 an hour $35 - $40 35 40 25
## 2 \n$21 - $40 an hour $21 - $40 21 40 25
## 4 \n$25 - $35 an hour $25 - $35 25 35 25
## 5 \n$25 an hour $25 25 NA 25
## 7 \n$25 - $35 an hour $25 - $35 25 35 25
## 8 \n$25 - $35 an hour $25 - $35 25 35 25
## 9 \n$35 - $40 an hour $35 - $40 35 40 25
## 10 \n$35 - $40 an hour $35 - $40 35 40 25
## 11 \n$45 - $70 an hour $45 - $70 45 70 25
## 12 \n$24 - $38 an hour $24 - $38 24 38 25
## 13 \n$25 - $35 an hour $25 - $35 25 35 25
## 14 \n$45 - $70 an hour $45 - $70 45 70 25
## 15 \n$24 - $38 an hour $24 - $38 24 38 25
## 16 \n$25 - $35 an hour $25 - $35 25 35 25
## 17 \n$35 - $40 an hour $35 - $40 35 40 25
## 18 \n$25 an hour $25 25 NA 25
## 20 \n$45 - $70 an hour $45 - $70 45 70 25
## 21 \n$24 - $38 an hour $24 - $38 24 38 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 39 30.16667 43.6875 21 70
## 2 39 30.16667 43.6875 21 70
## 4 39 30.16667 43.6875 21 70
## 5 39 30.16667 43.6875 21 70
## 7 39 30.16667 43.6875 21 70
## 8 39 30.16667 43.6875 21 70
## 9 39 30.16667 43.6875 21 70
## 10 39 30.16667 43.6875 21 70
## 11 39 30.16667 43.6875 21 70
## 12 39 30.16667 43.6875 21 70
## 13 39 30.16667 43.6875 21 70
## 14 39 30.16667 43.6875 21 70
## 15 39 30.16667 43.6875 21 70
## 16 39 30.16667 43.6875 21 70
## 17 39 30.16667 43.6875 21 70
## 18 39 30.16667 43.6875 21 70
## 20 39 30.16667 43.6875 21 70
## 21 39 30.16667 43.6875 21 70
##
## [[7]]
## city state jobTitle
## 1 Charleston SC Licensed Massage Therapist
## 2 Charleston SC Licensed Massage Therapist (LMT)
## 3 Charleston SC Massage Therapist - Independent Contractor
## 4 Charleston SC Licensed Massage Therapist (LMT)
## 5 Charleston SC MASSAGE THERAPIST
## 6 Charleston SC Massage Therapist - Independent Contractor
## 7 Charleston SC Massage Therapist - LMT
## 8 Charleston SC Liscensed Massage Therapist
## 9 Charleston SC Massage Therapist
## 10 Charleston SC Massage Therapist LMT (Full Time and Part Time)
## 11 Charleston SC Licensed Massage Therapist (LMT)
## 12 Charleston SC Massage Therapist
## 13 Charleston SC Licensed Massage Therapist
## 14 Charleston SC Licensed Massage Therapist, LMT
## 15 Charleston SC Licensed Massage Therapist
## 16 Charleston SC Massage Therapist - Independent Contractor
## 17 Charleston SC Licensed Massage Therapist
## 18 Charleston SC Licensed Massage Therapist, LMT
## 19 Charleston SC Licensed Massage Therapist (LMT)
## 20 Charleston SC Licensed Massage Therapist (LMT)
## 21 Charleston SC Licensed Massage Therapist
## 22 Charleston SC Licensed Massage Therapist (LMT)
## 23 Charleston SC Massage Therapist - Independent Contractor
## 24 Charleston SC Licensed Massage Therapist
## 25 Charleston SC Massage Therapist, Mount Pleasant
## 26 Charleston SC Licensed Massage Therapist
## 27 Charleston SC Licensed Massage Therapist
## 28 Charleston SC Mobile Massage Therapist
## 29 Charleston SC Massage Therapist
## 30 Charleston SC Licensed Massage Therapists Needed
## 31 Charleston SC Massage Therapist - Independent Contractor
## 32 Charleston SC Massage Therapist - Independent Contractor
## 33 Charleston SC Licensed Massage Therapist
## 34 Charleston SC Licensed Massage Therapist (LMT)
## 35 Charleston SC Licensed Massage Therapist
## 36 Charleston SC Licensed Massage Therapist
## 37 Charleston SC Licensed Massage Therapist, LMT
## 38 Charleston SC Massage Therapist, Mount Pleasant
## 39 Charleston SC Licensed Massage Therapist
## 40 Charleston SC Licensed Massage Therapist
## 41 Charleston SC Mobile Massage Therapist
## 42 Charleston SC Massage Therapist
## 43 Charleston SC Licensed Massage Therapists Needed
## 44 Charleston SC Massage Therapist - Independent Contractor
## 45 Charleston SC Massage Therapist - Independent Contractor
## 46 Charleston SC Licensed Massage Therapist
## 47 Charleston SC Licensed Massage Therapist (LMT)
## 48 Charleston SC Massage Therapist - Independent Contractor
## 49 Charleston SC Licensed Massage Therapist
## 50 Charleston SC Licensed Massage Therapist
## 51 Charleston SC Licensed Massage Therapist, LMT
## 52 Charleston SC Licensed Massage Therapist (LMT)
## 53 Charleston SC Liscensed Massage Therapist
## 54 Charleston SC Massage Therapist
## 55 Charleston SC Massage Therapist LMT (Full Time and Part Time)
## 56 Charleston SC Licensed Massage Therapist (LMT)
## 57 Charleston SC Massage Therapist
## 58 Charleston SC Massage Therapist, Mount Pleasant
## 59 Charleston SC Licensed Massage Therapist
## 60 Charleston SC Licensed Massage Therapist
## 61 Charleston SC Mobile Massage Therapist
## 62 Charleston SC Licensed Massage Therapist
## 63 Charleston SC Massage Therapist
## 64 Charleston SC Licensed Massage Therapists Needed
## 65 Charleston SC Massage Therapist - Independent Contractor
## 66 Charleston SC Massage Therapist - Independent Contractor
## 67 Charleston SC Licensed Massage Therapist (LMT)
## HiringAgency
## 1 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 2 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 3 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 4 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 5 Wild Dunes Resort4.0Isle of Palms, SC
## 6 Indo-Pak Massage TherapyNorth Charleston, SC+1 location•Remote work available
## 7 Sessions Chiropractic ClinicNorth Charleston, SC
## 8 Trident ChiropracticNorth Charleston, SC 29406
## 9 Elements3.6Mount Pleasant, SC 29466
## 10 Kiawah Island Club4.2Kiawah Island, SC 29455
## 11 Book a BirdieCharleston, SC
## 12 Kiawah Island Club4.2Johns Island, SC 29455
## 13 Urban Nirvana Spas & SalonsCharleston, SC
## 14 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 15 Urban Nirvana Spas & SalonsCharleston, SC
## 16 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 17 Hand and Stone Spa3.0Summerville, SC 29485
## 18 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 19 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 20 Simply Your Spa3.7Charleston, SC 29407
## 21 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 22 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 23 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 24 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 25 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 26 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 27 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 28 Indo-Pak Massage TherapyMount Pleasant, SC
## 29 Massage Envy3.2Mount Pleasant, SC 29464+2 locations
## 30 Zen Massage MooresvilleNorth Charleston, SC 29406
## 31 Carolina Spine and SportCharleston, SC 29407
## 32 SIZODAZ SALONSummerville, SC 29485
## 33 Hand and Stone3.0Summerville, SC 29483
## 34 Simply Your Spa3.7Charleston, SC 29407
## 35 Hand and Stone Spa3.0Summerville, SC 29485
## 36 Urban Nirvana Spas & SalonsCharleston, SC
## 37 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 38 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 39 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 40 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 41 Indo-Pak Massage TherapyMount Pleasant, SC
## 42 Massage Envy3.2Mount Pleasant, SC 29464+2 locations
## 43 Zen Massage MooresvilleNorth Charleston, SC 29406
## 44 Carolina Spine and SportCharleston, SC 29407
## 45 SIZODAZ SALONSummerville, SC 29485
## 46 Hand and Stone3.0Summerville, SC 29483
## 47 Simply Your Spa3.7Charleston, SC 29407
## 48 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 49 Urban Nirvana Spas & SalonsCharleston, SC
## 50 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 51 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 52 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 53 Trident ChiropracticNorth Charleston, SC 29406
## 54 Elements3.6Mount Pleasant, SC 29466
## 55 Kiawah Island Club4.2Kiawah Island, SC 29455
## 56 Book a BirdieCharleston, SC
## 57 Kiawah Island Club4.2Johns Island, SC 29455
## 58 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 59 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 60 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 61 Indo-Pak Massage TherapyMount Pleasant, SC
## 62 Hand and Stone Spa3.0Summerville, SC 29485
## 63 Massage Envy3.2Mount Pleasant, SC 29464+2 locations
## 64 Zen Massage MooresvilleNorth Charleston, SC 29406
## 65 Carolina Spine and SportCharleston, SC 29407
## 66 SIZODAZ SALONSummerville, SC 29485
## 67 Simply Your Spa3.7Charleston, SC 29407
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 21 70 NA NA
## 2 30 21 70 NA NA
## 3 Today 21 70 NA NA
## 4 28 21 70 NA NA
## 5 17 21 70 NA NA
## 6 5 21 70 NA NA
## 7 20 21 70 NA NA
## 8 8 21 70 NA NA
## 9 30 21 70 NA NA
## 10 30 21 70 NA NA
## 11 30 21 70 NA NA
## 12 30 21 70 NA NA
## 13 30 21 70 NA NA
## 14 30 21 70 NA NA
## 15 30 21 70 NA NA
## 16 Today 21 70 NA NA
## 17 7 21 70 NA NA
## 18 30 21 70 NA NA
## 19 30 21 70 NA NA
## 20 23 21 70 NA NA
## 21 30 21 70 NA NA
## 22 30 21 70 NA NA
## 23 Today 21 70 NA NA
## 24 30 21 70 NA NA
## 25 13 21 70 NA NA
## 26 7 21 70 NA NA
## 27 30 21 70 NA NA
## 28 30 21 70 NA NA
## 29 30 21 70 NA NA
## 30 30 21 70 NA NA
## 31 21 21 70 NA NA
## 32 26 21 70 NA NA
## 33 30 21 70 NA NA
## 34 23 21 70 NA NA
## 35 7 21 70 NA NA
## 36 30 21 70 NA NA
## 37 30 21 70 NA NA
## 38 13 21 70 NA NA
## 39 7 21 70 NA NA
## 40 30 21 70 NA NA
## 41 30 21 70 NA NA
## 42 30 21 70 NA NA
## 43 30 21 70 NA NA
## 44 21 21 70 NA NA
## 45 26 21 70 NA NA
## 46 30 21 70 NA NA
## 47 23 21 70 NA NA
## 48 Today 21 70 NA NA
## 49 30 21 70 NA NA
## 50 30 21 70 NA NA
## 51 30 21 70 NA NA
## 52 30 21 70 NA NA
## 53 8 21 70 NA NA
## 54 30 21 70 NA NA
## 55 30 21 70 NA NA
## 56 30 21 70 NA NA
## 57 30 21 70 NA NA
## 58 13 21 70 NA NA
## 59 7 21 70 NA NA
## 60 30 21 70 NA NA
## 61 30 21 70 NA NA
## 62 7 21 70 NA NA
## 63 30 21 70 NA NA
## 64 30 21 70 NA NA
## 65 21 21 70 NA NA
## 66 26 21 70 NA NA
## 67 23 21 70 NA NA
getIndeedJobData5pages('massage therapist', 'Columbia','SC')
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist Columbia SC
## 4 Massage Therapist
## 5 Total Body Stretch Service Provider
## 6 Massage Therapist - Independent Contractor
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist Columbia SC
## 9 Massage Therapist
## 10 Total Body Stretch Service Provider
## 11 Licensed Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist (LMT)
## 14 Licensed Massage Therapist Columbia SC
## 15 Massage Therapist
## 16 Total Body Stretch Service Provider
## 17 Massage Therapist - Independent Contractor
## 18 Licensed Massage Therapist (LMT)
## 19 Licensed Massage Therapist Columbia SC
## 20 Massage Therapist
## 21 Total Body Stretch Service Provider
## 22 Licensed Massage Therapist
## 23 Massage Therapist - Independent Contractor
## 24 Licensed Massage Therapist (LMT)
## 25 Licensed Massage Therapist Columbia SC
## 26 Massage Therapist
## 27 Total Body Stretch Service Provider
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$20 - $30 an hour $20 - $30 20 30
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$20 - $30 an hour $20 - $30 20 30
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$20 - $30 an hour $20 - $30 20 30
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$20 - $30 an hour $20 - $30 20 30
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$20 - $30 an hour $20 - $30 20 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 2510 2515 2510 4262.5 20
## 2 2510 2515 2510 4262.5 20
## 3 2510 2515 2510 4262.5 20
## 4 2510 2515 2510 4262.5 20
## 5 2510 2515 2510 4262.5 20
## 6 2510 2515 2510 4262.5 20
## 7 2510 2515 2510 4262.5 20
## 8 2510 2515 2510 4262.5 20
## 9 2510 2515 2510 4262.5 20
## 10 2510 2515 2510 4262.5 20
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
##
## [[3]]
## date_daysAgo
## 1 5
## 2 9
## 3 30
## 4 30
## 5 30
## 6 5
## 7 9
## 8 30
## 9 30
## 10 30
## 11 7
## 12 5
## 13 9
## 14 30
## 15 30
## 16 30
## 17 5
## 18 9
## 19 30
## 20 30
## 21 30
## 22 7
## 23 5
## 24 9
## 25 30
## 26 30
## 27 30
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyColumbia, SC•Remote work available
## 2 Heavenly Hands MassageColumbia, SC 29212
## 3 Hand and Stone3.0Columbia, SC 29205
## 4 Massage Envy3.2Columbia, SC 29212+1 location
## 5 Massage Envy3.2Lexington, SC 29072
## 6 Indo-Pak Massage TherapyColumbia, SC•Remote work available
## 7 Heavenly Hands MassageColumbia, SC 29212
## 8 Hand and Stone3.0Columbia, SC 29205
## 9 Massage Envy3.2Columbia, SC 29212+1 location
## 10 Massage Envy3.2Lexington, SC 29072
## 11 Hand and Stone Spa3.0Columbia, SC 29228
## 12 Indo-Pak Massage TherapyColumbia, SC•Remote work available
## 13 Heavenly Hands MassageColumbia, SC 29212
## 14 Hand and Stone3.0Columbia, SC 29205
## 15 Massage Envy3.2Columbia, SC 29212+1 location
## 16 Massage Envy3.2Lexington, SC 29072
## 17 Indo-Pak Massage TherapyColumbia, SC•Remote work available
## 18 Heavenly Hands MassageColumbia, SC 29212
## 19 Hand and Stone3.0Columbia, SC 29205
## 20 Massage Envy3.2Columbia, SC 29206+1 location
## 21 Massage Envy3.2Lexington, SC 29072
## 22 Hand and Stone Spa3.0Columbia, SC 29228
## 23 Indo-Pak Massage TherapyColumbia, SC•Remote work available
## 24 Heavenly Hands MassageColumbia, SC 29212
## 25 Hand and Stone3.0Columbia, SC 29205
## 26 Massage Envy3.2Columbia, SC 29206+1 location
## 27 Massage Envy3.2Lexington, SC 29072
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$20 - $30 an hour $20 - $30 20 30 20
## 4 \n$20 - $30 an hour $20 - $30 20 30 20
## 6 \n$20 - $30 an hour $20 - $30 20 30 20
## 8 \n$20 - $30 an hour $20 - $30 20 30 20
## 10 \n$20 - $30 an hour $20 - $30 20 30 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 30 20 30 20 30
## 4 30 20 30 20 30
## 6 30 20 30 20 30
## 8 30 20 30 20 30
## 10 30 20 30 20 30
##
## [[7]]
## city state jobTitle
## 1 Columbia SC Massage Therapist - Independent Contractor
## 2 Columbia SC Licensed Massage Therapist (LMT)
## 3 Columbia SC Licensed Massage Therapist Columbia SC
## 4 Columbia SC Massage Therapist
## 5 Columbia SC Total Body Stretch Service Provider
## 6 Columbia SC Massage Therapist - Independent Contractor
## 7 Columbia SC Licensed Massage Therapist (LMT)
## 8 Columbia SC Licensed Massage Therapist Columbia SC
## 9 Columbia SC Massage Therapist
## 10 Columbia SC Total Body Stretch Service Provider
## 11 Columbia SC Licensed Massage Therapist
## 12 Columbia SC Massage Therapist - Independent Contractor
## 13 Columbia SC Licensed Massage Therapist (LMT)
## 14 Columbia SC Licensed Massage Therapist Columbia SC
## 15 Columbia SC Massage Therapist
## 16 Columbia SC Total Body Stretch Service Provider
## 17 Columbia SC Massage Therapist - Independent Contractor
## 18 Columbia SC Licensed Massage Therapist (LMT)
## 19 Columbia SC Licensed Massage Therapist Columbia SC
## 20 Columbia SC Massage Therapist
## 21 Columbia SC Total Body Stretch Service Provider
## 22 Columbia SC Licensed Massage Therapist
## 23 Columbia SC Massage Therapist - Independent Contractor
## 24 Columbia SC Licensed Massage Therapist (LMT)
## 25 Columbia SC Licensed Massage Therapist Columbia SC
## 26 Columbia SC Massage Therapist
## 27 Columbia SC Total Body Stretch Service Provider
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyColumbia, SC•Remote work available 5
## 2 Heavenly Hands MassageColumbia, SC 29212 9
## 3 Hand and Stone3.0Columbia, SC 29205 30
## 4 Massage Envy3.2Columbia, SC 29212+1 location 30
## 5 Massage Envy3.2Lexington, SC 29072 30
## 6 Indo-Pak Massage TherapyColumbia, SC•Remote work available 5
## 7 Heavenly Hands MassageColumbia, SC 29212 9
## 8 Hand and Stone3.0Columbia, SC 29205 30
## 9 Massage Envy3.2Columbia, SC 29212+1 location 30
## 10 Massage Envy3.2Lexington, SC 29072 30
## 11 Hand and Stone Spa3.0Columbia, SC 29228 7
## 12 Indo-Pak Massage TherapyColumbia, SC•Remote work available 5
## 13 Heavenly Hands MassageColumbia, SC 29212 9
## 14 Hand and Stone3.0Columbia, SC 29205 30
## 15 Massage Envy3.2Columbia, SC 29212+1 location 30
## 16 Massage Envy3.2Lexington, SC 29072 30
## 17 Indo-Pak Massage TherapyColumbia, SC•Remote work available 5
## 18 Heavenly Hands MassageColumbia, SC 29212 9
## 19 Hand and Stone3.0Columbia, SC 29205 30
## 20 Massage Envy3.2Columbia, SC 29206+1 location 30
## 21 Massage Envy3.2Lexington, SC 29072 30
## 22 Hand and Stone Spa3.0Columbia, SC 29228 7
## 23 Indo-Pak Massage TherapyColumbia, SC•Remote work available 5
## 24 Heavenly Hands MassageColumbia, SC 29212 9
## 25 Hand and Stone3.0Columbia, SC 29205 30
## 26 Massage Envy3.2Columbia, SC 29206+1 location 30
## 27 Massage Envy3.2Lexington, SC 29072 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 20 30 NA NA
## 2 20 30 NA NA
## 3 20 30 NA NA
## 4 20 30 NA NA
## 5 20 30 NA NA
## 6 20 30 NA NA
## 7 20 30 NA NA
## 8 20 30 NA NA
## 9 20 30 NA NA
## 10 20 30 NA NA
## 11 20 30 NA NA
## 12 20 30 NA NA
## 13 20 30 NA NA
## 14 20 30 NA NA
## 15 20 30 NA NA
## 16 20 30 NA NA
## 17 20 30 NA NA
## 18 20 30 NA NA
## 19 20 30 NA NA
## 20 20 30 NA NA
## 21 20 30 NA NA
## 22 20 30 NA NA
## 23 20 30 NA NA
## 24 20 30 NA NA
## 25 20 30 NA NA
## 26 20 30 NA NA
## 27 20 30 NA NA
getIndeedJobData5pages('massage therapist', 'North Charleston','SC')
## Warning in getIndeedJobData5pages("massage therapist", "North Charleston", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "North Charleston", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Licensed Massage Therapist, LMT
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist - Independent Contractor
## 7 Massage Therapist - LMT
## 8 Liscensed Massage Therapist
## 9 MASSAGE THERAPIST
## 10 Licensed Massage Therapist (LMT)
## 11 Massage Therapist LMT (Full Time and Part Time)
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist (LMT)
## 17 Massage Therapist LMT (Full Time and Part Time)
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist
## 22 Licensed Massage Therapists Needed
## 23 Massage Therapist, Mount Pleasant
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist
## 27 Massage Therapist - Independent Contractor
## 28 Mobile Massage Therapist
## 29 Massage Therapist - Independent Contractor
## 30 Licensed Massage Therapist (LMT)
## 31 Licensed Massage Therapist, LMT
## 32 Massage Therapist - Independent Contractor
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapists Needed
## 35 Massage Therapist, Mount Pleasant
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist - Independent Contractor
## 39 Massage Therapist - Independent Contractor
## 40 Mobile Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist (LMT)
## 43 Licensed Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist (LMT)
## 46 Licensed Massage Therapists Needed
## 47 Massage Therapist, Mount Pleasant
## 48 Licensed Massage Therapist
## 49 Massage Therapist
## 50 Massage Therapist - Independent Contractor
## 51 Massage Therapist - Independent Contractor
## 52 Mobile Massage Therapist
## 53 Licensed Massage Therapist
## 54 Licensed Massage Therapist (LMT)
## 55 Massage Therapist - Independent Contractor
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist (LMT)
## 59 Licensed Massage Therapist, LMT
## 60 Licensed Massage Therapist (LMT)
## 61 Massage Therapist LMT (Full Time and Part Time)
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist (LMT)
## 65 Massage Therapist
## 66 Licensed Massage Therapists Needed
## 67 Massage Therapist, Mount Pleasant
## 68 Licensed Massage Therapist
## 69 Licensed Massage Therapist
## 70 Massage Therapist
## 71 Massage Therapist - Independent Contractor
## 72 Massage Therapist - Independent Contractor
## 73 Mobile Massage Therapist
## 74 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35 - $40 an hour $35 - $40 35 40
## 2 \n$25 - $35 an hour $25 - $35 25 35
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$25 - $35 an hour $25 - $35 25 35
## 5 \n$25 an hour $25 25 NA
## 6 \n$21 - $40 an hour $21 - $40 21 40
## 7 \n$2,000 - $4,000 a month $2000 - $4000 2000 4000
## 8 \n$21 - $40 an hour $21 - $40 21 40
## 9 \n$2,000 - $4,000 a month $2000 - $4000 2000 4000
## 10 \n$27 an hour $27 27 NA
## 11 \n$45 - $70 an hour $45 - $70 45 70
## 12 \n$24 - $38 an hour $24 - $38 24 38
## 13 \n$25 - $35 an hour $25 - $35 25 35
## 14 \n$27 an hour $27 27 NA
## 15 \n$24 - $38 an hour $24 - $38 24 38
## 16 \n$45 - $70 an hour $45 - $70 45 70
## 17 \n$35 - $40 an hour $35 - $40 35 40
## 18 \n$27 an hour $27 27 NA
## 19 \n$24 - $38 an hour $24 - $38 24 38
## 20 \n$45 - $70 an hour $45 - $70 45 70
## 21 \n$35 - $40 an hour $35 - $40 35 40
## 22 \n$25 - $35 an hour $25 - $35 25 35
## 23 \n$21 - $40 an hour $21 - $40 21 40
## 24 \n$2,000 - $4,000 a month $2000 - $4000 2000 4000
## 25 \n$27 an hour $27 27 NA
## 26 \n$24 - $38 an hour $24 - $38 24 38
## 27 \n$45 - $70 an hour $45 - $70 45 70
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 27 38 432.4815 744.6735 21
## 2 27 38 432.4815 744.6735 21
## 3 27 38 432.4815 744.6735 21
## 4 27 38 432.4815 744.6735 21
## 5 27 38 432.4815 744.6735 21
## 6 27 38 432.4815 744.6735 21
## 7 27 38 432.4815 744.6735 21
## 8 27 38 432.4815 744.6735 21
## 9 27 38 432.4815 744.6735 21
## 10 27 38 432.4815 744.6735 21
## 11 27 38 432.4815 744.6735 21
## 12 27 38 432.4815 744.6735 21
## 13 27 38 432.4815 744.6735 21
## 14 27 38 432.4815 744.6735 21
## 15 27 38 432.4815 744.6735 21
## 16 27 38 432.4815 744.6735 21
## 17 27 38 432.4815 744.6735 21
## 18 27 38 432.4815 744.6735 21
## 19 27 38 432.4815 744.6735 21
## 20 27 38 432.4815 744.6735 21
## 21 27 38 432.4815 744.6735 21
## 22 27 38 432.4815 744.6735 21
## 23 27 38 432.4815 744.6735 21
## 24 27 38 432.4815 744.6735 21
## 25 27 38 432.4815 744.6735 21
## 26 27 38 432.4815 744.6735 21
## 27 27 38 432.4815 744.6735 21
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 30
## 4 30
## 5 Today
## 6 5
## 7 20
## 8 8
## 9 17
## 10 28
## 11 30
## 12 30
## 13 7
## 14 30
## 15 7
## 16 28
## 17 30
## 18 30
## 19 7
## 20 30
## 21 30
## 22 30
## 23 13
## 24 30
## 25 7
## 26 8
## 27 21
## 28 30
## 29 26
## 30 23
## 31 30
## 32 Today
## 33 30
## 34 30
## 35 13
## 36 30
## 37 8
## 38 21
## 39 26
## 40 30
## 41 30
## 42 23
## 43 7
## 44 30
## 45 30
## 46 30
## 47 13
## 48 30
## 49 8
## 50 21
## 51 26
## 52 30
## 53 30
## 54 23
## 55 Today
## 56 30
## 57 30
## 58 30
## 59 30
## 60 28
## 61 30
## 62 30
## 63 7
## 64 30
## 65 30
## 66 30
## 67 13
## 68 30
## 69 7
## 70 8
## 71 21
## 72 26
## 73 30
## 74 23
##
## [[4]]
## HiringAgency
## 1 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 2 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 3 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 4 Urban Nirvana Spas & SalonsCharleston, SC
## 5 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 6 Indo-Pak Massage TherapyNorth Charleston, SC+1 location•Remote work available
## 7 Sessions Chiropractic ClinicNorth Charleston, SC
## 8 Trident ChiropracticNorth Charleston, SC 29406
## 9 Wild Dunes Resort4.0Isle of Palms, SC
## 10 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 11 Kiawah Island Club4.2Kiawah Island, SC 29455
## 12 Elements3.6Mount Pleasant, SC 29466
## 13 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 14 Book a BirdieCharleston, SC
## 15 Hand and Stone Spa3.0Summerville, SC 29485
## 16 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 17 Kiawah Island Club4.2Kiawah Island, SC 29455
## 18 Elements3.6Mount Pleasant, SC 29466
## 19 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 20 Book a BirdieCharleston, SC
## 21 Kiawah Island Club4.2Johns Island, SC 29455
## 22 Zen Massage MooresvilleNorth Charleston, SC 29406
## 23 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 24 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 25 Hand and Stone Spa3.0Summerville, SC 29485
## 26 Massage Envy3.2Summerville, SC 29483+2 locations
## 27 Carolina Spine and SportCharleston, SC 29407
## 28 Indo-Pak Massage TherapyMount Pleasant, SC
## 29 SIZODAZ SALONSummerville, SC 29485
## 30 Simply Your Spa3.7Charleston, SC 29407
## 31 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 32 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 33 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 34 Zen Massage MooresvilleNorth Charleston, SC 29406
## 35 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 36 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 37 Massage Envy3.2Summerville, SC 29483+2 locations
## 38 Carolina Spine and SportCharleston, SC 29407
## 39 SIZODAZ SALONSummerville, SC 29485
## 40 Indo-Pak Massage TherapyMount Pleasant, SC
## 41 Hand and Stone3.0Summerville, SC 29483
## 42 Simply Your Spa3.7Charleston, SC 29407
## 43 Hand and Stone Spa3.0Summerville, SC 29485
## 44 Urban Nirvana Spas & SalonsCharleston, SC
## 45 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 46 Zen Massage MooresvilleNorth Charleston, SC 29406
## 47 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 48 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 49 Massage Envy3.2Summerville, SC 29483+2 locations
## 50 Carolina Spine and SportCharleston, SC 29407
## 51 SIZODAZ SALONSummerville, SC 29485
## 52 Indo-Pak Massage TherapyMount Pleasant, SC
## 53 Hand and Stone3.0Summerville, SC 29483
## 54 Simply Your Spa3.7Charleston, SC 29407
## 55 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 56 Urban Nirvana Spas & SalonsCharleston, SC
## 57 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 58 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 59 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 60 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 61 Kiawah Island Club4.2Kiawah Island, SC 29455
## 62 Elements3.6Mount Pleasant, SC 29466
## 63 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 64 Book a BirdieCharleston, SC
## 65 Kiawah Island Club4.2Johns Island, SC 29455
## 66 Zen Massage MooresvilleNorth Charleston, SC 29406
## 67 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 68 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 69 Hand and Stone Spa3.0Summerville, SC 29485
## 70 Massage Envy3.2Summerville, SC 29483+2 locations
## 71 Carolina Spine and SportCharleston, SC 29407
## 72 SIZODAZ SALONSummerville, SC 29485
## 73 Indo-Pak Massage TherapyMount Pleasant, SC
## 74 Simply Your Spa3.7Charleston, SC 29407
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$35 - $40 an hour $35 - $40 35 40 25
## 2 \n$25 - $35 an hour $25 - $35 25 35 25
## 4 \n$25 - $35 an hour $25 - $35 25 35 25
## 5 \n$25 an hour $25 25 NA 25
## 6 \n$21 - $40 an hour $21 - $40 21 40 25
## 8 \n$21 - $40 an hour $21 - $40 21 40 25
## 10 \n$27 an hour $27 27 NA 25
## 11 \n$45 - $70 an hour $45 - $70 45 70 25
## 12 \n$24 - $38 an hour $24 - $38 24 38 25
## 13 \n$25 - $35 an hour $25 - $35 25 35 25
## 14 \n$27 an hour $27 27 NA 25
## 15 \n$24 - $38 an hour $24 - $38 24 38 25
## 16 \n$45 - $70 an hour $45 - $70 45 70 25
## 17 \n$35 - $40 an hour $35 - $40 35 40 25
## 18 \n$27 an hour $27 27 NA 25
## 19 \n$24 - $38 an hour $24 - $38 24 38 25
## 20 \n$45 - $70 an hour $45 - $70 45 70 25
## 21 \n$35 - $40 an hour $35 - $40 35 40 25
## 22 \n$25 - $35 an hour $25 - $35 25 35 25
## 23 \n$21 - $40 an hour $21 - $40 21 40 25
## 25 \n$27 an hour $27 27 NA 25
## 26 \n$24 - $38 an hour $24 - $38 24 38 25
## 27 \n$45 - $70 an hour $45 - $70 45 70 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 29.43478 45.11111 21 70
## 2 40 29.43478 45.11111 21 70
## 4 40 29.43478 45.11111 21 70
## 5 40 29.43478 45.11111 21 70
## 6 40 29.43478 45.11111 21 70
## 8 40 29.43478 45.11111 21 70
## 10 40 29.43478 45.11111 21 70
## 11 40 29.43478 45.11111 21 70
## 12 40 29.43478 45.11111 21 70
## 13 40 29.43478 45.11111 21 70
## 14 40 29.43478 45.11111 21 70
## 15 40 29.43478 45.11111 21 70
## 16 40 29.43478 45.11111 21 70
## 17 40 29.43478 45.11111 21 70
## 18 40 29.43478 45.11111 21 70
## 19 40 29.43478 45.11111 21 70
## 20 40 29.43478 45.11111 21 70
## 21 40 29.43478 45.11111 21 70
## 22 40 29.43478 45.11111 21 70
## 23 40 29.43478 45.11111 21 70
## 25 40 29.43478 45.11111 21 70
## 26 40 29.43478 45.11111 21 70
## 27 40 29.43478 45.11111 21 70
##
## [[7]]
## city state jobTitle
## 1 North Charleston SC Licensed Massage Therapist
## 2 North Charleston SC Licensed Massage Therapist (LMT)
## 3 North Charleston SC Licensed Massage Therapist, LMT
## 4 North Charleston SC Licensed Massage Therapist
## 5 North Charleston SC Massage Therapist - Independent Contractor
## 6 North Charleston SC Massage Therapist - Independent Contractor
## 7 North Charleston SC Massage Therapist - LMT
## 8 North Charleston SC Liscensed Massage Therapist
## 9 North Charleston SC MASSAGE THERAPIST
## 10 North Charleston SC Licensed Massage Therapist (LMT)
## 11 North Charleston SC Massage Therapist LMT (Full Time and Part Time)
## 12 North Charleston SC Massage Therapist
## 13 North Charleston SC Licensed Massage Therapist
## 14 North Charleston SC Licensed Massage Therapist (LMT)
## 15 North Charleston SC Licensed Massage Therapist
## 16 North Charleston SC Licensed Massage Therapist (LMT)
## 17 North Charleston SC Massage Therapist LMT (Full Time and Part Time)
## 18 North Charleston SC Massage Therapist
## 19 North Charleston SC Licensed Massage Therapist
## 20 North Charleston SC Licensed Massage Therapist (LMT)
## 21 North Charleston SC Massage Therapist
## 22 North Charleston SC Licensed Massage Therapists Needed
## 23 North Charleston SC Massage Therapist, Mount Pleasant
## 24 North Charleston SC Licensed Massage Therapist
## 25 North Charleston SC Licensed Massage Therapist
## 26 North Charleston SC Massage Therapist
## 27 North Charleston SC Massage Therapist - Independent Contractor
## 28 North Charleston SC Mobile Massage Therapist
## 29 North Charleston SC Massage Therapist - Independent Contractor
## 30 North Charleston SC Licensed Massage Therapist (LMT)
## 31 North Charleston SC Licensed Massage Therapist, LMT
## 32 North Charleston SC Massage Therapist - Independent Contractor
## 33 North Charleston SC Licensed Massage Therapist
## 34 North Charleston SC Licensed Massage Therapists Needed
## 35 North Charleston SC Massage Therapist, Mount Pleasant
## 36 North Charleston SC Licensed Massage Therapist
## 37 North Charleston SC Massage Therapist
## 38 North Charleston SC Massage Therapist - Independent Contractor
## 39 North Charleston SC Massage Therapist - Independent Contractor
## 40 North Charleston SC Mobile Massage Therapist
## 41 North Charleston SC Licensed Massage Therapist
## 42 North Charleston SC Licensed Massage Therapist (LMT)
## 43 North Charleston SC Licensed Massage Therapist
## 44 North Charleston SC Licensed Massage Therapist
## 45 North Charleston SC Licensed Massage Therapist (LMT)
## 46 North Charleston SC Licensed Massage Therapists Needed
## 47 North Charleston SC Massage Therapist, Mount Pleasant
## 48 North Charleston SC Licensed Massage Therapist
## 49 North Charleston SC Massage Therapist
## 50 North Charleston SC Massage Therapist - Independent Contractor
## 51 North Charleston SC Massage Therapist - Independent Contractor
## 52 North Charleston SC Mobile Massage Therapist
## 53 North Charleston SC Licensed Massage Therapist
## 54 North Charleston SC Licensed Massage Therapist (LMT)
## 55 North Charleston SC Massage Therapist - Independent Contractor
## 56 North Charleston SC Licensed Massage Therapist
## 57 North Charleston SC Licensed Massage Therapist
## 58 North Charleston SC Licensed Massage Therapist (LMT)
## 59 North Charleston SC Licensed Massage Therapist, LMT
## 60 North Charleston SC Licensed Massage Therapist (LMT)
## 61 North Charleston SC Massage Therapist LMT (Full Time and Part Time)
## 62 North Charleston SC Massage Therapist
## 63 North Charleston SC Licensed Massage Therapist
## 64 North Charleston SC Licensed Massage Therapist (LMT)
## 65 North Charleston SC Massage Therapist
## 66 North Charleston SC Licensed Massage Therapists Needed
## 67 North Charleston SC Massage Therapist, Mount Pleasant
## 68 North Charleston SC Licensed Massage Therapist
## 69 North Charleston SC Licensed Massage Therapist
## 70 North Charleston SC Massage Therapist
## 71 North Charleston SC Massage Therapist - Independent Contractor
## 72 North Charleston SC Massage Therapist - Independent Contractor
## 73 North Charleston SC Mobile Massage Therapist
## 74 North Charleston SC Licensed Massage Therapist (LMT)
## HiringAgency
## 1 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 2 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 3 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 4 Urban Nirvana Spas & SalonsCharleston, SC
## 5 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 6 Indo-Pak Massage TherapyNorth Charleston, SC+1 location•Remote work available
## 7 Sessions Chiropractic ClinicNorth Charleston, SC
## 8 Trident ChiropracticNorth Charleston, SC 29406
## 9 Wild Dunes Resort4.0Isle of Palms, SC
## 10 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 11 Kiawah Island Club4.2Kiawah Island, SC 29455
## 12 Elements3.6Mount Pleasant, SC 29466
## 13 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 14 Book a BirdieCharleston, SC
## 15 Hand and Stone Spa3.0Summerville, SC 29485
## 16 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 17 Kiawah Island Club4.2Kiawah Island, SC 29455
## 18 Elements3.6Mount Pleasant, SC 29466
## 19 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 20 Book a BirdieCharleston, SC
## 21 Kiawah Island Club4.2Johns Island, SC 29455
## 22 Zen Massage MooresvilleNorth Charleston, SC 29406
## 23 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 24 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 25 Hand and Stone Spa3.0Summerville, SC 29485
## 26 Massage Envy3.2Summerville, SC 29483+2 locations
## 27 Carolina Spine and SportCharleston, SC 29407
## 28 Indo-Pak Massage TherapyMount Pleasant, SC
## 29 SIZODAZ SALONSummerville, SC 29485
## 30 Simply Your Spa3.7Charleston, SC 29407
## 31 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 32 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 33 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 34 Zen Massage MooresvilleNorth Charleston, SC 29406
## 35 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 36 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 37 Massage Envy3.2Summerville, SC 29483+2 locations
## 38 Carolina Spine and SportCharleston, SC 29407
## 39 SIZODAZ SALONSummerville, SC 29485
## 40 Indo-Pak Massage TherapyMount Pleasant, SC
## 41 Hand and Stone3.0Summerville, SC 29483
## 42 Simply Your Spa3.7Charleston, SC 29407
## 43 Hand and Stone Spa3.0Summerville, SC 29485
## 44 Urban Nirvana Spas & SalonsCharleston, SC
## 45 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 46 Zen Massage MooresvilleNorth Charleston, SC 29406
## 47 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 48 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 49 Massage Envy3.2Summerville, SC 29483+2 locations
## 50 Carolina Spine and SportCharleston, SC 29407
## 51 SIZODAZ SALONSummerville, SC 29485
## 52 Indo-Pak Massage TherapyMount Pleasant, SC
## 53 Hand and Stone3.0Summerville, SC 29483
## 54 Simply Your Spa3.7Charleston, SC 29407
## 55 Rejuvenate Salon and Spa4.0Mount Pleasant, SC
## 56 Urban Nirvana Spas & SalonsCharleston, SC
## 57 Woodhouse Day Spa-CharlestonCharleston, SC 29403
## 58 Live for Wellness Chiropractic CenterCharleston, SC 29414
## 59 Spa AdagioCharleston, SC 29403 (Radcliffborough area)
## 60 Atlantic Spine and Health ClinicMount Pleasant, SC 29464
## 61 Kiawah Island Club4.2Kiawah Island, SC 29455
## 62 Elements3.6Mount Pleasant, SC 29466
## 63 Got Muscle Personal TrainingNorth Charleston, SC 29406
## 64 Book a BirdieCharleston, SC
## 65 Kiawah Island Club4.2Johns Island, SC 29455
## 66 Zen Massage MooresvilleNorth Charleston, SC 29406
## 67 Elements Massage-Mount Pleasant3.6Mount Pleasant, SC 29466
## 68 Breathe Pilates Studio & SpaMount Pleasant, SC 29464
## 69 Hand and Stone Spa3.0Summerville, SC 29485
## 70 Massage Envy3.2Summerville, SC 29483+2 locations
## 71 Carolina Spine and SportCharleston, SC 29407
## 72 SIZODAZ SALONSummerville, SC 29485
## 73 Indo-Pak Massage TherapyMount Pleasant, SC
## 74 Simply Your Spa3.7Charleston, SC 29407
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 21 70 NA NA
## 2 30 21 70 NA NA
## 3 30 21 70 NA NA
## 4 30 21 70 NA NA
## 5 Today 21 70 NA NA
## 6 5 21 70 NA NA
## 7 20 21 70 NA NA
## 8 8 21 70 NA NA
## 9 17 21 70 NA NA
## 10 28 21 70 NA NA
## 11 30 21 70 NA NA
## 12 30 21 70 NA NA
## 13 7 21 70 NA NA
## 14 30 21 70 NA NA
## 15 7 21 70 NA NA
## 16 28 21 70 NA NA
## 17 30 21 70 NA NA
## 18 30 21 70 NA NA
## 19 7 21 70 NA NA
## 20 30 21 70 NA NA
## 21 30 21 70 NA NA
## 22 30 21 70 NA NA
## 23 13 21 70 NA NA
## 24 30 21 70 NA NA
## 25 7 21 70 NA NA
## 26 8 21 70 NA NA
## 27 21 21 70 NA NA
## 28 30 21 70 NA NA
## 29 26 21 70 NA NA
## 30 23 21 70 NA NA
## 31 30 21 70 NA NA
## 32 Today 21 70 NA NA
## 33 30 21 70 NA NA
## 34 30 21 70 NA NA
## 35 13 21 70 NA NA
## 36 30 21 70 NA NA
## 37 8 21 70 NA NA
## 38 21 21 70 NA NA
## 39 26 21 70 NA NA
## 40 30 21 70 NA NA
## 41 30 21 70 NA NA
## 42 23 21 70 NA NA
## 43 7 21 70 NA NA
## 44 30 21 70 NA NA
## 45 30 21 70 NA NA
## 46 30 21 70 NA NA
## 47 13 21 70 NA NA
## 48 30 21 70 NA NA
## 49 8 21 70 NA NA
## 50 21 21 70 NA NA
## 51 26 21 70 NA NA
## 52 30 21 70 NA NA
## 53 30 21 70 NA NA
## 54 23 21 70 NA NA
## 55 Today 21 70 NA NA
## 56 30 21 70 NA NA
## 57 30 21 70 NA NA
## 58 30 21 70 NA NA
## 59 30 21 70 NA NA
## 60 28 21 70 NA NA
## 61 30 21 70 NA NA
## 62 30 21 70 NA NA
## 63 7 21 70 NA NA
## 64 30 21 70 NA NA
## 65 30 21 70 NA NA
## 66 30 21 70 NA NA
## 67 13 21 70 NA NA
## 68 30 21 70 NA NA
## 69 7 21 70 NA NA
## 70 8 21 70 NA NA
## 71 21 21 70 NA NA
## 72 26 21 70 NA NA
## 73 30 21 70 NA NA
## 74 23 21 70 NA NA
South Dakota Sioux Falls, Rapid City, Aberdeen
getIndeedJobData5pages('massage therapist', 'Sioux Falls','SD')
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Clinical Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Clinical Massage Therapist
## 9 Massage Therapist
## 10 Massage Therapist
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Clinical Massage Therapist
## 16 Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist - Independent Contractor
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Massage Therapist
## 22 Clinical Massage Therapist
## 23 Massage Therapist
## 24 Massage Therapist
## 25 Massage Therapist - Independent Contractor
## 26 Massage Therapist
## 27 Massage Therapist
## 28 Massage Therapist
## 29 Clinical Massage Therapist
## 30 Massage Therapist
## 31 Massage Therapist
## 32 Massage Therapist - Independent Contractor
## 33 Massage Therapist
## 34 Massage Therapist
## 35 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$27 - $35 an hour $27 - $35 27 35
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$27 - $35 an hour $27 - $35 27 35
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$27 - $35 an hour $27 - $35 27 35
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$27 - $35 an hour $27 - $35 27 35
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$27 - $35 an hour $27 - $35 27 35
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 2513.5 2517.5 2513.5 4265.5 27
## 2 2513.5 2517.5 2513.5 4265.5 27
## 3 2513.5 2517.5 2513.5 4265.5 27
## 4 2513.5 2517.5 2513.5 4265.5 27
## 5 2513.5 2517.5 2513.5 4265.5 27
## 6 2513.5 2517.5 2513.5 4265.5 27
## 7 2513.5 2517.5 2513.5 4265.5 27
## 8 2513.5 2517.5 2513.5 4265.5 27
## 9 2513.5 2517.5 2513.5 4265.5 27
## 10 2513.5 2517.5 2513.5 4265.5 27
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 19
## 3 16
## 4 7
## 5 17
## 6 30
## 7 30
## 8 19
## 9 16
## 10 7
## 11 17
## 12 30
## 13 30
## 14 30
## 15 19
## 16 16
## 17 7
## 18 17
## 19 30
## 20 30
## 21 30
## 22 19
## 23 16
## 24 7
## 25 17
## 26 30
## 27 30
## 28 30
## 29 19
## 30 16
## 31 7
## 32 17
## 33 30
## 34 30
## 35 30
##
## [[4]]
## HiringAgency
## 1 Radiance Day SpaSioux Falls, SD 57108
## 2 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD
## 3 Minnehaha Country Club3.4Sioux Falls, SD 57105
## 4 GreatLIFE3.6Sioux Falls, SD 57106
## 5 Indo-Pak Massage TherapySioux Falls, SD•Remote work available
## 6 Asian Therapeutic MassageSioux Falls, SD 57106
## 7 Massage Envy3.2Sioux Falls, SD 57106
## 8 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD
## 9 Minnehaha Country Club3.4Sioux Falls, SD 57105
## 10 GreatLIFE3.6Sioux Falls, SD 57106
## 11 Indo-Pak Massage TherapySioux Falls, SD•Remote work available
## 12 Asian Therapeutic MassageSioux Falls, SD 57106
## 13 Radiance Day SpaSioux Falls, SD 57108
## 14 Massage Envy3.2Sioux Falls, SD 57106
## 15 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD
## 16 Minnehaha Country Club3.4Sioux Falls, SD 57105
## 17 GreatLIFE3.6Sioux Falls, SD 57106
## 18 Indo-Pak Massage TherapySioux Falls, SD•Remote work available
## 19 Asian Therapeutic MassageSioux Falls, SD 57106
## 20 Radiance Day SpaSioux Falls, SD 57108
## 21 Massage Envy3.2Sioux Falls, SD 57106
## 22 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD
## 23 Minnehaha Country Club3.4Sioux Falls, SD 57105
## 24 GreatLIFE3.6Sioux Falls, SD 57106
## 25 Indo-Pak Massage TherapySioux Falls, SD•Remote work available
## 26 Asian Therapeutic MassageSioux Falls, SD 57106
## 27 Massage Envy3.2Sioux Falls, SD 57106
## 28 Radiance Day SpaSioux Falls, SD 57108
## 29 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD
## 30 Minnehaha Country Club3.4Sioux Falls, SD 57105
## 31 GreatLIFE3.6Sioux Falls, SD 57106
## 32 Indo-Pak Massage TherapySioux Falls, SD•Remote work available
## 33 Asian Therapeutic MassageSioux Falls, SD 57106
## 34 Radiance Day SpaSioux Falls, SD 57108
## 35 Massage Envy3.2Sioux Falls, SD 57106
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$27 - $35 an hour $27 - $35 27 35 27
## 4 \n$27 - $35 an hour $27 - $35 27 35 27
## 6 \n$27 - $35 an hour $27 - $35 27 35 27
## 8 \n$27 - $35 an hour $27 - $35 27 35 27
## 10 \n$27 - $35 an hour $27 - $35 27 35 27
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 35 27 35 27 35
## 4 35 27 35 27 35
## 6 35 27 35 27 35
## 8 35 27 35 27 35
## 10 35 27 35 27 35
##
## [[7]]
## city state jobTitle
## 1 Sioux Falls SD Massage Therapist
## 2 Sioux Falls SD Clinical Massage Therapist
## 3 Sioux Falls SD Massage Therapist
## 4 Sioux Falls SD Massage Therapist
## 5 Sioux Falls SD Massage Therapist - Independent Contractor
## 6 Sioux Falls SD Massage Therapist
## 7 Sioux Falls SD Massage Therapist
## 8 Sioux Falls SD Clinical Massage Therapist
## 9 Sioux Falls SD Massage Therapist
## 10 Sioux Falls SD Massage Therapist
## 11 Sioux Falls SD Massage Therapist - Independent Contractor
## 12 Sioux Falls SD Massage Therapist
## 13 Sioux Falls SD Massage Therapist
## 14 Sioux Falls SD Massage Therapist
## 15 Sioux Falls SD Clinical Massage Therapist
## 16 Sioux Falls SD Massage Therapist
## 17 Sioux Falls SD Massage Therapist
## 18 Sioux Falls SD Massage Therapist - Independent Contractor
## 19 Sioux Falls SD Massage Therapist
## 20 Sioux Falls SD Massage Therapist
## 21 Sioux Falls SD Massage Therapist
## 22 Sioux Falls SD Clinical Massage Therapist
## 23 Sioux Falls SD Massage Therapist
## 24 Sioux Falls SD Massage Therapist
## 25 Sioux Falls SD Massage Therapist - Independent Contractor
## 26 Sioux Falls SD Massage Therapist
## 27 Sioux Falls SD Massage Therapist
## 28 Sioux Falls SD Massage Therapist
## 29 Sioux Falls SD Clinical Massage Therapist
## 30 Sioux Falls SD Massage Therapist
## 31 Sioux Falls SD Massage Therapist
## 32 Sioux Falls SD Massage Therapist - Independent Contractor
## 33 Sioux Falls SD Massage Therapist
## 34 Sioux Falls SD Massage Therapist
## 35 Sioux Falls SD Massage Therapist
## HiringAgency date_daysAgo
## 1 Radiance Day SpaSioux Falls, SD 57108 30
## 2 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD 19
## 3 Minnehaha Country Club3.4Sioux Falls, SD 57105 16
## 4 GreatLIFE3.6Sioux Falls, SD 57106 7
## 5 Indo-Pak Massage TherapySioux Falls, SD•Remote work available 17
## 6 Asian Therapeutic MassageSioux Falls, SD 57106 30
## 7 Massage Envy3.2Sioux Falls, SD 57106 30
## 8 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD 19
## 9 Minnehaha Country Club3.4Sioux Falls, SD 57105 16
## 10 GreatLIFE3.6Sioux Falls, SD 57106 7
## 11 Indo-Pak Massage TherapySioux Falls, SD•Remote work available 17
## 12 Asian Therapeutic MassageSioux Falls, SD 57106 30
## 13 Radiance Day SpaSioux Falls, SD 57108 30
## 14 Massage Envy3.2Sioux Falls, SD 57106 30
## 15 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD 19
## 16 Minnehaha Country Club3.4Sioux Falls, SD 57105 16
## 17 GreatLIFE3.6Sioux Falls, SD 57106 7
## 18 Indo-Pak Massage TherapySioux Falls, SD•Remote work available 17
## 19 Asian Therapeutic MassageSioux Falls, SD 57106 30
## 20 Radiance Day SpaSioux Falls, SD 57108 30
## 21 Massage Envy3.2Sioux Falls, SD 57106 30
## 22 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD 19
## 23 Minnehaha Country Club3.4Sioux Falls, SD 57105 16
## 24 GreatLIFE3.6Sioux Falls, SD 57106 7
## 25 Indo-Pak Massage TherapySioux Falls, SD•Remote work available 17
## 26 Asian Therapeutic MassageSioux Falls, SD 57106 30
## 27 Massage Envy3.2Sioux Falls, SD 57106 30
## 28 Radiance Day SpaSioux Falls, SD 57108 30
## 29 River Ridge Spine & Rehabilitation Center PCSioux Falls, SD 19
## 30 Minnehaha Country Club3.4Sioux Falls, SD 57105 16
## 31 GreatLIFE3.6Sioux Falls, SD 57106 7
## 32 Indo-Pak Massage TherapySioux Falls, SD•Remote work available 17
## 33 Asian Therapeutic MassageSioux Falls, SD 57106 30
## 34 Radiance Day SpaSioux Falls, SD 57108 30
## 35 Massage Envy3.2Sioux Falls, SD 57106 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 27 35 NA NA
## 2 27 35 NA NA
## 3 27 35 NA NA
## 4 27 35 NA NA
## 5 27 35 NA NA
## 6 27 35 NA NA
## 7 27 35 NA NA
## 8 27 35 NA NA
## 9 27 35 NA NA
## 10 27 35 NA NA
## 11 27 35 NA NA
## 12 27 35 NA NA
## 13 27 35 NA NA
## 14 27 35 NA NA
## 15 27 35 NA NA
## 16 27 35 NA NA
## 17 27 35 NA NA
## 18 27 35 NA NA
## 19 27 35 NA NA
## 20 27 35 NA NA
## 21 27 35 NA NA
## 22 27 35 NA NA
## 23 27 35 NA NA
## 24 27 35 NA NA
## 25 27 35 NA NA
## 26 27 35 NA NA
## 27 27 35 NA NA
## 28 27 35 NA NA
## 29 27 35 NA NA
## 30 27 35 NA NA
## 31 27 35 NA NA
## 32 27 35 NA NA
## 33 27 35 NA NA
## 34 27 35 NA NA
## 35 27 35 NA NA
getIndeedJobData5pages('massage therapist', 'Rapid City','SD')
## Warning in getIndeedJobData5pages("massage therapist", "Rapid City", "SD"): NAs
## introduced by coercion
## Warning in max(hourly$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Rapid City", "SD"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Licensed Massage Therapist
## 3 Certified Massage Therapist
## 4 Massage Therapist - Independent Contractor
## 5 Licensed Massage Therapist
## 6 Certified Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Licensed Massage Therapist
## 9 Certified Massage Therapist
## 10 Massage Therapist - Independent Contractor
## 11 Licensed Massage Therapist
## 12 Certified Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Licensed Massage Therapist
## 15 Certified Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \nFrom $18 an hour ++ $18 18 NA
## 3 \nFrom $18 an hour ++ $18 18 NA
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \nFrom $18 an hour ++ $18 18 NA
## 6 \nFrom $18 an hour ++ $18 18 NA
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \nFrom $18 an hour ++ $18 18 NA
## 9 \nFrom $18 an hour ++ $18 18 NA
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 11 \nFrom $18 an hour ++ $18 18 NA
## 12 \nFrom $18 an hour ++ $18 18 NA
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \nFrom $18 an hour ++ $18 18 NA
## 15 \nFrom $18 an hour ++ $18 18 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 18 2509 1678.667 4259 18
## 2 18 2509 1678.667 4259 18
## 3 18 2509 1678.667 4259 18
## 4 18 2509 1678.667 4259 18
## 5 18 2509 1678.667 4259 18
## 6 18 2509 1678.667 4259 18
## 7 18 2509 1678.667 4259 18
## 8 18 2509 1678.667 4259 18
## 9 18 2509 1678.667 4259 18
## 10 18 2509 1678.667 4259 18
## 11 18 2509 1678.667 4259 18
## 12 18 2509 1678.667 4259 18
## 13 18 2509 1678.667 4259 18
## 14 18 2509 1678.667 4259 18
## 15 18 2509 1678.667 4259 18
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
##
## [[3]]
## date_daysAgo
## 1 17
## 2 30
## 3 30
## 4 17
## 5 30
## 6 30
## 7 17
## 8 30
## 9 30
## 10 17
## 11 30
## 12 30
## 13 17
## 14 30
## 15 30
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyRapid City, SD•Remote work available
## 2 Massage Envy3.2Rapid City, SD 57701
## 3 Massage Envy3.2Rapid City, SD 57701
## 4 Indo-Pak Massage TherapyRapid City, SD•Remote work available
## 5 Massage Envy3.2Rapid City, SD 57701
## 6 Massage Envy3.2Rapid City, SD 57701
## 7 Indo-Pak Massage TherapyRapid City, SD•Remote work available
## 8 Massage Envy3.2Rapid City, SD 57701
## 9 Massage Envy3.2Rapid City, SD 57701
## 10 Indo-Pak Massage TherapyRapid City, SD•Remote work available
## 11 Massage Envy3.2Rapid City, SD 57701
## 12 Massage Envy3.2Rapid City, SD 57701
## 13 Indo-Pak Massage TherapyRapid City, SD•Remote work available
## 14 Massage Envy3.2Rapid City, SD 57701
## 15 Massage Envy3.2Rapid City, SD 57701
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \nFrom $18 an hour ++ $18 18 NA 18
## 3 \nFrom $18 an hour ++ $18 18 NA 18
## 5 \nFrom $18 an hour ++ $18 18 NA 18
## 6 \nFrom $18 an hour ++ $18 18 NA 18
## 8 \nFrom $18 an hour ++ $18 18 NA 18
## 9 \nFrom $18 an hour ++ $18 18 NA 18
## 11 \nFrom $18 an hour ++ $18 18 NA 18
## 12 \nFrom $18 an hour ++ $18 18 NA 18
## 14 \nFrom $18 an hour ++ $18 18 NA 18
## 15 \nFrom $18 an hour ++ $18 18 NA 18
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 NA 18 NaN 18 -Inf
## 3 NA 18 NaN 18 -Inf
## 5 NA 18 NaN 18 -Inf
## 6 NA 18 NaN 18 -Inf
## 8 NA 18 NaN 18 -Inf
## 9 NA 18 NaN 18 -Inf
## 11 NA 18 NaN 18 -Inf
## 12 NA 18 NaN 18 -Inf
## 14 NA 18 NaN 18 -Inf
## 15 NA 18 NaN 18 -Inf
##
## [[7]]
## city state jobTitle
## 1 Rapid City SD Massage Therapist - Independent Contractor
## 2 Rapid City SD Licensed Massage Therapist
## 3 Rapid City SD Certified Massage Therapist
## 4 Rapid City SD Massage Therapist - Independent Contractor
## 5 Rapid City SD Licensed Massage Therapist
## 6 Rapid City SD Certified Massage Therapist
## 7 Rapid City SD Massage Therapist - Independent Contractor
## 8 Rapid City SD Licensed Massage Therapist
## 9 Rapid City SD Certified Massage Therapist
## 10 Rapid City SD Massage Therapist - Independent Contractor
## 11 Rapid City SD Licensed Massage Therapist
## 12 Rapid City SD Certified Massage Therapist
## 13 Rapid City SD Massage Therapist - Independent Contractor
## 14 Rapid City SD Licensed Massage Therapist
## 15 Rapid City SD Certified Massage Therapist
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyRapid City, SD•Remote work available 17
## 2 Massage Envy3.2Rapid City, SD 57701 30
## 3 Massage Envy3.2Rapid City, SD 57701 30
## 4 Indo-Pak Massage TherapyRapid City, SD•Remote work available 17
## 5 Massage Envy3.2Rapid City, SD 57701 30
## 6 Massage Envy3.2Rapid City, SD 57701 30
## 7 Indo-Pak Massage TherapyRapid City, SD•Remote work available 17
## 8 Massage Envy3.2Rapid City, SD 57701 30
## 9 Massage Envy3.2Rapid City, SD 57701 30
## 10 Indo-Pak Massage TherapyRapid City, SD•Remote work available 17
## 11 Massage Envy3.2Rapid City, SD 57701 30
## 12 Massage Envy3.2Rapid City, SD 57701 30
## 13 Indo-Pak Massage TherapyRapid City, SD•Remote work available 17
## 14 Massage Envy3.2Rapid City, SD 57701 30
## 15 Massage Envy3.2Rapid City, SD 57701 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 18 18 NA NA
## 2 18 18 NA NA
## 3 18 18 NA NA
## 4 18 18 NA NA
## 5 18 18 NA NA
## 6 18 18 NA NA
## 7 18 18 NA NA
## 8 18 18 NA NA
## 9 18 18 NA NA
## 10 18 18 NA NA
## 11 18 18 NA NA
## 12 18 18 NA NA
## 13 18 18 NA NA
## 14 18 18 NA NA
## 15 18 18 NA NA
getIndeedJobData5pages('massage therapist', 'Aberdeen','SD')
## [[1]]
## [1] jobTitle
## <0 rows> (or 0-length row.names)
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## [1] date_daysAgo
## <0 rows> (or 0-length row.names)
##
## [[4]]
## [1] HiringAgency
## <0 rows> (or 0-length row.names)
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## [1] city state jobTitle HiringAgency
## [5] date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary
## [9] MaxAnnualSalary
## <0 rows> (or 0-length row.names)
Tennessee Nashville, Memphis, Knoxville
getIndeedJobData5pages('massage therapist', 'Nashville','TN')
## Warning in getIndeedJobData5pages("massage therapist", "Nashville", "TN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Nashville", "TN"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Nashville", "TN"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
## 4 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 5 Licensed Massage Therapist
## 6 Part Time Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist - Nashville, TN
## 12 Licensed Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist - Sign On Bonus Available
## 17 Licensed Massage Therapist - Sign On Bonus Available
## 18 Licensed Massage Therapist
## 19 Part Time Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist (LMT)
## 26 Part-Time & On Call Licensed Massage Therapist (LMT)
## 27 LifeSpa- Massage Therapist
## 28 Licensed Massage Therapist (LMT)
## 29 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Massage Therapist [CUSTOMIZATION REQUIRED]
## 33 Licensed Massage Therapist (LMT)
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist - Sign On Bonus Available
## 36 Massage Therapist- Full or Part Time (Nashville, TN)
## 37 Massage Therapist
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Mobile Massage Therapist
## 41 Licensed Massage Therapist (LMT)
## 42 Part-Time & On Call Licensed Massage Therapist (LMT)
## 43 LifeSpa- Massage Therapist
## 44 Licensed Massage Therapist (LMT)
## 45 Licensed Massage Therapist (LMT)
## 46 Massage Therapist- Full or Part Time (Nashville, TN)
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Mobile Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist (LMT)
## 52 Part-Time & On Call Licensed Massage Therapist (LMT)
## 53 LifeSpa- Massage Therapist
## 54 Licensed Massage Therapist (LMT)
## 55 Licensed Massage Therapist - Sign On Bonus Available
## 56 Licensed Massage Therapist - Sign On Bonus Available
## 57 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 58 Licensed Massage Therapist
## 59 Part Time Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
## 64 Licensed Massage Therapist (LMT)
## 65 Massage Therapist- Full or Part Time (Nashville, TN)
## 66 Massage Therapist
## 67 Licensed Massage Therapist
## 68 Mobile Massage Therapist
## 69 Licensed Massage Therapist
## 70 Licensed Massage Therapist (LMT)
## 71 Part-Time & On Call Licensed Massage Therapist (LMT)
## 72 LifeSpa- Massage Therapist
## 73 Licensed Massage Therapist (LMT)
## 74 Licensed Massage Therapist - Sign On Bonus Available
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 77 Licensed Massage Therapist
## 78 Part Time Licensed Massage Therapist
## 79 Licensed Massage Therapist - Sign On Bonus Available
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist
## 82 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $25 an hour $20 - $25 20 25
## 2 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 3 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 4 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 5 \n$30 - $50 an hour $30 - $50 30 50
## 6 \n$42 an hour $42 42 NA
## 7 \n$24 - $38 an hour $24 - $38 24 38
## 8 \n$60 - $65 an hour $60 - $65 60 65
## 9 \n$15 - $60 an hour $15 - $60 15 60
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 11 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 12 \nUp to $45,000 a year $45000 45000 NA
## 13 \nUp to $45,000 a year $45000 45000 NA
## 14 \n$30 - $50 an hour $30 - $50 30 50
## 15 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 16 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 17 \n$20 - $25 an hour $20 - $25 20 25
## 18 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 19 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 20 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 21 \n$15 - $18 an hour $15 - $18 15 18
## 22 \n$24 - $38 an hour $24 - $38 24 38
## 23 \n$30 - $40 an hour $30 - $40 30 40
## 24 \nUp to $45,000 a year $45000 45000 NA
## 25 \nFrom $50,000 a year $50000 50000 NA
## 26 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 27 \n$30,000 - $45,000 a year $30000 - $45000 30000 45000
## 28 \n$45 - $70 an hour $45 - $70 45 70
## 29 \n$24 - $38 an hour $24 - $38 24 38
## 30 \nFrom $50,000 a year $50000 50000 NA
## 31 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 32 \n$45 - $70 an hour $45 - $70 45 70
## 33 \n$30,000 - $45,000 a year $30000 - $45000 30000 45000
## 34 \nUp to $45,000 a year $45000 45000 NA
## 35 \nUp to $45,000 a year $45000 45000 NA
## 36 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 37 \n$30 - $50 an hour $30 - $50 30 50
## 38 \n$20 - $25 an hour $20 - $25 20 25
## 39 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 40 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 41 \n$24 - $38 an hour $24 - $38 24 38
## 42 \nFrom $50,000 a year $50000 50000 NA
## 43 \n$30,000 - $45,000 a year $30000 - $45000 30000 45000
## 44 \n$45 - $70 an hour $45 - $70 45 70
## 45 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 46 \nUp to $45,000 a year $45000 45000 NA
## 47 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 48 \n$30 - $50 an hour $30 - $50 30 50
## 49 \nUp to $45,000 a year $45000 45000 NA
## 50 \n$20 - $25 an hour $20 - $25 20 25
## 51 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 52 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35000 35000 23896.02 26778.9 15
## 2 35000 35000 23896.02 26778.9 15
## 3 35000 35000 23896.02 26778.9 15
## 4 35000 35000 23896.02 26778.9 15
## 5 35000 35000 23896.02 26778.9 15
## 6 35000 35000 23896.02 26778.9 15
## 7 35000 35000 23896.02 26778.9 15
## 8 35000 35000 23896.02 26778.9 15
## 9 35000 35000 23896.02 26778.9 15
## 10 35000 35000 23896.02 26778.9 15
## 11 35000 35000 23896.02 26778.9 15
## 12 35000 35000 23896.02 26778.9 15
## 13 35000 35000 23896.02 26778.9 15
## 14 35000 35000 23896.02 26778.9 15
## 15 35000 35000 23896.02 26778.9 15
## 16 35000 35000 23896.02 26778.9 15
## 17 35000 35000 23896.02 26778.9 15
## 18 35000 35000 23896.02 26778.9 15
## 19 35000 35000 23896.02 26778.9 15
## 20 35000 35000 23896.02 26778.9 15
## 21 35000 35000 23896.02 26778.9 15
## 22 35000 35000 23896.02 26778.9 15
## 23 35000 35000 23896.02 26778.9 15
## 24 35000 35000 23896.02 26778.9 15
## 25 35000 35000 23896.02 26778.9 15
## 26 35000 35000 23896.02 26778.9 15
## 27 35000 35000 23896.02 26778.9 15
## 28 35000 35000 23896.02 26778.9 15
## 29 35000 35000 23896.02 26778.9 15
## 30 35000 35000 23896.02 26778.9 15
## 31 35000 35000 23896.02 26778.9 15
## 32 35000 35000 23896.02 26778.9 15
## 33 35000 35000 23896.02 26778.9 15
## 34 35000 35000 23896.02 26778.9 15
## 35 35000 35000 23896.02 26778.9 15
## 36 35000 35000 23896.02 26778.9 15
## 37 35000 35000 23896.02 26778.9 15
## 38 35000 35000 23896.02 26778.9 15
## 39 35000 35000 23896.02 26778.9 15
## 40 35000 35000 23896.02 26778.9 15
## 41 35000 35000 23896.02 26778.9 15
## 42 35000 35000 23896.02 26778.9 15
## 43 35000 35000 23896.02 26778.9 15
## 44 35000 35000 23896.02 26778.9 15
## 45 35000 35000 23896.02 26778.9 15
## 46 35000 35000 23896.02 26778.9 15
## 47 35000 35000 23896.02 26778.9 15
## 48 35000 35000 23896.02 26778.9 15
## 49 35000 35000 23896.02 26778.9 15
## 50 35000 35000 23896.02 26778.9 15
## 51 35000 35000 23896.02 26778.9 15
## 52 35000 35000 23896.02 26778.9 15
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 28 65000
## 29 65000
## 30 65000
## 31 65000
## 32 65000
## 33 65000
## 34 65000
## 35 65000
## 36 65000
## 37 65000
## 38 65000
## 39 65000
## 40 65000
## 41 65000
## 42 65000
## 43 65000
## 44 65000
## 45 65000
## 46 65000
## 47 65000
## 48 65000
## 49 65000
## 50 65000
## 51 65000
## 52 65000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 19
## 3 30
## 4 27
## 5 19
## 6 30
## 7 24
## 8 25
## 9 14
## 10 13
## 11 30
## 12 1
## 13 17
## 14 30
## 15 21
## 16 30
## 17 30
## 18 24
## 19 30
## 20 19
## 21 19
## 22 27
## 23 30
## 24 27
## 25 30
## 26 30
## 27 30
## 28 6
## 29 30
## 30 21
## 31 23
## 32 30
## 33 28
## 34 26
## 35 30
## 36 30
## 37 30
## 38 27
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 6
## 45 28
## 46 30
## 47 30
## 48 27
## 49 30
## 50 30
## 51 30
## 52 30
## 53 30
## 54 6
## 55 30
## 56 30
## 57 27
## 58 19
## 59 30
## 60 24
## 61 30
## 62 19
## 63 30
## 64 28
## 65 30
## 66 30
## 67 30
## 68 30
## 69 27
## 70 30
## 71 30
## 72 30
## 73 6
## 74 30
## 75 24
## 76 27
## 77 19
## 78 30
## 79 30
## 80 30
## 81 19
## 82 30
##
## [[4]]
## HiringAgency
## 1 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 2 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 3 MassageLuXe Spa - NashvilleNashville, TN 37203
## 4 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 5 The Spa at Leipers ForkFranklin, TN 37064
## 6 RENEW-U 360Brentwood, TN 37027
## 7 Soothe3.7Nashville, TN
## 8 The Joseph, A Luxury Collection HotelNashville, TN
## 9 Practical Massage TherapyNashville, TN 37204
## 10 Luxe & Luna Boutique SpaNashville, TN 37209
## 11 Flamingo4.2Nashville, TN 37209
## 12 pure life massageFranklin, TN 37069
## 13 Indo-Pak Massage TherapyFranklin, TN•Remote work available
## 14 SMPLNashville, TN 37207
## 15 Style Bar and Spa on 6thNashville, TN
## 16 Massage Envy HendersonvilleHendersonville, TN 37075
## 17 Massage Envy Mount JulietMount Juliet, TN 37122
## 18 Soothe3.7Nashville, TN
## 19 RENEW-U 360Brentwood, TN 37027
## 20 The Spa at Leipers ForkFranklin, TN 37064
## 21 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 22 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 23 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 24 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 25 Nashville Neck & BackMadison, TN 37115
## 26 Back In Touch Wellness CenterNashville, TN 37203
## 27 Life Time3.6Franklin, TN 37067 (McEwen area)
## 28 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 29 MassageLuXe Spa - NashvilleNashville, TN 37203
## 30 Style Bar and Spa on 6thNashville, TN
## 31 Green Hills Chiropractic ClinicNashville, TN 37215 (Green Hills area)
## 32 Massage Envy3.2Nashville, TN 37205
## 33 Urban Oasis Salon & Day SpaNashville, TN 37212 (Bellmont Hillsboro area)
## 34 The Office RelaxationNashville, TN 37214
## 35 Massage Envy Mount JulietMount Juliet, TN 37122
## 36 The NOW, LLCNashville, TN 37219+2 locations
## 37 Massage Envy3.2Nashville, TN 37205+2 locations
## 38 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 39 Spavia Day Spa3.3Nashville, TN 37221
## 40 Indo-Pak Massage TherapyNashville, TN
## 41 Nashville Neck & BackMadison, TN 37115
## 42 Back In Touch Wellness CenterNashville, TN 37203
## 43 Life Time3.6Franklin, TN 37067 (McEwen area)
## 44 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 45 Urban Oasis Salon & Day SpaNashville, TN 37212 (Bellmont Hillsboro area)
## 46 The NOW, LLCNashville, TN 37219+2 locations
## 47 Massage Envy3.2Nashville, TN 37205+2 locations
## 48 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 49 Indo-Pak Massage TherapyNashville, TN
## 50 Spavia Day Spa3.3Nashville, TN 37221
## 51 Nashville Neck & BackMadison, TN 37115
## 52 Back In Touch Wellness CenterNashville, TN 37203
## 53 Life Time3.6Franklin, TN 37067 (McEwen area)
## 54 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 55 Massage Envy Mount JulietMount Juliet, TN 37122
## 56 Massage Envy HendersonvilleHendersonville, TN 37075
## 57 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 58 The Spa at Leipers ForkFranklin, TN 37064
## 59 RENEW-U 360Brentwood, TN 37027
## 60 Soothe3.7Nashville, TN
## 61 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 62 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 63 MassageLuXe Spa - NashvilleNashville, TN 37203
## 64 Urban Oasis Salon & Day SpaNashville, TN 37212 (Bellmont Hillsboro area)
## 65 The NOW, LLCNashville, TN 37219+2 locations
## 66 Massage Envy3.2Nashville, TN 37205+2 locations
## 67 Spavia Day Spa3.3Nashville, TN 37221
## 68 Indo-Pak Massage TherapyNashville, TN
## 69 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 70 Nashville Neck & BackMadison, TN 37115
## 71 Back In Touch Wellness CenterNashville, TN 37203
## 72 Life Time3.6Franklin, TN 37067 (McEwen area)
## 73 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 74 Massage Envy Mount JulietMount Juliet, TN 37122
## 75 Soothe3.7Nashville, TN
## 76 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 77 The Spa at Leipers ForkFranklin, TN 37064
## 78 RENEW-U 360Brentwood, TN 37027
## 79 Massage Envy HendersonvilleHendersonville, TN 37075
## 80 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 81 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 82 MassageLuXe Spa - NashvilleNashville, TN 37203
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 3 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 4 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 11 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 12 \nUp to $45,000 a year $45000 45000 NA
## 13 \nUp to $45,000 a year $45000 45000 NA
## 15 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 16 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 18 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 19 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 20 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 24 \nUp to $45,000 a year $45000 45000 NA
## 25 \nFrom $50,000 a year $50000 50000 NA
## 26 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 27 \n$30,000 - $45,000 a year $30000 - $45000 30000 45000
## 30 \nFrom $50,000 a year $50000 50000 NA
## 31 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 33 \n$30,000 - $45,000 a year $30000 - $45000 30000 45000
## 34 \nUp to $45,000 a year $45000 45000 NA
## 35 \nUp to $45,000 a year $45000 45000 NA
## 36 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 39 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 40 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## 42 \nFrom $50,000 a year $50000 50000 NA
## 43 \n$30,000 - $45,000 a year $30000 - $45000 30000 45000
## 45 \n$35,000 - $65,000 a year $35000 - $65000 35000 65000
## 46 \nUp to $45,000 a year $45000 45000 NA
## 47 \n$38,000 - $65,000 a year $38000 - $65000 38000 65000
## 49 \nUp to $45,000 a year $45000 45000 NA
## 51 \n$40,000 - $55,000 a year $40000 - $55000 40000 55000
## 52 \n$40,000 - $65,000 a year $40000 - $65000 40000 65000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 40000 65000 39903.23 58809.52 30000
## 3 40000 65000 39903.23 58809.52 30000
## 4 40000 65000 39903.23 58809.52 30000
## 11 40000 65000 39903.23 58809.52 30000
## 12 40000 65000 39903.23 58809.52 30000
## 13 40000 65000 39903.23 58809.52 30000
## 15 40000 65000 39903.23 58809.52 30000
## 16 40000 65000 39903.23 58809.52 30000
## 18 40000 65000 39903.23 58809.52 30000
## 19 40000 65000 39903.23 58809.52 30000
## 20 40000 65000 39903.23 58809.52 30000
## 24 40000 65000 39903.23 58809.52 30000
## 25 40000 65000 39903.23 58809.52 30000
## 26 40000 65000 39903.23 58809.52 30000
## 27 40000 65000 39903.23 58809.52 30000
## 30 40000 65000 39903.23 58809.52 30000
## 31 40000 65000 39903.23 58809.52 30000
## 33 40000 65000 39903.23 58809.52 30000
## 34 40000 65000 39903.23 58809.52 30000
## 35 40000 65000 39903.23 58809.52 30000
## 36 40000 65000 39903.23 58809.52 30000
## 39 40000 65000 39903.23 58809.52 30000
## 40 40000 65000 39903.23 58809.52 30000
## 42 40000 65000 39903.23 58809.52 30000
## 43 40000 65000 39903.23 58809.52 30000
## 45 40000 65000 39903.23 58809.52 30000
## 46 40000 65000 39903.23 58809.52 30000
## 47 40000 65000 39903.23 58809.52 30000
## 49 40000 65000 39903.23 58809.52 30000
## 51 40000 65000 39903.23 58809.52 30000
## 52 40000 65000 39903.23 58809.52 30000
## maximumMaxSalary
## 2 65000
## 3 65000
## 4 65000
## 11 65000
## 12 65000
## 13 65000
## 15 65000
## 16 65000
## 18 65000
## 19 65000
## 20 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 30 65000
## 31 65000
## 33 65000
## 34 65000
## 35 65000
## 36 65000
## 39 65000
## 40 65000
## 42 65000
## 43 65000
## 45 65000
## 46 65000
## 47 65000
## 49 65000
## 51 65000
## 52 65000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 - $25 an hour $20 - $25 20 25 27
## 5 \n$30 - $50 an hour $30 - $50 30 50 27
## 6 \n$42 an hour $42 42 NA 27
## 7 \n$24 - $38 an hour $24 - $38 24 38 27
## 8 \n$60 - $65 an hour $60 - $65 60 65 27
## 9 \n$15 - $60 an hour $15 - $60 15 60 27
## 14 \n$30 - $50 an hour $30 - $50 30 50 27
## 17 \n$20 - $25 an hour $20 - $25 20 25 27
## 21 \n$15 - $18 an hour $15 - $18 15 18 27
## 22 \n$24 - $38 an hour $24 - $38 24 38 27
## 23 \n$30 - $40 an hour $30 - $40 30 40 27
## 28 \n$45 - $70 an hour $45 - $70 45 70 27
## 29 \n$24 - $38 an hour $24 - $38 24 38 27
## 32 \n$45 - $70 an hour $45 - $70 45 70 27
## 37 \n$30 - $50 an hour $30 - $50 30 50 27
## 38 \n$20 - $25 an hour $20 - $25 20 25 27
## 41 \n$24 - $38 an hour $24 - $38 24 38 27
## 44 \n$45 - $70 an hour $45 - $70 45 70 27
## 48 \n$30 - $50 an hour $30 - $50 30 50 27
## 50 \n$20 - $25 an hour $20 - $25 20 25 27
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 29.65 44.47368 15 70
## 5 40 29.65 44.47368 15 70
## 6 40 29.65 44.47368 15 70
## 7 40 29.65 44.47368 15 70
## 8 40 29.65 44.47368 15 70
## 9 40 29.65 44.47368 15 70
## 14 40 29.65 44.47368 15 70
## 17 40 29.65 44.47368 15 70
## 21 40 29.65 44.47368 15 70
## 22 40 29.65 44.47368 15 70
## 23 40 29.65 44.47368 15 70
## 28 40 29.65 44.47368 15 70
## 29 40 29.65 44.47368 15 70
## 32 40 29.65 44.47368 15 70
## 37 40 29.65 44.47368 15 70
## 38 40 29.65 44.47368 15 70
## 41 40 29.65 44.47368 15 70
## 44 40 29.65 44.47368 15 70
## 48 40 29.65 44.47368 15 70
## 50 40 29.65 44.47368 15 70
##
## [[7]]
## city state
## 1 Nashville TN
## 2 Nashville TN
## 3 Nashville TN
## 4 Nashville TN
## 5 Nashville TN
## 6 Nashville TN
## 7 Nashville TN
## 8 Nashville TN
## 9 Nashville TN
## 10 Nashville TN
## 11 Nashville TN
## 12 Nashville TN
## 13 Nashville TN
## 14 Nashville TN
## 15 Nashville TN
## 16 Nashville TN
## 17 Nashville TN
## 18 Nashville TN
## 19 Nashville TN
## 20 Nashville TN
## 21 Nashville TN
## 22 Nashville TN
## 23 Nashville TN
## 24 Nashville TN
## 25 Nashville TN
## 26 Nashville TN
## 27 Nashville TN
## 28 Nashville TN
## 29 Nashville TN
## 30 Nashville TN
## 31 Nashville TN
## 32 Nashville TN
## 33 Nashville TN
## 34 Nashville TN
## 35 Nashville TN
## 36 Nashville TN
## 37 Nashville TN
## 38 Nashville TN
## 39 Nashville TN
## 40 Nashville TN
## 41 Nashville TN
## 42 Nashville TN
## 43 Nashville TN
## 44 Nashville TN
## 45 Nashville TN
## 46 Nashville TN
## 47 Nashville TN
## 48 Nashville TN
## 49 Nashville TN
## 50 Nashville TN
## 51 Nashville TN
## 52 Nashville TN
## 53 Nashville TN
## 54 Nashville TN
## 55 Nashville TN
## 56 Nashville TN
## 57 Nashville TN
## 58 Nashville TN
## 59 Nashville TN
## 60 Nashville TN
## 61 Nashville TN
## 62 Nashville TN
## 63 Nashville TN
## 64 Nashville TN
## 65 Nashville TN
## 66 Nashville TN
## 67 Nashville TN
## 68 Nashville TN
## 69 Nashville TN
## 70 Nashville TN
## 71 Nashville TN
## 72 Nashville TN
## 73 Nashville TN
## 74 Nashville TN
## 75 Nashville TN
## 76 Nashville TN
## 77 Nashville TN
## 78 Nashville TN
## 79 Nashville TN
## 80 Nashville TN
## 81 Nashville TN
## 82 Nashville TN
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
## 4 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 5 Licensed Massage Therapist
## 6 Part Time Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist (LMT)
## 11 Licensed Massage Therapist - Nashville, TN
## 12 Licensed Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist - Sign On Bonus Available
## 17 Licensed Massage Therapist - Sign On Bonus Available
## 18 Licensed Massage Therapist
## 19 Part Time Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Licensed Massage Therapist (LMT)
## 26 Part-Time & On Call Licensed Massage Therapist (LMT)
## 27 LifeSpa- Massage Therapist
## 28 Licensed Massage Therapist (LMT)
## 29 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
## 30 Licensed Massage Therapist
## 31 Licensed Massage Therapist
## 32 Massage Therapist [CUSTOMIZATION REQUIRED]
## 33 Licensed Massage Therapist (LMT)
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist - Sign On Bonus Available
## 36 Massage Therapist- Full or Part Time (Nashville, TN)
## 37 Massage Therapist
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Mobile Massage Therapist
## 41 Licensed Massage Therapist (LMT)
## 42 Part-Time & On Call Licensed Massage Therapist (LMT)
## 43 LifeSpa- Massage Therapist
## 44 Licensed Massage Therapist (LMT)
## 45 Licensed Massage Therapist (LMT)
## 46 Massage Therapist- Full or Part Time (Nashville, TN)
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Mobile Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist (LMT)
## 52 Part-Time & On Call Licensed Massage Therapist (LMT)
## 53 LifeSpa- Massage Therapist
## 54 Licensed Massage Therapist (LMT)
## 55 Licensed Massage Therapist - Sign On Bonus Available
## 56 Licensed Massage Therapist - Sign On Bonus Available
## 57 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 58 Licensed Massage Therapist
## 59 Part Time Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
## 64 Licensed Massage Therapist (LMT)
## 65 Massage Therapist- Full or Part Time (Nashville, TN)
## 66 Massage Therapist
## 67 Licensed Massage Therapist
## 68 Mobile Massage Therapist
## 69 Licensed Massage Therapist
## 70 Licensed Massage Therapist (LMT)
## 71 Part-Time & On Call Licensed Massage Therapist (LMT)
## 72 LifeSpa- Massage Therapist
## 73 Licensed Massage Therapist (LMT)
## 74 Licensed Massage Therapist - Sign On Bonus Available
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist - Up to $3,000 Signing Bonus
## 77 Licensed Massage Therapist
## 78 Part Time Licensed Massage Therapist
## 79 Licensed Massage Therapist - Sign On Bonus Available
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist
## 82 Nashville Spa Licensed Massage Therapist-$1,000 sign on bonu...
## HiringAgency
## 1 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 2 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 3 MassageLuXe Spa - NashvilleNashville, TN 37203
## 4 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 5 The Spa at Leipers ForkFranklin, TN 37064
## 6 RENEW-U 360Brentwood, TN 37027
## 7 Soothe3.7Nashville, TN
## 8 The Joseph, A Luxury Collection HotelNashville, TN
## 9 Practical Massage TherapyNashville, TN 37204
## 10 Luxe & Luna Boutique SpaNashville, TN 37209
## 11 Flamingo4.2Nashville, TN 37209
## 12 pure life massageFranklin, TN 37069
## 13 Indo-Pak Massage TherapyFranklin, TN•Remote work available
## 14 SMPLNashville, TN 37207
## 15 Style Bar and Spa on 6thNashville, TN
## 16 Massage Envy HendersonvilleHendersonville, TN 37075
## 17 Massage Envy Mount JulietMount Juliet, TN 37122
## 18 Soothe3.7Nashville, TN
## 19 RENEW-U 360Brentwood, TN 37027
## 20 The Spa at Leipers ForkFranklin, TN 37064
## 21 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 22 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 23 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 24 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 25 Nashville Neck & BackMadison, TN 37115
## 26 Back In Touch Wellness CenterNashville, TN 37203
## 27 Life Time3.6Franklin, TN 37067 (McEwen area)
## 28 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 29 MassageLuXe Spa - NashvilleNashville, TN 37203
## 30 Style Bar and Spa on 6thNashville, TN
## 31 Green Hills Chiropractic ClinicNashville, TN 37215 (Green Hills area)
## 32 Massage Envy3.2Nashville, TN 37205
## 33 Urban Oasis Salon & Day SpaNashville, TN 37212 (Bellmont Hillsboro area)
## 34 The Office RelaxationNashville, TN 37214
## 35 Massage Envy Mount JulietMount Juliet, TN 37122
## 36 The NOW, LLCNashville, TN 37219+2 locations
## 37 Massage Envy3.2Nashville, TN 37205+2 locations
## 38 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 39 Spavia Day Spa3.3Nashville, TN 37221
## 40 Indo-Pak Massage TherapyNashville, TN
## 41 Nashville Neck & BackMadison, TN 37115
## 42 Back In Touch Wellness CenterNashville, TN 37203
## 43 Life Time3.6Franklin, TN 37067 (McEwen area)
## 44 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 45 Urban Oasis Salon & Day SpaNashville, TN 37212 (Bellmont Hillsboro area)
## 46 The NOW, LLCNashville, TN 37219+2 locations
## 47 Massage Envy3.2Nashville, TN 37205+2 locations
## 48 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 49 Indo-Pak Massage TherapyNashville, TN
## 50 Spavia Day Spa3.3Nashville, TN 37221
## 51 Nashville Neck & BackMadison, TN 37115
## 52 Back In Touch Wellness CenterNashville, TN 37203
## 53 Life Time3.6Franklin, TN 37067 (McEwen area)
## 54 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 55 Massage Envy Mount JulietMount Juliet, TN 37122
## 56 Massage Envy HendersonvilleHendersonville, TN 37075
## 57 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 58 The Spa at Leipers ForkFranklin, TN 37064
## 59 RENEW-U 360Brentwood, TN 37027
## 60 Soothe3.7Nashville, TN
## 61 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 62 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 63 MassageLuXe Spa - NashvilleNashville, TN 37203
## 64 Urban Oasis Salon & Day SpaNashville, TN 37212 (Bellmont Hillsboro area)
## 65 The NOW, LLCNashville, TN 37219+2 locations
## 66 Massage Envy3.2Nashville, TN 37205+2 locations
## 67 Spavia Day Spa3.3Nashville, TN 37221
## 68 Indo-Pak Massage TherapyNashville, TN
## 69 Family Chiropractic Wellness CenterBrentwood, TN 37027
## 70 Nashville Neck & BackMadison, TN 37115
## 71 Back In Touch Wellness CenterNashville, TN 37203
## 72 Life Time3.6Franklin, TN 37067 (McEwen area)
## 73 Blue Sage Massage & Day SpaSmyrna, TN 37167
## 74 Massage Envy Mount JulietMount Juliet, TN 37122
## 75 Soothe3.7Nashville, TN
## 76 Massage Envy Brentwood & Green Hills4.1Nashville, TN 37215 (Green Hills area)
## 77 The Spa at Leipers ForkFranklin, TN 37064
## 78 RENEW-U 360Brentwood, TN 37027
## 79 Massage Envy HendersonvilleHendersonville, TN 37075
## 80 Massage Envy Belle Meade & Bellevue3.2Nashville, TN 37205
## 81 Hand and Stone Massage and Facial Spas-Nashville area3.0Brentwood, TN 37027
## 82 MassageLuXe Spa - NashvilleNashville, TN 37203
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 15 70 30000 65000
## 2 19 15 70 30000 65000
## 3 30 15 70 30000 65000
## 4 27 15 70 30000 65000
## 5 19 15 70 30000 65000
## 6 30 15 70 30000 65000
## 7 24 15 70 30000 65000
## 8 25 15 70 30000 65000
## 9 14 15 70 30000 65000
## 10 13 15 70 30000 65000
## 11 30 15 70 30000 65000
## 12 1 15 70 30000 65000
## 13 17 15 70 30000 65000
## 14 30 15 70 30000 65000
## 15 21 15 70 30000 65000
## 16 30 15 70 30000 65000
## 17 30 15 70 30000 65000
## 18 24 15 70 30000 65000
## 19 30 15 70 30000 65000
## 20 19 15 70 30000 65000
## 21 19 15 70 30000 65000
## 22 27 15 70 30000 65000
## 23 30 15 70 30000 65000
## 24 27 15 70 30000 65000
## 25 30 15 70 30000 65000
## 26 30 15 70 30000 65000
## 27 30 15 70 30000 65000
## 28 6 15 70 30000 65000
## 29 30 15 70 30000 65000
## 30 21 15 70 30000 65000
## 31 23 15 70 30000 65000
## 32 30 15 70 30000 65000
## 33 28 15 70 30000 65000
## 34 26 15 70 30000 65000
## 35 30 15 70 30000 65000
## 36 30 15 70 30000 65000
## 37 30 15 70 30000 65000
## 38 27 15 70 30000 65000
## 39 30 15 70 30000 65000
## 40 30 15 70 30000 65000
## 41 30 15 70 30000 65000
## 42 30 15 70 30000 65000
## 43 30 15 70 30000 65000
## 44 6 15 70 30000 65000
## 45 28 15 70 30000 65000
## 46 30 15 70 30000 65000
## 47 30 15 70 30000 65000
## 48 27 15 70 30000 65000
## 49 30 15 70 30000 65000
## 50 30 15 70 30000 65000
## 51 30 15 70 30000 65000
## 52 30 15 70 30000 65000
## 53 30 15 70 30000 65000
## 54 6 15 70 30000 65000
## 55 30 15 70 30000 65000
## 56 30 15 70 30000 65000
## 57 27 15 70 30000 65000
## 58 19 15 70 30000 65000
## 59 30 15 70 30000 65000
## 60 24 15 70 30000 65000
## 61 30 15 70 30000 65000
## 62 19 15 70 30000 65000
## 63 30 15 70 30000 65000
## 64 28 15 70 30000 65000
## 65 30 15 70 30000 65000
## 66 30 15 70 30000 65000
## 67 30 15 70 30000 65000
## 68 30 15 70 30000 65000
## 69 27 15 70 30000 65000
## 70 30 15 70 30000 65000
## 71 30 15 70 30000 65000
## 72 30 15 70 30000 65000
## 73 6 15 70 30000 65000
## 74 30 15 70 30000 65000
## 75 24 15 70 30000 65000
## 76 27 15 70 30000 65000
## 77 19 15 70 30000 65000
## 78 30 15 70 30000 65000
## 79 30 15 70 30000 65000
## 80 30 15 70 30000 65000
## 81 19 15 70 30000 65000
## 82 30 15 70 30000 65000
getIndeedJobData5pages('massage therapist', 'Memphis','TN')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist **$1,000 Sign-on Bonus
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapist - Independent Contractor
## 5 Massage Therapist
## 6 Stretch Practitioner
## 7 Massage Therapist
## 8 Salon Massage Therapist
## 9 Licensed Massage Therapist **$1,000 Sign-on Bonus
## 10 Licensed Massage Therapist (LMT)
## 11 Massage Therapist - Independent Contractor
## 12 Massage Therapist
## 13 Stretch Practitioner
## 14 Massage Therapist
## 15 Salon Massage Therapist
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist **$1,000 Sign-on Bonus
## 18 Massage Therapist - Independent Contractor
## 19 Massage Therapist
## 20 Stretch Practitioner
## 21 Massage Therapist
## 22 Salon Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist (LMT)
## 25 Licensed Massage Therapist (LMT)
## 26 Massage Therapist - Independent Contractor
## 27 Massage Therapist
## 28 Stretch Practitioner
## 29 Massage Therapist
## 30 Salon Massage Therapist
## 31 Licensed Massage Therapist
## 32 Licensed Massage Therapist **$1,000 Sign-on Bonus
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist (LMT)
## 35 Licensed Massage Therapist **$1,000 Sign-on Bonus
## 36 Massage Therapist - Independent Contractor
## 37 Massage Therapist
## 38 Stretch Practitioner
## 39 Massage Therapist
## 40 Salon Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35 - $78 an hour $35 - $78 35 78
## 2 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 3 \n$35 - $47 an hour $35 - $47 35 47
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$10 - $20 an hour $10 - $20 10 20
## 6 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 7 \n$35 - $47 an hour $35 - $47 35 47
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$10 - $20 an hour $10 - $20 10 20
## 10 \n$35 - $78 an hour $35 - $78 35 78
## 11 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 13 \n$10 - $20 an hour $10 - $20 10 20
## 14 \n$35 - $78 an hour $35 - $78 35 78
## 15 \n$35 - $47 an hour $35 - $47 35 47
## 16 \n$35 - $47 an hour $35 - $47 35 47
## 17 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 18 \n$10 - $20 an hour $10 - $20 10 20
## 19 \n$35 - $78 an hour $35 - $78 35 78
## 20 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 21 \n$35 - $78 an hour $35 - $78 35 78
## 22 \n$35 - $47 an hour $35 - $47 35 47
## 23 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 24 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 25 \n$10 - $20 an hour $10 - $20 10 20
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35 62.5 8116 11472.5 10
## 2 35 62.5 8116 11472.5 10
## 3 35 62.5 8116 11472.5 10
## 4 35 62.5 8116 11472.5 10
## 5 35 62.5 8116 11472.5 10
## 6 35 62.5 8116 11472.5 10
## 7 35 62.5 8116 11472.5 10
## 8 35 62.5 8116 11472.5 10
## 9 35 62.5 8116 11472.5 10
## 10 35 62.5 8116 11472.5 10
## 11 35 62.5 8116 11472.5 10
## 12 35 62.5 8116 11472.5 10
## 13 35 62.5 8116 11472.5 10
## 14 35 62.5 8116 11472.5 10
## 15 35 62.5 8116 11472.5 10
## 16 35 62.5 8116 11472.5 10
## 17 35 62.5 8116 11472.5 10
## 18 35 62.5 8116 11472.5 10
## 19 35 62.5 8116 11472.5 10
## 20 35 62.5 8116 11472.5 10
## 21 35 62.5 8116 11472.5 10
## 22 35 62.5 8116 11472.5 10
## 23 35 62.5 8116 11472.5 10
## 24 35 62.5 8116 11472.5 10
## 25 35 62.5 8116 11472.5 10
## maximumMaxSalary
## 1 62000
## 2 62000
## 3 62000
## 4 62000
## 5 62000
## 6 62000
## 7 62000
## 8 62000
## 9 62000
## 10 62000
## 11 62000
## 12 62000
## 13 62000
## 14 62000
## 15 62000
## 16 62000
## 17 62000
## 18 62000
## 19 62000
## 20 62000
## 21 62000
## 22 62000
## 23 62000
## 24 62000
## 25 62000
##
## [[3]]
## date_daysAgo
## 1 14
## 2 30
## 3 30
## 4 17
## 5 30
## 6 30
## 7 30
## 8 30
## 9 30
## 10 30
## 11 17
## 12 30
## 13 30
## 14 30
## 15 30
## 16 14
## 17 30
## 18 17
## 19 30
## 20 30
## 21 30
## 22 30
## 23 14
## 24 30
## 25 30
## 26 17
## 27 30
## 28 30
## 29 30
## 30 30
## 31 14
## 32 30
## 33 14
## 34 30
## 35 30
## 36 17
## 37 30
## 38 30
## 39 30
## 40 30
##
## [[4]]
## HiringAgency
## 1 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 2 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 3 Sneed Medispa & WellnessMemphis, TN
## 4 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 5 Gould's SalonsMemphis, TN+1 location
## 6 Stretch Zone2.7Germantown, TN 38138
## 7 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 8 JCPenney3.7Southaven, MS 38671
## 9 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 10 Sneed Medispa & WellnessMemphis, TN
## 11 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 12 Gould's SalonsMemphis, TN+1 location
## 13 Stretch Zone2.7Germantown, TN 38138
## 14 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 15 JCPenney3.7Southaven, MS 38671
## 16 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 17 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 18 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 19 Gould's SalonsMemphis, TN+1 location
## 20 Stretch Zone2.7Germantown, TN 38138
## 21 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 22 JCPenney3.7Southaven, MS 38671
## 23 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 24 Sneed Medispa & WellnessMemphis, TN
## 25 Sneed Medispa & WellnessMemphis, TN
## 26 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 27 Gould's SalonsMemphis, TN+1 location
## 28 Stretch Zone2.7Germantown, TN 38138
## 29 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 30 JCPenney3.7Southaven, MS 38671
## 31 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 32 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 33 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 34 Sneed Medispa & WellnessMemphis, TN
## 35 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 36 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 37 Gould's SalonsMemphis, TN+1 location
## 38 Stretch Zone2.7Germantown, TN 38138
## 39 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 40 JCPenney3.7Southaven, MS 38671
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 6 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 11 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 20 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## 23 \n$35,500 - $62,000 a year $35500 - $62000 35500 62000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 35500 62000 35500 62000 35500
## 6 35500 62000 35500 62000 35500
## 11 35500 62000 35500 62000 35500
## 20 35500 62000 35500 62000 35500
## 23 35500 62000 35500 62000 35500
## maximumMaxSalary
## 2 62000
## 6 62000
## 11 62000
## 20 62000
## 23 62000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$35 - $78 an hour $35 - $78 35 78 35
## 3 \n$35 - $47 an hour $35 - $47 35 47 35
## 5 \n$10 - $20 an hour $10 - $20 10 20 35
## 7 \n$35 - $47 an hour $35 - $47 35 47 35
## 9 \n$10 - $20 an hour $10 - $20 10 20 35
## 10 \n$35 - $78 an hour $35 - $78 35 78 35
## 13 \n$10 - $20 an hour $10 - $20 10 20 35
## 14 \n$35 - $78 an hour $35 - $78 35 78 35
## 15 \n$35 - $47 an hour $35 - $47 35 47 35
## 16 \n$35 - $47 an hour $35 - $47 35 47 35
## 18 \n$10 - $20 an hour $10 - $20 10 20 35
## 19 \n$35 - $78 an hour $35 - $78 35 78 35
## 21 \n$35 - $78 an hour $35 - $78 35 78 35
## 22 \n$35 - $47 an hour $35 - $47 35 47 35
## 25 \n$10 - $20 an hour $10 - $20 10 20 35
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 47 26.66667 48.33333 10 78
## 3 47 26.66667 48.33333 10 78
## 5 47 26.66667 48.33333 10 78
## 7 47 26.66667 48.33333 10 78
## 9 47 26.66667 48.33333 10 78
## 10 47 26.66667 48.33333 10 78
## 13 47 26.66667 48.33333 10 78
## 14 47 26.66667 48.33333 10 78
## 15 47 26.66667 48.33333 10 78
## 16 47 26.66667 48.33333 10 78
## 18 47 26.66667 48.33333 10 78
## 19 47 26.66667 48.33333 10 78
## 21 47 26.66667 48.33333 10 78
## 22 47 26.66667 48.33333 10 78
## 25 47 26.66667 48.33333 10 78
##
## [[7]]
## city state jobTitle
## 1 Memphis TN Licensed Massage Therapist
## 2 Memphis TN Licensed Massage Therapist **$1,000 Sign-on Bonus
## 3 Memphis TN Licensed Massage Therapist (LMT)
## 4 Memphis TN Massage Therapist - Independent Contractor
## 5 Memphis TN Massage Therapist
## 6 Memphis TN Stretch Practitioner
## 7 Memphis TN Massage Therapist
## 8 Memphis TN Salon Massage Therapist
## 9 Memphis TN Licensed Massage Therapist **$1,000 Sign-on Bonus
## 10 Memphis TN Licensed Massage Therapist (LMT)
## 11 Memphis TN Massage Therapist - Independent Contractor
## 12 Memphis TN Massage Therapist
## 13 Memphis TN Stretch Practitioner
## 14 Memphis TN Massage Therapist
## 15 Memphis TN Salon Massage Therapist
## 16 Memphis TN Licensed Massage Therapist
## 17 Memphis TN Licensed Massage Therapist **$1,000 Sign-on Bonus
## 18 Memphis TN Massage Therapist - Independent Contractor
## 19 Memphis TN Massage Therapist
## 20 Memphis TN Stretch Practitioner
## 21 Memphis TN Massage Therapist
## 22 Memphis TN Salon Massage Therapist
## 23 Memphis TN Licensed Massage Therapist
## 24 Memphis TN Licensed Massage Therapist (LMT)
## 25 Memphis TN Licensed Massage Therapist (LMT)
## 26 Memphis TN Massage Therapist - Independent Contractor
## 27 Memphis TN Massage Therapist
## 28 Memphis TN Stretch Practitioner
## 29 Memphis TN Massage Therapist
## 30 Memphis TN Salon Massage Therapist
## 31 Memphis TN Licensed Massage Therapist
## 32 Memphis TN Licensed Massage Therapist **$1,000 Sign-on Bonus
## 33 Memphis TN Licensed Massage Therapist
## 34 Memphis TN Licensed Massage Therapist (LMT)
## 35 Memphis TN Licensed Massage Therapist **$1,000 Sign-on Bonus
## 36 Memphis TN Massage Therapist - Independent Contractor
## 37 Memphis TN Massage Therapist
## 38 Memphis TN Stretch Practitioner
## 39 Memphis TN Massage Therapist
## 40 Memphis TN Salon Massage Therapist
## HiringAgency
## 1 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 2 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 3 Sneed Medispa & WellnessMemphis, TN
## 4 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 5 Gould's SalonsMemphis, TN+1 location
## 6 Stretch Zone2.7Germantown, TN 38138
## 7 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 8 JCPenney3.7Southaven, MS 38671
## 9 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 10 Sneed Medispa & WellnessMemphis, TN
## 11 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 12 Gould's SalonsMemphis, TN+1 location
## 13 Stretch Zone2.7Germantown, TN 38138
## 14 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 15 JCPenney3.7Southaven, MS 38671
## 16 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 17 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 18 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 19 Gould's SalonsMemphis, TN+1 location
## 20 Stretch Zone2.7Germantown, TN 38138
## 21 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 22 JCPenney3.7Southaven, MS 38671
## 23 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 24 Sneed Medispa & WellnessMemphis, TN
## 25 Sneed Medispa & WellnessMemphis, TN
## 26 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 27 Gould's SalonsMemphis, TN+1 location
## 28 Stretch Zone2.7Germantown, TN 38138
## 29 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 30 JCPenney3.7Southaven, MS 38671
## 31 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 32 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 33 Midtown Massage & BodyworkMemphis, TN 38104 (Midtown area)
## 34 Sneed Medispa & WellnessMemphis, TN
## 35 Massage Envy3.2Memphis, TN 38104 (Midtown area)
## 36 Indo-Pak Massage TherapyMemphis, TN•Remote work available
## 37 Gould's SalonsMemphis, TN+1 location
## 38 Stretch Zone2.7Germantown, TN 38138
## 39 Memphis Jewish Community Center3.6Memphis, TN 38138 (River Oaks-Kirby-Balmoral area)
## 40 JCPenney3.7Southaven, MS 38671
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 14 10 78 35500 62000
## 2 30 10 78 35500 62000
## 3 30 10 78 35500 62000
## 4 17 10 78 35500 62000
## 5 30 10 78 35500 62000
## 6 30 10 78 35500 62000
## 7 30 10 78 35500 62000
## 8 30 10 78 35500 62000
## 9 30 10 78 35500 62000
## 10 30 10 78 35500 62000
## 11 17 10 78 35500 62000
## 12 30 10 78 35500 62000
## 13 30 10 78 35500 62000
## 14 30 10 78 35500 62000
## 15 30 10 78 35500 62000
## 16 14 10 78 35500 62000
## 17 30 10 78 35500 62000
## 18 17 10 78 35500 62000
## 19 30 10 78 35500 62000
## 20 30 10 78 35500 62000
## 21 30 10 78 35500 62000
## 22 30 10 78 35500 62000
## 23 14 10 78 35500 62000
## 24 30 10 78 35500 62000
## 25 30 10 78 35500 62000
## 26 17 10 78 35500 62000
## 27 30 10 78 35500 62000
## 28 30 10 78 35500 62000
## 29 30 10 78 35500 62000
## 30 30 10 78 35500 62000
## 31 14 10 78 35500 62000
## 32 30 10 78 35500 62000
## 33 14 10 78 35500 62000
## 34 30 10 78 35500 62000
## 35 30 10 78 35500 62000
## 36 17 10 78 35500 62000
## 37 30 10 78 35500 62000
## 38 30 10 78 35500 62000
## 39 30 10 78 35500 62000
## 40 30 10 78 35500 62000
getIndeedJobData5pages('massage therapist', 'Knoxville','TN')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT) for Chiropractic Office
## 2 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 3 Massage Therapist - Blackberry Mountain
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapists
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Massage Therapist
## 10 Spa Manager / LMT
## 11 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 12 Massage Therapist - Blackberry Mountain
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Massage Therapists
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist (LMT)
## 18 Massage Therapist
## 19 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 20 Spa Manager / LMT
## 21 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 22 Licensed Massage Therapist (LMT) for Chiropractic Office
## 23 Licensed Massage Therapist (LMT) for Chiropractic Office
## 24 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 25 Massage Therapist - Blackberry Mountain
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapists
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist
## 32 Spa Manager / LMT
## 33 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 34 Licensed Massage Therapist (LMT) for Chiropractic Office
## 35 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 36 Massage Therapist - Blackberry Mountain
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Massage Therapists
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist
## 43 Spa Manager / LMT
## 44 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 45 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 46 Spa Manager / LMT
## 47 Massage Therapist - Blackberry Mountain
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapists
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist (LMT)
## 53 Massage Therapist
## 54 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 55 Licensed Massage Therapist (LMT) for Chiropractic Office
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 2 \n$10 - $30 an hour $10 - $30 10 30
## 3 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 4 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 5 \n$13 - $18 an hour $13 - $18 13 18
## 6 \n$10 - $30 an hour $10 - $30 10 30
## 7 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 8 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 9 \n$13 - $18 an hour $13 - $18 13 18
## 10 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 11 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 12 \n$10 - $30 an hour $10 - $30 10 30
## 13 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 14 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 15 \n$13 - $18 an hour $13 - $18 13 18
## 16 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 17 \n$10 - $30 an hour $10 - $30 10 30
## 18 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 19 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 20 \n$13 - $18 an hour $13 - $18 13 18
## 21 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 22 \n$13 - $18 an hour $13 - $18 13 18
## 23 \n$10 - $30 an hour $10 - $30 10 30
## 24 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 25 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 20000 24000 16372 20237.6 10
## 2 20000 24000 16372 20237.6 10
## 3 20000 24000 16372 20237.6 10
## 4 20000 24000 16372 20237.6 10
## 5 20000 24000 16372 20237.6 10
## 6 20000 24000 16372 20237.6 10
## 7 20000 24000 16372 20237.6 10
## 8 20000 24000 16372 20237.6 10
## 9 20000 24000 16372 20237.6 10
## 10 20000 24000 16372 20237.6 10
## 11 20000 24000 16372 20237.6 10
## 12 20000 24000 16372 20237.6 10
## 13 20000 24000 16372 20237.6 10
## 14 20000 24000 16372 20237.6 10
## 15 20000 24000 16372 20237.6 10
## 16 20000 24000 16372 20237.6 10
## 17 20000 24000 16372 20237.6 10
## 18 20000 24000 16372 20237.6 10
## 19 20000 24000 16372 20237.6 10
## 20 20000 24000 16372 20237.6 10
## 21 20000 24000 16372 20237.6 10
## 22 20000 24000 16372 20237.6 10
## 23 20000 24000 16372 20237.6 10
## 24 20000 24000 16372 20237.6 10
## 25 20000 24000 16372 20237.6 10
## maximumMaxSalary
## 1 45000
## 2 45000
## 3 45000
## 4 45000
## 5 45000
## 6 45000
## 7 45000
## 8 45000
## 9 45000
## 10 45000
## 11 45000
## 12 45000
## 13 45000
## 14 45000
## 15 45000
## 16 45000
## 17 45000
## 18 45000
## 19 45000
## 20 45000
## 21 45000
## 22 45000
## 23 45000
## 24 45000
## 25 45000
##
## [[3]]
## date_daysAgo
## 1 22
## 2 21
## 3 30
## 4 23
## 5 21
## 6 30
## 7 12
## 8 3
## 9 30
## 10 3
## 11 30
## 12 30
## 13 23
## 14 21
## 15 30
## 16 12
## 17 3
## 18 30
## 19 30
## 20 3
## 21 21
## 22 22
## 23 22
## 24 21
## 25 30
## 26 23
## 27 21
## 28 30
## 29 12
## 30 3
## 31 30
## 32 3
## 33 30
## 34 22
## 35 21
## 36 30
## 37 23
## 38 21
## 39 30
## 40 12
## 41 3
## 42 30
## 43 3
## 44 30
## 45 21
## 46 3
## 47 30
## 48 23
## 49 21
## 50 30
## 51 12
## 52 3
## 53 30
## 54 30
## 55 22
##
## [[4]]
## HiringAgency
## 1 Confidential Chiropractic OfficeAlcoa, TN 37701
## 2 Blue Mountain Mist Inn & SpaSevierville, TN 37862
## 3 Blackberry Farm3.9Walland, TN 37886
## 4 Tranquility Spa and WellnessKnoxville, TN+2 locations
## 5 Natural Alternatives Salon Spa3.5Knoxville, TN 37919
## 6 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN
## 7 Wellness WayFarragut, TN 37934
## 8 B Blessed SpaSevierville, TN 37862
## 9 Massage Envy3.2Knoxville, TN 37919+3 locations
## 10 B Blessed SpaSevierville, TN 37862
## 11 City West SalonOak Ridge, TN 37830
## 12 Blackberry Farm3.9Walland, TN 37886
## 13 Tranquility Spa and WellnessKnoxville, TN+2 locations
## 14 Natural Alternatives Salon Spa3.5Knoxville, TN 37919
## 15 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN
## 16 Wellness WayFarragut, TN 37934
## 17 B Blessed SpaSevierville, TN 37862
## 18 Massage Envy3.2Knoxville, TN 37919+3 locations
## 19 City West SalonOak Ridge, TN 37830
## 20 B Blessed SpaSevierville, TN 37862
## 21 Blue Mountain Mist Inn & SpaSevierville, TN 37862
## 22 Confidential Chiropractic OfficeAlcoa, TN 37701
## 23 Confidential Chiropractic OfficeAlcoa, TN 37701
## 24 Blue Mountain Mist Inn & SpaSevierville, TN 37862
## 25 Blackberry Farm3.9Walland, TN 37886
## 26 Tranquility Spa and WellnessKnoxville, TN+2 locations
## 27 Natural Alternatives Salon Spa3.5Knoxville, TN 37919
## 28 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN
## 29 Wellness WayFarragut, TN 37934
## 30 B Blessed SpaSevierville, TN 37862
## 31 Massage Envy3.2Knoxville, TN 37919+3 locations
## 32 B Blessed SpaSevierville, TN 37862
## 33 City West SalonOak Ridge, TN 37830
## 34 Confidential Chiropractic OfficeAlcoa, TN 37701
## 35 Blue Mountain Mist Inn & SpaSevierville, TN 37862
## 36 Blackberry Farm3.9Walland, TN 37886
## 37 Tranquility Spa and WellnessKnoxville, TN+2 locations
## 38 Natural Alternatives Salon Spa3.5Knoxville, TN 37919
## 39 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN
## 40 Wellness WayFarragut, TN 37934
## 41 B Blessed SpaSevierville, TN 37862
## 42 Massage Envy3.2Knoxville, TN 37919+3 locations
## 43 B Blessed SpaSevierville, TN 37862
## 44 City West SalonOak Ridge, TN 37830
## 45 Blue Mountain Mist Inn & SpaSevierville, TN 37862
## 46 B Blessed SpaSevierville, TN 37862
## 47 Blackberry Farm3.9Walland, TN 37886
## 48 Tranquility Spa and WellnessKnoxville, TN+2 locations
## 49 Natural Alternatives Salon Spa3.5Knoxville, TN 37919
## 50 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN
## 51 Wellness WayFarragut, TN 37934
## 52 B Blessed SpaSevierville, TN 37862
## 53 Massage Envy3.2Knoxville, TN 37919+3 locations
## 54 City West SalonOak Ridge, TN 37830
## 55 Confidential Chiropractic OfficeAlcoa, TN 37701
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 3 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 4 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 7 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 8 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 10 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 11 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 13 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 14 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 16 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 18 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 19 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## 21 \n$28,000 - $45,000 a year $28000 - $45000 28000 45000
## 24 \n$33,837 - $40,468 a year $33837 - $40468 33837 40468
## 25 \n$20,000 - $35,000 a year $20000 - $35000 20000 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 28000 40468 27279 40156 20000
## 3 28000 40468 27279 40156 20000
## 4 28000 40468 27279 40156 20000
## 7 28000 40468 27279 40156 20000
## 8 28000 40468 27279 40156 20000
## 10 28000 40468 27279 40156 20000
## 11 28000 40468 27279 40156 20000
## 13 28000 40468 27279 40156 20000
## 14 28000 40468 27279 40156 20000
## 16 28000 40468 27279 40156 20000
## 18 28000 40468 27279 40156 20000
## 19 28000 40468 27279 40156 20000
## 21 28000 40468 27279 40156 20000
## 24 28000 40468 27279 40156 20000
## 25 28000 40468 27279 40156 20000
## maximumMaxSalary
## 1 45000
## 3 45000
## 4 45000
## 7 45000
## 8 45000
## 10 45000
## 11 45000
## 13 45000
## 14 45000
## 16 45000
## 18 45000
## 19 45000
## 21 45000
## 24 45000
## 25 45000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$10 - $30 an hour $10 - $30 10 30 11.5
## 5 \n$13 - $18 an hour $13 - $18 13 18 11.5
## 6 \n$10 - $30 an hour $10 - $30 10 30 11.5
## 9 \n$13 - $18 an hour $13 - $18 13 18 11.5
## 12 \n$10 - $30 an hour $10 - $30 10 30 11.5
## 15 \n$13 - $18 an hour $13 - $18 13 18 11.5
## 17 \n$10 - $30 an hour $10 - $30 10 30 11.5
## 20 \n$13 - $18 an hour $13 - $18 13 18 11.5
## 22 \n$13 - $18 an hour $13 - $18 13 18 11.5
## 23 \n$10 - $30 an hour $10 - $30 10 30 11.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 24 11.5 24 10 30
## 5 24 11.5 24 10 30
## 6 24 11.5 24 10 30
## 9 24 11.5 24 10 30
## 12 24 11.5 24 10 30
## 15 24 11.5 24 10 30
## 17 24 11.5 24 10 30
## 20 24 11.5 24 10 30
## 22 24 11.5 24 10 30
## 23 24 11.5 24 10 30
##
## [[7]]
## city state
## 1 Knoxville TN
## 2 Knoxville TN
## 3 Knoxville TN
## 4 Knoxville TN
## 5 Knoxville TN
## 6 Knoxville TN
## 7 Knoxville TN
## 8 Knoxville TN
## 9 Knoxville TN
## 10 Knoxville TN
## 11 Knoxville TN
## 12 Knoxville TN
## 13 Knoxville TN
## 14 Knoxville TN
## 15 Knoxville TN
## 16 Knoxville TN
## 17 Knoxville TN
## 18 Knoxville TN
## 19 Knoxville TN
## 20 Knoxville TN
## 21 Knoxville TN
## 22 Knoxville TN
## 23 Knoxville TN
## 24 Knoxville TN
## 25 Knoxville TN
## 26 Knoxville TN
## 27 Knoxville TN
## 28 Knoxville TN
## 29 Knoxville TN
## 30 Knoxville TN
## 31 Knoxville TN
## 32 Knoxville TN
## 33 Knoxville TN
## 34 Knoxville TN
## 35 Knoxville TN
## 36 Knoxville TN
## 37 Knoxville TN
## 38 Knoxville TN
## 39 Knoxville TN
## 40 Knoxville TN
## 41 Knoxville TN
## 42 Knoxville TN
## 43 Knoxville TN
## 44 Knoxville TN
## 45 Knoxville TN
## 46 Knoxville TN
## 47 Knoxville TN
## 48 Knoxville TN
## 49 Knoxville TN
## 50 Knoxville TN
## 51 Knoxville TN
## 52 Knoxville TN
## 53 Knoxville TN
## 54 Knoxville TN
## 55 Knoxville TN
## jobTitle
## 1 Licensed Massage Therapist (LMT) for Chiropractic Office
## 2 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 3 Massage Therapist - Blackberry Mountain
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapists
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Massage Therapist
## 10 Spa Manager / LMT
## 11 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 12 Massage Therapist - Blackberry Mountain
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Massage Therapists
## 16 Licensed Massage Therapist
## 17 Licensed Massage Therapist (LMT)
## 18 Massage Therapist
## 19 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 20 Spa Manager / LMT
## 21 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 22 Licensed Massage Therapist (LMT) for Chiropractic Office
## 23 Licensed Massage Therapist (LMT) for Chiropractic Office
## 24 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 25 Massage Therapist - Blackberry Mountain
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Massage Therapists
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist
## 32 Spa Manager / LMT
## 33 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 34 Licensed Massage Therapist (LMT) for Chiropractic Office
## 35 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 36 Massage Therapist - Blackberry Mountain
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Massage Therapists
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist (LMT)
## 42 Massage Therapist
## 43 Spa Manager / LMT
## 44 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 45 Licensed Massage Therapist (LMT) - TN Massage License Requir...
## 46 Spa Manager / LMT
## 47 Massage Therapist - Blackberry Mountain
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapists
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist (LMT)
## 53 Massage Therapist
## 54 Hairdressers, Nail Technicians, Massage Therapists, and Esth...
## 55 Licensed Massage Therapist (LMT) for Chiropractic Office
## HiringAgency date_daysAgo
## 1 Confidential Chiropractic OfficeAlcoa, TN 37701 22
## 2 Blue Mountain Mist Inn & SpaSevierville, TN 37862 21
## 3 Blackberry Farm3.9Walland, TN 37886 30
## 4 Tranquility Spa and WellnessKnoxville, TN+2 locations 23
## 5 Natural Alternatives Salon Spa3.5Knoxville, TN 37919 21
## 6 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN 30
## 7 Wellness WayFarragut, TN 37934 12
## 8 B Blessed SpaSevierville, TN 37862 3
## 9 Massage Envy3.2Knoxville, TN 37919+3 locations 30
## 10 B Blessed SpaSevierville, TN 37862 3
## 11 City West SalonOak Ridge, TN 37830 30
## 12 Blackberry Farm3.9Walland, TN 37886 30
## 13 Tranquility Spa and WellnessKnoxville, TN+2 locations 23
## 14 Natural Alternatives Salon Spa3.5Knoxville, TN 37919 21
## 15 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN 30
## 16 Wellness WayFarragut, TN 37934 12
## 17 B Blessed SpaSevierville, TN 37862 3
## 18 Massage Envy3.2Knoxville, TN 37919+3 locations 30
## 19 City West SalonOak Ridge, TN 37830 30
## 20 B Blessed SpaSevierville, TN 37862 3
## 21 Blue Mountain Mist Inn & SpaSevierville, TN 37862 21
## 22 Confidential Chiropractic OfficeAlcoa, TN 37701 22
## 23 Confidential Chiropractic OfficeAlcoa, TN 37701 22
## 24 Blue Mountain Mist Inn & SpaSevierville, TN 37862 21
## 25 Blackberry Farm3.9Walland, TN 37886 30
## 26 Tranquility Spa and WellnessKnoxville, TN+2 locations 23
## 27 Natural Alternatives Salon Spa3.5Knoxville, TN 37919 21
## 28 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN 30
## 29 Wellness WayFarragut, TN 37934 12
## 30 B Blessed SpaSevierville, TN 37862 3
## 31 Massage Envy3.2Knoxville, TN 37919+3 locations 30
## 32 B Blessed SpaSevierville, TN 37862 3
## 33 City West SalonOak Ridge, TN 37830 30
## 34 Confidential Chiropractic OfficeAlcoa, TN 37701 22
## 35 Blue Mountain Mist Inn & SpaSevierville, TN 37862 21
## 36 Blackberry Farm3.9Walland, TN 37886 30
## 37 Tranquility Spa and WellnessKnoxville, TN+2 locations 23
## 38 Natural Alternatives Salon Spa3.5Knoxville, TN 37919 21
## 39 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN 30
## 40 Wellness WayFarragut, TN 37934 12
## 41 B Blessed SpaSevierville, TN 37862 3
## 42 Massage Envy3.2Knoxville, TN 37919+3 locations 30
## 43 B Blessed SpaSevierville, TN 37862 3
## 44 City West SalonOak Ridge, TN 37830 30
## 45 Blue Mountain Mist Inn & SpaSevierville, TN 37862 21
## 46 B Blessed SpaSevierville, TN 37862 3
## 47 Blackberry Farm3.9Walland, TN 37886 30
## 48 Tranquility Spa and WellnessKnoxville, TN+2 locations 23
## 49 Natural Alternatives Salon Spa3.5Knoxville, TN 37919 21
## 50 Wake Spa Knoxville | Kana Hotel GroupKnoxville, TN 30
## 51 Wellness WayFarragut, TN 37934 12
## 52 B Blessed SpaSevierville, TN 37862 3
## 53 Massage Envy3.2Knoxville, TN 37919+3 locations 30
## 54 City West SalonOak Ridge, TN 37830 30
## 55 Confidential Chiropractic OfficeAlcoa, TN 37701 22
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 10 30 20000 45000
## 2 10 30 20000 45000
## 3 10 30 20000 45000
## 4 10 30 20000 45000
## 5 10 30 20000 45000
## 6 10 30 20000 45000
## 7 10 30 20000 45000
## 8 10 30 20000 45000
## 9 10 30 20000 45000
## 10 10 30 20000 45000
## 11 10 30 20000 45000
## 12 10 30 20000 45000
## 13 10 30 20000 45000
## 14 10 30 20000 45000
## 15 10 30 20000 45000
## 16 10 30 20000 45000
## 17 10 30 20000 45000
## 18 10 30 20000 45000
## 19 10 30 20000 45000
## 20 10 30 20000 45000
## 21 10 30 20000 45000
## 22 10 30 20000 45000
## 23 10 30 20000 45000
## 24 10 30 20000 45000
## 25 10 30 20000 45000
## 26 10 30 20000 45000
## 27 10 30 20000 45000
## 28 10 30 20000 45000
## 29 10 30 20000 45000
## 30 10 30 20000 45000
## 31 10 30 20000 45000
## 32 10 30 20000 45000
## 33 10 30 20000 45000
## 34 10 30 20000 45000
## 35 10 30 20000 45000
## 36 10 30 20000 45000
## 37 10 30 20000 45000
## 38 10 30 20000 45000
## 39 10 30 20000 45000
## 40 10 30 20000 45000
## 41 10 30 20000 45000
## 42 10 30 20000 45000
## 43 10 30 20000 45000
## 44 10 30 20000 45000
## 45 10 30 20000 45000
## 46 10 30 20000 45000
## 47 10 30 20000 45000
## 48 10 30 20000 45000
## 49 10 30 20000 45000
## 50 10 30 20000 45000
## 51 10 30 20000 45000
## 52 10 30 20000 45000
## 53 10 30 20000 45000
## 54 10 30 20000 45000
## 55 10 30 20000 45000
Texas Houston, San Antonio, Dallas
getIndeedJobData5pages('massage therapist', 'Houston','TX')
## Warning in getIndeedJobData5pages("massage therapist", "Houston", "TX"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Houston", "TX"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 LMTs - Yelp's Best Massage Houston wants you! - Licensed Mas...
## 5 Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 MASSAGE THERAPIST - RIVER OAKS & MIDTOWN
## 20 Licensed Massage Therapist-Sugar Land
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist | On-Call
## 24 Massage Therapist Full Time
## 25 Stretch Technician - Restore Hyper Wellness
## 26 Chair Massage-Champions Social
## 27 Massage Therapist (LMT)
## 28 Licensed Massage Therapist
## 29 LMT Massage Therapist Needed - Full or Part-time
## 30 Kinesiology - Physical Therapy Assistant - Stretch Professio...
## 31 Licensed Massage Therapist (LMT)
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 LMTs - Yelp's Best Massage Houston wants you! - Licensed Mas...
## 36 Massage Therapist
## 37 Massage Therapist | On-Call
## 38 Massage Therapist Full Time
## 39 Stretch Technician - Restore Hyper Wellness
## 40 Massage Therapist (LMT)
## 41 Kinesiology - Physical Therapy Assistant - Stretch Professio...
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist LMT
## 44 Urgently Hiring Licensed Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist LMT
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Personal Trainer - Stretch Professional
## 51 Massage Therapist
## 52 LMT Massage Therapist Needed - Full or Part-time
## 53 Athletic Trainer - Stretch Professional
## 54 Licensed Massage Therapist - Must work nights/weekends
## 55 Dual Licensed Therapist
## 56 Massage Therapist Part-Time
## 57 Licensed LEAD Massage Therapist
## 58 Dual Licensed Therapist - Massage and Skincare
## 59 Licensed Massage Therapist
## 60 Lead Massage Therapist - Trainer
## 61 Lead Massage Therapist
## 62 Optional Dual Licensed Therapist Massage & Skincare
## 63 Licensed LEAD Massage Therapist
## 64 Lead Massage Therapist - Trainer
## 65 Stretch Professional (Flexologist)
## 66 Massage Therapist 1960 Area
## 67 FEMALE Licensed Massage Therapist (LMT)
## 68 Optional Dual Licensed Therapist Massage & Skincare
## 69 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 70 Personal Trainer - Stretch Professional
## 71 Massage Therapist
## 72 Athletic Trainer - Stretch Professional
## 73 Licensed Massage Therapist - Must work nights/weekends
## 74 Dual Licensed Therapist
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
## 77 LMTs - Yelp's Best Massage Houston wants you! - Licensed Mas...
## 78 Massage Therapist
## 79 Licensed Massage Therapist (LMT)
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist
## 82 Licensed Massage Therapist
## 83 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$40 - $55 an hour $40 - $55 40 55
## 2 \n$15 - $25 an hour $15 - $25 15 25
## 3 \n$25 an hour $25 25 NA
## 4 \n$24 - $38 an hour $24 - $38 24 38
## 5 \n$44,800 - $65,000 a year $44800 - $65000 44800 65000
## 6 \n$13 - $42 an hour $13 - $42 13 42
## 7 \n$20 - $22 an hour $20 - $22 20 22
## 8 \n$25 - $35 an hour $25 - $35 25 35
## 9 \nFrom $25 an hour $25 25 NA
## 10 \n$30 - $35 an hour $30 - $35 30 35
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$16 - $50 an hour $16 - $50 16 50
## 13 \n$16 an hour $16 16 NA
## 14 \n$25 - $45 an hour $25 - $45 25 45
## 15 \n$24 - $48 an hour $24 - $48 24 48
## 16 \n$15 - $25 an hour $15 - $25 15 25
## 17 \n$25 - $50 an hour $25 - $50 25 50
## 18 \nUp to $45 an hour $45 45 NA
## 19 \n$40,000 - $52,000 a year $40000 - $52000 40000 52000
## 20 \n$20 - $22 an hour $20 - $22 20 22
## 21 \n$15 - $25 an hour $15 - $25 15 25
## 22 \n$25 an hour $25 25 NA
## 23 \n$24 - $38 an hour $24 - $38 24 38
## 24 \n$44,800 - $65,000 a year $44800 - $65000 44800 65000
## 25 \n$15 - $25 an hour $15 - $25 15 25
## 26 \n$25 - $40 an hour $25 - $40 25 40
## 27 \n$30 - $50 an hour $30 - $50 30 50
## 28 \nUp to $42 an hour ++ $42 42 NA
## 29 \n$17 - $40 an hour $17 - $40 17 40
## 30 \n$13 - $42 an hour $13 - $42 13 42
## 31 \n$40 - $55 an hour $40 - $55 40 55
## 32 \n$20 - $40 an hour $20 - $40 20 40
## 33 \nUp to $45 an hour $45 45 NA
## 34 \nUp to $42 an hour $42 42 NA
## 35 \n$30 - $50 an hour $30 - $50 30 50
## 36 \n$25 - $30 an hour $25 - $30 25 30
## 37 \n$20 - $40 an hour $20 - $40 20 40
## 38 \nUp to $42 an hour $42 42 NA
## 39 \n$20 - $22 an hour $20 - $22 20 22
## 40 \n$24 - $38 an hour $24 - $38 24 38
## 41 \n$44,800 - $65,000 a year $44800 - $65000 44800 65000
## 42 \n$40,000 - $52,000 a year $40000 - $52000 40000 52000
## 43 \n$13 - $42 an hour $13 - $42 13 42
## 44 \n$15 - $25 an hour $15 - $25 15 25
## 45 \n$25 an hour $25 25 NA
## 46 \n$40 - $55 an hour $40 - $55 40 55
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 32.5 4791.522 6494.622 13
## 2 25 32.5 4791.522 6494.622 13
## 3 25 32.5 4791.522 6494.622 13
## 4 25 32.5 4791.522 6494.622 13
## 5 25 32.5 4791.522 6494.622 13
## 6 25 32.5 4791.522 6494.622 13
## 7 25 32.5 4791.522 6494.622 13
## 8 25 32.5 4791.522 6494.622 13
## 9 25 32.5 4791.522 6494.622 13
## 10 25 32.5 4791.522 6494.622 13
## 11 25 32.5 4791.522 6494.622 13
## 12 25 32.5 4791.522 6494.622 13
## 13 25 32.5 4791.522 6494.622 13
## 14 25 32.5 4791.522 6494.622 13
## 15 25 32.5 4791.522 6494.622 13
## 16 25 32.5 4791.522 6494.622 13
## 17 25 32.5 4791.522 6494.622 13
## 18 25 32.5 4791.522 6494.622 13
## 19 25 32.5 4791.522 6494.622 13
## 20 25 32.5 4791.522 6494.622 13
## 21 25 32.5 4791.522 6494.622 13
## 22 25 32.5 4791.522 6494.622 13
## 23 25 32.5 4791.522 6494.622 13
## 24 25 32.5 4791.522 6494.622 13
## 25 25 32.5 4791.522 6494.622 13
## 26 25 32.5 4791.522 6494.622 13
## 27 25 32.5 4791.522 6494.622 13
## 28 25 32.5 4791.522 6494.622 13
## 29 25 32.5 4791.522 6494.622 13
## 30 25 32.5 4791.522 6494.622 13
## 31 25 32.5 4791.522 6494.622 13
## 32 25 32.5 4791.522 6494.622 13
## 33 25 32.5 4791.522 6494.622 13
## 34 25 32.5 4791.522 6494.622 13
## 35 25 32.5 4791.522 6494.622 13
## 36 25 32.5 4791.522 6494.622 13
## 37 25 32.5 4791.522 6494.622 13
## 38 25 32.5 4791.522 6494.622 13
## 39 25 32.5 4791.522 6494.622 13
## 40 25 32.5 4791.522 6494.622 13
## 41 25 32.5 4791.522 6494.622 13
## 42 25 32.5 4791.522 6494.622 13
## 43 25 32.5 4791.522 6494.622 13
## 44 25 32.5 4791.522 6494.622 13
## 45 25 32.5 4791.522 6494.622 13
## 46 25 32.5 4791.522 6494.622 13
## maximumMaxSalary
## 1 65000
## 2 65000
## 3 65000
## 4 65000
## 5 65000
## 6 65000
## 7 65000
## 8 65000
## 9 65000
## 10 65000
## 11 65000
## 12 65000
## 13 65000
## 14 65000
## 15 65000
## 16 65000
## 17 65000
## 18 65000
## 19 65000
## 20 65000
## 21 65000
## 22 65000
## 23 65000
## 24 65000
## 25 65000
## 26 65000
## 27 65000
## 28 65000
## 29 65000
## 30 65000
## 31 65000
## 32 65000
## 33 65000
## 34 65000
## 35 65000
## 36 65000
## 37 65000
## 38 65000
## 39 65000
## 40 65000
## 41 65000
## 42 65000
## 43 65000
## 44 65000
## 45 65000
## 46 65000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 21
## 3 3
## 4 30
## 5 30
## 6 30
## 7 3
## 8 30
## 9 30
## 10 30
## 11 30
## 12 5
## 13 30
## 14 5
## 15 20
## 16 24
## 17 27
## 18 30
## 19 30
## 20 2
## 21 30
## 22 30
## 23 20
## 24 6
## 25 30
## 26 30
## 27 30
## 28 30
## 29 30
## 30 30
## 31 8
## 32 3
## 33 21
## 34 3
## 35 30
## 36 30
## 37 20
## 38 6
## 39 30
## 40 30
## 41 30
## 42 12
## 43 25
## 44 30
## 45 30
## 46 30
## 47 30
## 48 30
## 49 30
## 50 30
## 51 1
## 52 30
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 25
## 59 20
## 60 14
## 61 30
## 62 30
## 63 14
## 64 30
## 65 30
## 66 27
## 67 29
## 68 15
## 69 30
## 70 30
## 71 1
## 72 30
## 73 30
## 74 30
## 75 30
## 76 3
## 77 30
## 78 30
## 79 8
## 80 30
## 81 21
## 82 3
## 83 30
##
## [[4]]
## HiringAgency
## 1 Fiori Spa3.7Houston, TX 77057 (Greater Uptown area)
## 2 TPN ManagmentHouston, TX 77018 (Oak Forest - Garden Oaks area)
## 3 Essential Body BarHouston, TX 77021 (Ost - South Union area)
## 4 Zalla Massage4.7Houston, TX 77006 (Neartown - Montrose area)
## 5 Hand & Stone Massage and Facial Spa (Galleria Area)3.0Houston, TX 77057 (Greater Uptown area)
## 6 River Oaks Chiropractic and Body WorksHouston, TX 77057 (Greater Uptown area)
## 7 Green Leaf Massage and Sports Recovery4.5Spring, TX 77388
## 8 The Luxurious Massage and Spa LLCSpring, TX 77379
## 9 Complete Therapies, L.L.C.Houston, TX
## 10 Hiatus Spa + Retreat3.2Houston, TX 77057 (Greater Uptown area)
## 11 Baanthai massageWebster, TX 77598
## 12 Indo-Pak Massage TherapyPearland, TX+2 locations•Remote work available
## 13 Bergamos Retreat2.6Friendswood, TX
## 14 Katy MedispaKaty, TX 77450
## 15 Atrium Salon & Day SpaCypress, TX 77429
## 16 Phenix Salon Suites3.9Katy, TX 77449
## 17 HealthSource Chiropractic3.7Houston, TX 77077 (Eldridge - West Oaks area)
## 18 Massage Heights3.1Houston, TX
## 19 Massage Heights Midtown Houston3.1Houston, TX
## 20 Cru' Day SpaSugar Land, TX 77498
## 21 RTB SpaHouston, TX 77079 (Addicks Park Ten area)
## 22 PS Lifestyle3.0League City, TX+1 location
## 23 Omni Hotels & Resorts3.8Houston, TX 77056 (Greater Uptown area)
## 24 Massage Envy3.2Pasadena, TX 77505+9 locations
## 25 Restore Hyper WellnessKaty, TX 77494
## 26 A Touch of Luck3.5Houston, TX 77072 (Alief area)
## 27 Beauty and Fitness CircleHouston, TX 77004 (Southeast area)
## 28 Massage Heights3.1Friendswood, TX 77546
## 29 Lordex Spine InstituteLeague City, TX
## 30 StretchLab3.8Bellaire, TX 77401
## 31 Massage Heights at Cinco Ranch3.1Katy, TX 77494
## 32 Green Leaf Massage and Sports Recovery4.5Spring, TX 77388
## 33 TPN ManagmentHouston, TX 77018 (Oak Forest - Garden Oaks area)
## 34 Essential Body BarHouston, TX 77021 (Ost - South Union area)
## 35 Zalla Massage4.7Houston, TX 77006 (Neartown - Montrose area)
## 36 Hand & Stone Massage and Facial Spa (Galleria Area)3.0Houston, TX 77057 (Greater Uptown area)
## 37 Omni Hotels & Resorts3.8Houston, TX 77056 (Greater Uptown area)
## 38 Massage Envy3.2Pasadena, TX 77505+9 locations
## 39 Restore Hyper WellnessKaty, TX 77494
## 40 Beauty and Fitness CircleHouston, TX 77004 (Southeast area)
## 41 StretchLab3.8Bellaire, TX 77401
## 42 HOLISTIQUE SPAKaty, TX 77450
## 43 Massage Heights - Vanderbilt3.1Houston, TX 77025 (Braeswood Place area)
## 44 Hand and Stone3.0Webster, TX 77598+3 locations
## 45 The Woodhouse Day Spa - BaybrookFriendswood, TX 77546
## 46 Massage Heights3.1Houston, TX 77025 (Braeswood Place area)
## 47 Complete Therapies, L.L.C.Houston, TX
## 48 River Oaks Chiropractic and Body WorksHouston, TX 77057 (Greater Uptown area)
## 49 Fiori Spa3.7Houston, TX 77057 (Greater Uptown area)
## 50 StretchLab3.8Bellaire, TX 77401
## 51 Primary Health & Wellness Center, LLCHouston, TX 77015
## 52 Lordex Spine InstituteLeague City, TX
## 53 StretchLab3.8Bellaire, TX 77401
## 54 Hand and Stone3.0Webster, TX 77598
## 55 Massage Heights3.1Houston, TX
## 56 Massage Envy3.2Houston, TX 77079 (West Houston area)
## 57 Massage Heights3.1Houston, TX 77077
## 58 Massage Heights - Vanderbilt3.1Houston, TX 77025 (Braeswood Place area)
## 59 The Woodhouse Day Spa - Sugar LandMissouri City, TX 77459
## 60 Massage Heights - Kings Crossing/Parkway Village3.1Kingwood, TX 77345 (Far Northeast area)
## 61 Massage Heights Parkway Village3.1Houston, TX 77077
## 62 Massage Heights3.1Houston, TX 77007 (Washington Avenue Coalition - Memorial Park area)
## 63 Massage Heights - Kings Crossing/Parkway Village3.1Houston, TX 77077
## 64 Massage Heights3.1Kingwood, TX 77345 (Far Northeast area)
## 65 Stretch Lab3.8Pearland, TX
## 66 Massage Envy3.2Houston, TX 77065
## 67 Soothing Thoughts MassageMissouri City, TX 77459
## 68 Massage Heights - Washington Heights3.1Houston, TX 77007 (Washington Avenue Coalition - Memorial Park area)
## 69 Villasport Athletic Club and Spa3.5Cypress, TX 77429+1 location
## 70 StretchLab3.8Bellaire, TX 77401
## 71 Primary Health & Wellness Center, LLCHouston, TX 77015
## 72 StretchLab3.8Bellaire, TX 77401
## 73 Hand and Stone3.0Webster, TX 77598
## 74 Massage Heights3.1Houston, TX
## 75 Complete Therapies, L.L.C.Houston, TX
## 76 Green Leaf Massage and Sports Recovery4.5Spring, TX 77388
## 77 Zalla Massage4.7Houston, TX 77006 (Neartown - Montrose area)
## 78 Hand & Stone Massage and Facial Spa (Galleria Area)3.0Houston, TX 77057 (Greater Uptown area)
## 79 Massage Heights at Cinco Ranch3.1Katy, TX 77494
## 80 River Oaks Chiropractic and Body WorksHouston, TX 77057 (Greater Uptown area)
## 81 TPN ManagmentHouston, TX 77018 (Oak Forest - Garden Oaks area)
## 82 Essential Body BarHouston, TX 77021 (Ost - South Union area)
## 83 Fiori Spa3.7Houston, TX 77057 (Greater Uptown area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 5 \n$44,800 - $65,000 a year $44800 - $65000 44800 65000
## 19 \n$40,000 - $52,000 a year $40000 - $52000 40000 52000
## 24 \n$44,800 - $65,000 a year $44800 - $65000 44800 65000
## 41 \n$44,800 - $65,000 a year $44800 - $65000 44800 65000
## 42 \n$40,000 - $52,000 a year $40000 - $52000 40000 52000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 5 44800 65000 42880 59800 40000
## 19 44800 65000 42880 59800 40000
## 24 44800 65000 42880 59800 40000
## 41 44800 65000 42880 59800 40000
## 42 44800 65000 42880 59800 40000
## maximumMaxSalary
## 5 65000
## 19 65000
## 24 65000
## 41 65000
## 42 65000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$40 - $55 an hour $40 - $55 40 55 24.5
## 2 \n$15 - $25 an hour $15 - $25 15 25 24.5
## 3 \n$25 an hour $25 25 NA 24.5
## 4 \n$24 - $38 an hour $24 - $38 24 38 24.5
## 6 \n$13 - $42 an hour $13 - $42 13 42 24.5
## 7 \n$20 - $22 an hour $20 - $22 20 22 24.5
## 8 \n$25 - $35 an hour $25 - $35 25 35 24.5
## 9 \nFrom $25 an hour $25 25 NA 24.5
## 10 \n$30 - $35 an hour $30 - $35 30 35 24.5
## 12 \n$16 - $50 an hour $16 - $50 16 50 24.5
## 13 \n$16 an hour $16 16 NA 24.5
## 14 \n$25 - $45 an hour $25 - $45 25 45 24.5
## 15 \n$24 - $48 an hour $24 - $48 24 48 24.5
## 16 \n$15 - $25 an hour $15 - $25 15 25 24.5
## 17 \n$25 - $50 an hour $25 - $50 25 50 24.5
## 18 \nUp to $45 an hour $45 45 NA 24.5
## 20 \n$20 - $22 an hour $20 - $22 20 22 24.5
## 21 \n$15 - $25 an hour $15 - $25 15 25 24.5
## 22 \n$25 an hour $25 25 NA 24.5
## 23 \n$24 - $38 an hour $24 - $38 24 38 24.5
## 25 \n$15 - $25 an hour $15 - $25 15 25 24.5
## 26 \n$25 - $40 an hour $25 - $40 25 40 24.5
## 27 \n$30 - $50 an hour $30 - $50 30 50 24.5
## 28 \nUp to $42 an hour ++ $42 42 NA 24.5
## 29 \n$17 - $40 an hour $17 - $40 17 40 24.5
## 30 \n$13 - $42 an hour $13 - $42 13 42 24.5
## 31 \n$40 - $55 an hour $40 - $55 40 55 24.5
## 32 \n$20 - $40 an hour $20 - $40 20 40 24.5
## 33 \nUp to $45 an hour $45 45 NA 24.5
## 34 \nUp to $42 an hour $42 42 NA 24.5
## 35 \n$30 - $50 an hour $30 - $50 30 50 24.5
## 36 \n$25 - $30 an hour $25 - $30 25 30 24.5
## 37 \n$20 - $40 an hour $20 - $40 20 40 24.5
## 38 \nUp to $42 an hour $42 42 NA 24.5
## 39 \n$20 - $22 an hour $20 - $22 20 22 24.5
## 40 \n$24 - $38 an hour $24 - $38 24 38 24.5
## 43 \n$13 - $42 an hour $13 - $42 13 42 24.5
## 44 \n$15 - $25 an hour $15 - $25 15 25 24.5
## 45 \n$25 an hour $25 25 NA 24.5
## 46 \n$40 - $55 an hour $40 - $55 40 55 24.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 25.25 38.3 13 55
## 2 40 25.25 38.3 13 55
## 3 40 25.25 38.3 13 55
## 4 40 25.25 38.3 13 55
## 6 40 25.25 38.3 13 55
## 7 40 25.25 38.3 13 55
## 8 40 25.25 38.3 13 55
## 9 40 25.25 38.3 13 55
## 10 40 25.25 38.3 13 55
## 12 40 25.25 38.3 13 55
## 13 40 25.25 38.3 13 55
## 14 40 25.25 38.3 13 55
## 15 40 25.25 38.3 13 55
## 16 40 25.25 38.3 13 55
## 17 40 25.25 38.3 13 55
## 18 40 25.25 38.3 13 55
## 20 40 25.25 38.3 13 55
## 21 40 25.25 38.3 13 55
## 22 40 25.25 38.3 13 55
## 23 40 25.25 38.3 13 55
## 25 40 25.25 38.3 13 55
## 26 40 25.25 38.3 13 55
## 27 40 25.25 38.3 13 55
## 28 40 25.25 38.3 13 55
## 29 40 25.25 38.3 13 55
## 30 40 25.25 38.3 13 55
## 31 40 25.25 38.3 13 55
## 32 40 25.25 38.3 13 55
## 33 40 25.25 38.3 13 55
## 34 40 25.25 38.3 13 55
## 35 40 25.25 38.3 13 55
## 36 40 25.25 38.3 13 55
## 37 40 25.25 38.3 13 55
## 38 40 25.25 38.3 13 55
## 39 40 25.25 38.3 13 55
## 40 40 25.25 38.3 13 55
## 43 40 25.25 38.3 13 55
## 44 40 25.25 38.3 13 55
## 45 40 25.25 38.3 13 55
## 46 40 25.25 38.3 13 55
##
## [[7]]
## city state
## 1 Houston TX
## 2 Houston TX
## 3 Houston TX
## 4 Houston TX
## 5 Houston TX
## 6 Houston TX
## 7 Houston TX
## 8 Houston TX
## 9 Houston TX
## 10 Houston TX
## 11 Houston TX
## 12 Houston TX
## 13 Houston TX
## 14 Houston TX
## 15 Houston TX
## 16 Houston TX
## 17 Houston TX
## 18 Houston TX
## 19 Houston TX
## 20 Houston TX
## 21 Houston TX
## 22 Houston TX
## 23 Houston TX
## 24 Houston TX
## 25 Houston TX
## 26 Houston TX
## 27 Houston TX
## 28 Houston TX
## 29 Houston TX
## 30 Houston TX
## 31 Houston TX
## 32 Houston TX
## 33 Houston TX
## 34 Houston TX
## 35 Houston TX
## 36 Houston TX
## 37 Houston TX
## 38 Houston TX
## 39 Houston TX
## 40 Houston TX
## 41 Houston TX
## 42 Houston TX
## 43 Houston TX
## 44 Houston TX
## 45 Houston TX
## 46 Houston TX
## 47 Houston TX
## 48 Houston TX
## 49 Houston TX
## 50 Houston TX
## 51 Houston TX
## 52 Houston TX
## 53 Houston TX
## 54 Houston TX
## 55 Houston TX
## 56 Houston TX
## 57 Houston TX
## 58 Houston TX
## 59 Houston TX
## 60 Houston TX
## 61 Houston TX
## 62 Houston TX
## 63 Houston TX
## 64 Houston TX
## 65 Houston TX
## 66 Houston TX
## 67 Houston TX
## 68 Houston TX
## 69 Houston TX
## 70 Houston TX
## 71 Houston TX
## 72 Houston TX
## 73 Houston TX
## 74 Houston TX
## 75 Houston TX
## 76 Houston TX
## 77 Houston TX
## 78 Houston TX
## 79 Houston TX
## 80 Houston TX
## 81 Houston TX
## 82 Houston TX
## 83 Houston TX
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 LMTs - Yelp's Best Massage Houston wants you! - Licensed Mas...
## 5 Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 MASSAGE THERAPIST - RIVER OAKS & MIDTOWN
## 20 Licensed Massage Therapist-Sugar Land
## 21 Massage Therapist
## 22 Licensed Massage Therapist
## 23 Massage Therapist | On-Call
## 24 Massage Therapist Full Time
## 25 Stretch Technician - Restore Hyper Wellness
## 26 Chair Massage-Champions Social
## 27 Massage Therapist (LMT)
## 28 Licensed Massage Therapist
## 29 LMT Massage Therapist Needed - Full or Part-time
## 30 Kinesiology - Physical Therapy Assistant - Stretch Professio...
## 31 Licensed Massage Therapist (LMT)
## 32 Licensed Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 LMTs - Yelp's Best Massage Houston wants you! - Licensed Mas...
## 36 Massage Therapist
## 37 Massage Therapist | On-Call
## 38 Massage Therapist Full Time
## 39 Stretch Technician - Restore Hyper Wellness
## 40 Massage Therapist (LMT)
## 41 Kinesiology - Physical Therapy Assistant - Stretch Professio...
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist LMT
## 44 Urgently Hiring Licensed Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist LMT
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Personal Trainer - Stretch Professional
## 51 Massage Therapist
## 52 LMT Massage Therapist Needed - Full or Part-time
## 53 Athletic Trainer - Stretch Professional
## 54 Licensed Massage Therapist - Must work nights/weekends
## 55 Dual Licensed Therapist
## 56 Massage Therapist Part-Time
## 57 Licensed LEAD Massage Therapist
## 58 Dual Licensed Therapist - Massage and Skincare
## 59 Licensed Massage Therapist
## 60 Lead Massage Therapist - Trainer
## 61 Lead Massage Therapist
## 62 Optional Dual Licensed Therapist Massage & Skincare
## 63 Licensed LEAD Massage Therapist
## 64 Lead Massage Therapist - Trainer
## 65 Stretch Professional (Flexologist)
## 66 Massage Therapist 1960 Area
## 67 FEMALE Licensed Massage Therapist (LMT)
## 68 Optional Dual Licensed Therapist Massage & Skincare
## 69 Massage Therapist - VillaSpa at VillaSport NOW OPEN
## 70 Personal Trainer - Stretch Professional
## 71 Massage Therapist
## 72 Athletic Trainer - Stretch Professional
## 73 Licensed Massage Therapist - Must work nights/weekends
## 74 Dual Licensed Therapist
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
## 77 LMTs - Yelp's Best Massage Houston wants you! - Licensed Mas...
## 78 Massage Therapist
## 79 Licensed Massage Therapist (LMT)
## 80 Licensed Massage Therapist
## 81 Licensed Massage Therapist
## 82 Licensed Massage Therapist
## 83 Licensed Massage Therapist
## HiringAgency
## 1 Fiori Spa3.7Houston, TX 77057 (Greater Uptown area)
## 2 TPN ManagmentHouston, TX 77018 (Oak Forest - Garden Oaks area)
## 3 Essential Body BarHouston, TX 77021 (Ost - South Union area)
## 4 Zalla Massage4.7Houston, TX 77006 (Neartown - Montrose area)
## 5 Hand & Stone Massage and Facial Spa (Galleria Area)3.0Houston, TX 77057 (Greater Uptown area)
## 6 River Oaks Chiropractic and Body WorksHouston, TX 77057 (Greater Uptown area)
## 7 Green Leaf Massage and Sports Recovery4.5Spring, TX 77388
## 8 The Luxurious Massage and Spa LLCSpring, TX 77379
## 9 Complete Therapies, L.L.C.Houston, TX
## 10 Hiatus Spa + Retreat3.2Houston, TX 77057 (Greater Uptown area)
## 11 Baanthai massageWebster, TX 77598
## 12 Indo-Pak Massage TherapyPearland, TX+2 locations•Remote work available
## 13 Bergamos Retreat2.6Friendswood, TX
## 14 Katy MedispaKaty, TX 77450
## 15 Atrium Salon & Day SpaCypress, TX 77429
## 16 Phenix Salon Suites3.9Katy, TX 77449
## 17 HealthSource Chiropractic3.7Houston, TX 77077 (Eldridge - West Oaks area)
## 18 Massage Heights3.1Houston, TX
## 19 Massage Heights Midtown Houston3.1Houston, TX
## 20 Cru' Day SpaSugar Land, TX 77498
## 21 RTB SpaHouston, TX 77079 (Addicks Park Ten area)
## 22 PS Lifestyle3.0League City, TX+1 location
## 23 Omni Hotels & Resorts3.8Houston, TX 77056 (Greater Uptown area)
## 24 Massage Envy3.2Pasadena, TX 77505+9 locations
## 25 Restore Hyper WellnessKaty, TX 77494
## 26 A Touch of Luck3.5Houston, TX 77072 (Alief area)
## 27 Beauty and Fitness CircleHouston, TX 77004 (Southeast area)
## 28 Massage Heights3.1Friendswood, TX 77546
## 29 Lordex Spine InstituteLeague City, TX
## 30 StretchLab3.8Bellaire, TX 77401
## 31 Massage Heights at Cinco Ranch3.1Katy, TX 77494
## 32 Green Leaf Massage and Sports Recovery4.5Spring, TX 77388
## 33 TPN ManagmentHouston, TX 77018 (Oak Forest - Garden Oaks area)
## 34 Essential Body BarHouston, TX 77021 (Ost - South Union area)
## 35 Zalla Massage4.7Houston, TX 77006 (Neartown - Montrose area)
## 36 Hand & Stone Massage and Facial Spa (Galleria Area)3.0Houston, TX 77057 (Greater Uptown area)
## 37 Omni Hotels & Resorts3.8Houston, TX 77056 (Greater Uptown area)
## 38 Massage Envy3.2Pasadena, TX 77505+9 locations
## 39 Restore Hyper WellnessKaty, TX 77494
## 40 Beauty and Fitness CircleHouston, TX 77004 (Southeast area)
## 41 StretchLab3.8Bellaire, TX 77401
## 42 HOLISTIQUE SPAKaty, TX 77450
## 43 Massage Heights - Vanderbilt3.1Houston, TX 77025 (Braeswood Place area)
## 44 Hand and Stone3.0Webster, TX 77598+3 locations
## 45 The Woodhouse Day Spa - BaybrookFriendswood, TX 77546
## 46 Massage Heights3.1Houston, TX 77025 (Braeswood Place area)
## 47 Complete Therapies, L.L.C.Houston, TX
## 48 River Oaks Chiropractic and Body WorksHouston, TX 77057 (Greater Uptown area)
## 49 Fiori Spa3.7Houston, TX 77057 (Greater Uptown area)
## 50 StretchLab3.8Bellaire, TX 77401
## 51 Primary Health & Wellness Center, LLCHouston, TX 77015
## 52 Lordex Spine InstituteLeague City, TX
## 53 StretchLab3.8Bellaire, TX 77401
## 54 Hand and Stone3.0Webster, TX 77598
## 55 Massage Heights3.1Houston, TX
## 56 Massage Envy3.2Houston, TX 77079 (West Houston area)
## 57 Massage Heights3.1Houston, TX 77077
## 58 Massage Heights - Vanderbilt3.1Houston, TX 77025 (Braeswood Place area)
## 59 The Woodhouse Day Spa - Sugar LandMissouri City, TX 77459
## 60 Massage Heights - Kings Crossing/Parkway Village3.1Kingwood, TX 77345 (Far Northeast area)
## 61 Massage Heights Parkway Village3.1Houston, TX 77077
## 62 Massage Heights3.1Houston, TX 77007 (Washington Avenue Coalition - Memorial Park area)
## 63 Massage Heights - Kings Crossing/Parkway Village3.1Houston, TX 77077
## 64 Massage Heights3.1Kingwood, TX 77345 (Far Northeast area)
## 65 Stretch Lab3.8Pearland, TX
## 66 Massage Envy3.2Houston, TX 77065
## 67 Soothing Thoughts MassageMissouri City, TX 77459
## 68 Massage Heights - Washington Heights3.1Houston, TX 77007 (Washington Avenue Coalition - Memorial Park area)
## 69 Villasport Athletic Club and Spa3.5Cypress, TX 77429+1 location
## 70 StretchLab3.8Bellaire, TX 77401
## 71 Primary Health & Wellness Center, LLCHouston, TX 77015
## 72 StretchLab3.8Bellaire, TX 77401
## 73 Hand and Stone3.0Webster, TX 77598
## 74 Massage Heights3.1Houston, TX
## 75 Complete Therapies, L.L.C.Houston, TX
## 76 Green Leaf Massage and Sports Recovery4.5Spring, TX 77388
## 77 Zalla Massage4.7Houston, TX 77006 (Neartown - Montrose area)
## 78 Hand & Stone Massage and Facial Spa (Galleria Area)3.0Houston, TX 77057 (Greater Uptown area)
## 79 Massage Heights at Cinco Ranch3.1Katy, TX 77494
## 80 River Oaks Chiropractic and Body WorksHouston, TX 77057 (Greater Uptown area)
## 81 TPN ManagmentHouston, TX 77018 (Oak Forest - Garden Oaks area)
## 82 Essential Body BarHouston, TX 77021 (Ost - South Union area)
## 83 Fiori Spa3.7Houston, TX 77057 (Greater Uptown area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 13 55 40000 65000
## 2 21 13 55 40000 65000
## 3 3 13 55 40000 65000
## 4 30 13 55 40000 65000
## 5 30 13 55 40000 65000
## 6 30 13 55 40000 65000
## 7 3 13 55 40000 65000
## 8 30 13 55 40000 65000
## 9 30 13 55 40000 65000
## 10 30 13 55 40000 65000
## 11 30 13 55 40000 65000
## 12 5 13 55 40000 65000
## 13 30 13 55 40000 65000
## 14 5 13 55 40000 65000
## 15 20 13 55 40000 65000
## 16 24 13 55 40000 65000
## 17 27 13 55 40000 65000
## 18 30 13 55 40000 65000
## 19 30 13 55 40000 65000
## 20 2 13 55 40000 65000
## 21 30 13 55 40000 65000
## 22 30 13 55 40000 65000
## 23 20 13 55 40000 65000
## 24 6 13 55 40000 65000
## 25 30 13 55 40000 65000
## 26 30 13 55 40000 65000
## 27 30 13 55 40000 65000
## 28 30 13 55 40000 65000
## 29 30 13 55 40000 65000
## 30 30 13 55 40000 65000
## 31 8 13 55 40000 65000
## 32 3 13 55 40000 65000
## 33 21 13 55 40000 65000
## 34 3 13 55 40000 65000
## 35 30 13 55 40000 65000
## 36 30 13 55 40000 65000
## 37 20 13 55 40000 65000
## 38 6 13 55 40000 65000
## 39 30 13 55 40000 65000
## 40 30 13 55 40000 65000
## 41 30 13 55 40000 65000
## 42 12 13 55 40000 65000
## 43 25 13 55 40000 65000
## 44 30 13 55 40000 65000
## 45 30 13 55 40000 65000
## 46 30 13 55 40000 65000
## 47 30 13 55 40000 65000
## 48 30 13 55 40000 65000
## 49 30 13 55 40000 65000
## 50 30 13 55 40000 65000
## 51 1 13 55 40000 65000
## 52 30 13 55 40000 65000
## 53 30 13 55 40000 65000
## 54 30 13 55 40000 65000
## 55 30 13 55 40000 65000
## 56 30 13 55 40000 65000
## 57 30 13 55 40000 65000
## 58 25 13 55 40000 65000
## 59 20 13 55 40000 65000
## 60 14 13 55 40000 65000
## 61 30 13 55 40000 65000
## 62 30 13 55 40000 65000
## 63 14 13 55 40000 65000
## 64 30 13 55 40000 65000
## 65 30 13 55 40000 65000
## 66 27 13 55 40000 65000
## 67 29 13 55 40000 65000
## 68 15 13 55 40000 65000
## 69 30 13 55 40000 65000
## 70 30 13 55 40000 65000
## 71 1 13 55 40000 65000
## 72 30 13 55 40000 65000
## 73 30 13 55 40000 65000
## 74 30 13 55 40000 65000
## 75 30 13 55 40000 65000
## 76 3 13 55 40000 65000
## 77 30 13 55 40000 65000
## 78 30 13 55 40000 65000
## 79 8 13 55 40000 65000
## 80 30 13 55 40000 65000
## 81 21 13 55 40000 65000
## 82 3 13 55 40000 65000
## 83 30 13 55 40000 65000
getIndeedJobData5pages('massage therapist', 'San Antonio','TX')
## Warning in getIndeedJobData5pages("massage therapist", "San Antonio", "TX"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "San Antonio", "TX"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Massage Therapist - Independent Contractor
## 5 Licensed Massage Therapist / TPC Parkway
## 6 Licensed Massage Therapist
## 7 Licensed Chair Massage Therapist
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 We are seeking a Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist - Loma de Vida Spa and Wellness
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Massage Therapist (LMT)
## 20 Massage Therapist - Independent Contractor
## 21 Massage Therapist
## 22 Licensed Massage Therapist- 281N & TPC Pkwy
## 23 Licensed Massage Therapist
## 24 Massage Therapist LMT
## 25 Massage Therapist LMT
## 26 Licensed Massage Therapist
## 27 Dual Licensed Therapist
## 28 Dual Licensed Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Licensed Chair Massage Therapist
## 32 Licensed Massage Therapist / TPC Parkway
## 33 Certified Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist LMT
## 39 Massage Therapist LMT
## 40 Licensed Massage Therapist
## 41 Dual Licensed Therapist
## 42 Dual Licensed Therapist
## 43 Massage Therapist - Independent Contractor
## 44 Licensed Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist
## 48 Liscensed Massage Therapist
## 49 Licensed Massage Therapist (LMT) PT/FT
## 50 Massage Therapist (LMT)
## 51 Massage Therapist - Independent Contractor
## 52 Licensed Massage Therapist- 281N & TPC Pkwy
## 53 Massage Therapist
## 54 Licensed Massage Therapist
## 55 Massage Therapist LMT
## 56 Massage Therapist LMT
## 57 Licensed Massage Therapist
## 58 Dual Licensed Therapist
## 59 Dual Licensed Therapist
## 60 Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Liscensed Massage Therapist
## 64 Licensed Massage Therapist (LMT) PT/FT
## 65 Massage Therapist (LMT)
## 66 Massage Therapist - Independent Contractor
## 67 Licensed Massage Therapist- 281N & TPC Pkwy
## 68 Massage Therapist
## 69 Licensed Massage Therapist
## 70 Massage Therapist LMT
## 71 Massage Therapist LMT
## 72 Licensed Massage Therapist
## 73 Dual Licensed Therapist
## 74 Dual Licensed Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $30 an hour $20 - $30 20 30
## 2 \n$36,000 - $69,000 a year $36000 - $69000 36000 69000
## 3 \n$35 an hour $35 35 NA
## 4 \n$18 - $42 an hour $18 - $42 18 42
## 5 \n$20 - $43 an hour $20 - $43 20 43
## 6 \n$20 - $35 an hour $20 - $35 20 35
## 7 \n$20 - $33 an hour $20 - $33 20 33
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$35 an hour $35 35 NA
## 10 \n$20 - $40 an hour $20 - $40 20 40
## 11 \n$38,000 - $62,000 a year $38000 - $62000 38000 62000
## 12 \n$35 - $40 an hour $35 - $40 35 40
## 13 \n$8 an hour $8 8 NA
## 14 \n$38 - $45 an hour $38 - $45 38 45
## 15 \n$18 - $22 an hour $18 - $22 18 22
## 16 \n$20 - $40 an hour $20 - $40 20 40
## 17 \n$18 - $42 an hour $18 - $42 18 42
## 18 \n$36,000 - $69,000 a year $36000 - $69000 36000 69000
## 19 \n$20 - $40 an hour $20 - $40 20 40
## 20 \n$20 - $30 an hour $20 - $30 20 30
## 21 \n$38,000 - $62,000 a year $38000 - $62000 38000 62000
## 22 \n$20 - $40 an hour $20 - $40 20 40
## 23 \n$35 an hour $35 35 NA
## 24 \n$20 - $45 an hour $20 - $45 20 45
## 25 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 26 \n$30,000 - $55,000 a year $30000 - $55000 30000 55000
## 27 \n$35 - $40 an hour $35 - $40 35 40
## 28 \n$38 - $45 an hour $38 - $45 38 45
## 29 \n$8 an hour $8 8 NA
## 30 \n$18 - $22 an hour $18 - $22 18 22
## 31 \n$20 - $40 an hour $20 - $40 20 40
## 32 \n$20 - $45 an hour $20 - $45 20 45
## 33 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 34 \n$30,000 - $55,000 a year $30000 - $55000 30000 55000
## 35 \n$35 - $40 an hour $35 - $40 35 40
## 36 \n$38 - $45 an hour $38 - $45 38 45
## 37 \n$8 an hour $8 8 NA
## 38 \n$18 - $22 an hour $18 - $22 18 22
## 39 \n$20 - $40 an hour $20 - $40 20 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 20 38 7428.154 10869.5 8
## 2 20 38 7428.154 10869.5 8
## 3 20 38 7428.154 10869.5 8
## 4 20 38 7428.154 10869.5 8
## 5 20 38 7428.154 10869.5 8
## 6 20 38 7428.154 10869.5 8
## 7 20 38 7428.154 10869.5 8
## 8 20 38 7428.154 10869.5 8
## 9 20 38 7428.154 10869.5 8
## 10 20 38 7428.154 10869.5 8
## 11 20 38 7428.154 10869.5 8
## 12 20 38 7428.154 10869.5 8
## 13 20 38 7428.154 10869.5 8
## 14 20 38 7428.154 10869.5 8
## 15 20 38 7428.154 10869.5 8
## 16 20 38 7428.154 10869.5 8
## 17 20 38 7428.154 10869.5 8
## 18 20 38 7428.154 10869.5 8
## 19 20 38 7428.154 10869.5 8
## 20 20 38 7428.154 10869.5 8
## 21 20 38 7428.154 10869.5 8
## 22 20 38 7428.154 10869.5 8
## 23 20 38 7428.154 10869.5 8
## 24 20 38 7428.154 10869.5 8
## 25 20 38 7428.154 10869.5 8
## 26 20 38 7428.154 10869.5 8
## 27 20 38 7428.154 10869.5 8
## 28 20 38 7428.154 10869.5 8
## 29 20 38 7428.154 10869.5 8
## 30 20 38 7428.154 10869.5 8
## 31 20 38 7428.154 10869.5 8
## 32 20 38 7428.154 10869.5 8
## 33 20 38 7428.154 10869.5 8
## 34 20 38 7428.154 10869.5 8
## 35 20 38 7428.154 10869.5 8
## 36 20 38 7428.154 10869.5 8
## 37 20 38 7428.154 10869.5 8
## 38 20 38 7428.154 10869.5 8
## 39 20 38 7428.154 10869.5 8
## maximumMaxSalary
## 1 69000
## 2 69000
## 3 69000
## 4 69000
## 5 69000
## 6 69000
## 7 69000
## 8 69000
## 9 69000
## 10 69000
## 11 69000
## 12 69000
## 13 69000
## 14 69000
## 15 69000
## 16 69000
## 17 69000
## 18 69000
## 19 69000
## 20 69000
## 21 69000
## 22 69000
## 23 69000
## 24 69000
## 25 69000
## 26 69000
## 27 69000
## 28 69000
## 29 69000
## 30 69000
## 31 69000
## 32 69000
## 33 69000
## 34 69000
## 35 69000
## 36 69000
## 37 69000
## 38 69000
## 39 69000
##
## [[3]]
## date_daysAgo
## 1 Just posted
## 2 24
## 3 30
## 4 13
## 5 7
## 6 24
## 7 24
## 8 Just posted
## 9 28
## 10 26
## 11 30
## 12 5
## 13 14
## 14 30
## 15 30
## 16 27
## 17 24
## 18 11
## 19 30
## 20 15
## 21 30
## 22 30
## 23 30
## 24 24
## 25 24
## 26 19
## 27 27
## 28 26
## 29 30
## 30 24
## 31 24
## 32 7
## 33 6
## 34 24
## 35 24
## 36 Just posted
## 37 11
## 38 24
## 39 24
## 40 19
## 41 27
## 42 26
## 43 13
## 44 Today
## 45 30
## 46 Today
## 47 30
## 48 30
## 49 30
## 50 30
## 51 15
## 52 30
## 53 30
## 54 30
## 55 24
## 56 24
## 57 19
## 58 27
## 59 26
## 60 30
## 61 Today
## 62 30
## 63 30
## 64 30
## 65 30
## 66 15
## 67 30
## 68 30
## 69 30
## 70 24
## 71 24
## 72 19
## 73 27
## 74 26
##
## [[4]]
## HiringAgency
## 1 San Antonio Elite ChiropracticSan Antonio, TX 78231
## 2 Massage Heights3.1San Antonio, TX (Stone Oak area)
## 3 Complete Therapies, L.L.C.San Antonio, TX
## 4 FLOATSan Antonio, TX 78201 (Jefferson-Monticello Park area)
## 5 Hand & Stone - San Antonio TX3.0San Antonio, TX 78258
## 6 Soothe3.7San Antonio, TX
## 7 Soothe3.7San Antonio, TX
## 8 Life Time3.6San Antonio, TX
## 9 Healing Sunshine Wellness InstituteSan Antonio, TX 78217 (Oak Grove Estates area)
## 10 Stay Young Mental Health & WellnessWindcrest, TX 78239
## 11 Healing Sunshine Wellness InstituteSan Antonio, TX 78217 (Oak Grove Estates area)
## 12 Bluegreen Vacations Corporation3.4San Antonio, TX 78256 (Friends Of Friedrich Wilderness Park area)
## 13 Benchmark Hospitality3.8San Antonio, TX 78256 (Friends Of Friedrich Wilderness Park area)
## 14 Indo-Pak Massage TherapySan Antonio, TX•Remote work available
## 15 The Day Spa @ Folawn'sSan Antonio, TX 78258
## 16 Elements3.6San Antonio, TX 78231
## 17 Massage Heights - Medical Center/Schertz Green Valley3.1San Antonio, TX 78240
## 18 Inspired Massage Therapy - Massage Heights4.9San Antonio, TX 78231
## 19 Beauty and Fitness CircleSan Antonio, TX 78230 (Vance Jackson area)
## 20 Andi's Therapeutic MassageSan Antonio, TX 78232
## 21 Phoenix Hospitality Group3.3San Antonio, TX 78235
## 22 Hand and Stone3.0San Antonio, TX 78258
## 23 Massage Envy3.2San Antonio, TX 78250 (Northwest Crossing area)+2 locations
## 24 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 25 Massage Heights3.1Schertz, TX 78154
## 26 Cambridge Spa Group LLCSan Antonio, TX
## 27 Massage Heights3.1Boerne, TX 78006
## 28 Massage Heights - Boerne3.1Boerne, TX 78006
## 29 Complete Therapies, L.L.C.San Antonio, TX
## 30 Soothe3.7San Antonio, TX
## 31 Soothe3.7San Antonio, TX
## 32 Hand & Stone - San Antonio TX3.0San Antonio, TX 78258
## 33 The Spa @ Fort SamSan Antonio, TX 78234 (Monte Vista area)
## 34 Massage Heights3.1San Antonio, TX (Stone Oak area)
## 35 Massage Heights - Medical Center/Schertz Green Valley3.1San Antonio, TX 78240
## 36 San Antonio Elite ChiropracticSan Antonio, TX 78231
## 37 Inspired Massage Therapy - Massage Heights4.9San Antonio, TX 78231
## 38 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 39 Massage Heights3.1Schertz, TX 78154
## 40 Cambridge Spa Group LLCSan Antonio, TX
## 41 Massage Heights3.1Boerne, TX 78006
## 42 Massage Heights - Boerne3.1Boerne, TX 78006
## 43 FLOATSan Antonio, TX 78201 (Jefferson-Monticello Park area)
## 44 Hand and Stone Spa3.0San Antonio, TX 78208
## 45 Zhen Day Spa & BeautySan Antonio, TX 78232
## 46 Massage Heights - Alamo RanchSan Antonio, TX 78253
## 47 Spavia Day Spa3.3San Antonio, TX 78254
## 48 Hillside Boutique HotelCastroville, TX 78009
## 49 spavia day spa San AntonioSan Antonio, TX 78254
## 50 Beauty and Fitness CircleSan Antonio, TX 78230 (Vance Jackson area)
## 51 Andi's Therapeutic MassageSan Antonio, TX 78232
## 52 Hand and Stone3.0San Antonio, TX 78258
## 53 Phoenix Hospitality Group3.3San Antonio, TX 78235
## 54 Massage Envy3.2San Antonio, TX 78250 (Northwest Crossing area)+2 locations
## 55 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 56 Massage Heights3.1Schertz, TX 78154
## 57 Cambridge Spa Group LLCSan Antonio, TX
## 58 Massage Heights3.1Boerne, TX 78006
## 59 Massage Heights - Boerne3.1Boerne, TX 78006
## 60 Zhen Day Spa & BeautySan Antonio, TX 78232
## 61 Massage Heights - Alamo RanchSan Antonio, TX 78253
## 62 Spavia Day Spa3.3San Antonio, TX 78254
## 63 Hillside Boutique HotelCastroville, TX 78009
## 64 spavia day spa San AntonioSan Antonio, TX 78254
## 65 Beauty and Fitness CircleSan Antonio, TX 78230 (Vance Jackson area)
## 66 Andi's Therapeutic MassageSan Antonio, TX 78232
## 67 Hand and Stone3.0San Antonio, TX 78258
## 68 Phoenix Hospitality Group3.3San Antonio, TX 78235
## 69 Massage Envy3.2San Antonio, TX 78250 (Northwest Crossing area)+2 locations
## 70 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 71 Massage Heights3.1Schertz, TX 78154
## 72 Cambridge Spa Group LLCSan Antonio, TX
## 73 Massage Heights3.1Boerne, TX 78006
## 74 Massage Heights - Boerne3.1Boerne, TX 78006
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$36,000 - $69,000 a year $36000 - $69000 36000 69000
## 11 \n$38,000 - $62,000 a year $38000 - $62000 38000 62000
## 18 \n$36,000 - $69,000 a year $36000 - $69000 36000 69000
## 21 \n$38,000 - $62,000 a year $38000 - $62000 38000 62000
## 25 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 26 \n$30,000 - $55,000 a year $30000 - $55000 30000 55000
## 33 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 34 \n$30,000 - $55,000 a year $30000 - $55000 30000 55000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 37000 58500 35500 60000 30000
## 11 37000 58500 35500 60000 30000
## 18 37000 58500 35500 60000 30000
## 21 37000 58500 35500 60000 30000
## 25 37000 58500 35500 60000 30000
## 26 37000 58500 35500 60000 30000
## 33 37000 58500 35500 60000 30000
## 34 37000 58500 35500 60000 30000
## maximumMaxSalary
## 2 69000
## 11 69000
## 18 69000
## 21 69000
## 25 69000
## 26 69000
## 33 69000
## 34 69000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 - $30 an hour $20 - $30 20 30 20
## 3 \n$35 an hour $35 35 NA 20
## 4 \n$18 - $42 an hour $18 - $42 18 42 20
## 5 \n$20 - $43 an hour $20 - $43 20 43 20
## 6 \n$20 - $35 an hour $20 - $35 20 35 20
## 7 \n$20 - $33 an hour $20 - $33 20 33 20
## 9 \n$35 an hour $35 35 NA 20
## 10 \n$20 - $40 an hour $20 - $40 20 40 20
## 12 \n$35 - $40 an hour $35 - $40 35 40 20
## 13 \n$8 an hour $8 8 NA 20
## 14 \n$38 - $45 an hour $38 - $45 38 45 20
## 15 \n$18 - $22 an hour $18 - $22 18 22 20
## 16 \n$20 - $40 an hour $20 - $40 20 40 20
## 17 \n$18 - $42 an hour $18 - $42 18 42 20
## 19 \n$20 - $40 an hour $20 - $40 20 40 20
## 20 \n$20 - $30 an hour $20 - $30 20 30 20
## 22 \n$20 - $40 an hour $20 - $40 20 40 20
## 23 \n$35 an hour $35 35 NA 20
## 24 \n$20 - $45 an hour $20 - $45 20 45 20
## 27 \n$35 - $40 an hour $35 - $40 35 40 20
## 28 \n$38 - $45 an hour $38 - $45 38 45 20
## 29 \n$8 an hour $8 8 NA 20
## 30 \n$18 - $22 an hour $18 - $22 18 22 20
## 31 \n$20 - $40 an hour $20 - $40 20 40 20
## 32 \n$20 - $45 an hour $20 - $45 20 45 20
## 35 \n$35 - $40 an hour $35 - $40 35 40 20
## 36 \n$38 - $45 an hour $38 - $45 38 45 20
## 37 \n$8 an hour $8 8 NA 20
## 38 \n$18 - $22 an hour $18 - $22 18 22 20
## 39 \n$20 - $40 an hour $20 - $40 20 40 20
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 40 23.26667 37.75 8 45
## 3 40 23.26667 37.75 8 45
## 4 40 23.26667 37.75 8 45
## 5 40 23.26667 37.75 8 45
## 6 40 23.26667 37.75 8 45
## 7 40 23.26667 37.75 8 45
## 9 40 23.26667 37.75 8 45
## 10 40 23.26667 37.75 8 45
## 12 40 23.26667 37.75 8 45
## 13 40 23.26667 37.75 8 45
## 14 40 23.26667 37.75 8 45
## 15 40 23.26667 37.75 8 45
## 16 40 23.26667 37.75 8 45
## 17 40 23.26667 37.75 8 45
## 19 40 23.26667 37.75 8 45
## 20 40 23.26667 37.75 8 45
## 22 40 23.26667 37.75 8 45
## 23 40 23.26667 37.75 8 45
## 24 40 23.26667 37.75 8 45
## 27 40 23.26667 37.75 8 45
## 28 40 23.26667 37.75 8 45
## 29 40 23.26667 37.75 8 45
## 30 40 23.26667 37.75 8 45
## 31 40 23.26667 37.75 8 45
## 32 40 23.26667 37.75 8 45
## 35 40 23.26667 37.75 8 45
## 36 40 23.26667 37.75 8 45
## 37 40 23.26667 37.75 8 45
## 38 40 23.26667 37.75 8 45
## 39 40 23.26667 37.75 8 45
##
## [[7]]
## city state jobTitle
## 1 San Antonio TX Massage Therapist
## 2 San Antonio TX Licensed Massage Therapist
## 3 San Antonio TX Licensed Massage Therapist
## 4 San Antonio TX Massage Therapist - Independent Contractor
## 5 San Antonio TX Licensed Massage Therapist / TPC Parkway
## 6 San Antonio TX Licensed Massage Therapist
## 7 San Antonio TX Licensed Chair Massage Therapist
## 8 San Antonio TX Massage Therapist
## 9 San Antonio TX Licensed Massage Therapist
## 10 San Antonio TX Licensed Massage Therapist
## 11 San Antonio TX We are seeking a Licensed Massage Therapist
## 12 San Antonio TX Massage Therapist
## 13 San Antonio TX Massage Therapist - Loma de Vida Spa and Wellness
## 14 San Antonio TX Massage Therapist - Independent Contractor
## 15 San Antonio TX Massage Therapist
## 16 San Antonio TX Massage Therapist
## 17 San Antonio TX Licensed Massage Therapist
## 18 San Antonio TX Licensed Massage Therapist
## 19 San Antonio TX Massage Therapist (LMT)
## 20 San Antonio TX Massage Therapist - Independent Contractor
## 21 San Antonio TX Massage Therapist
## 22 San Antonio TX Licensed Massage Therapist- 281N & TPC Pkwy
## 23 San Antonio TX Licensed Massage Therapist
## 24 San Antonio TX Massage Therapist LMT
## 25 San Antonio TX Massage Therapist LMT
## 26 San Antonio TX Licensed Massage Therapist
## 27 San Antonio TX Dual Licensed Therapist
## 28 San Antonio TX Dual Licensed Therapist
## 29 San Antonio TX Licensed Massage Therapist
## 30 San Antonio TX Licensed Massage Therapist
## 31 San Antonio TX Licensed Chair Massage Therapist
## 32 San Antonio TX Licensed Massage Therapist / TPC Parkway
## 33 San Antonio TX Certified Massage Therapist
## 34 San Antonio TX Licensed Massage Therapist
## 35 San Antonio TX Licensed Massage Therapist
## 36 San Antonio TX Massage Therapist
## 37 San Antonio TX Licensed Massage Therapist
## 38 San Antonio TX Massage Therapist LMT
## 39 San Antonio TX Massage Therapist LMT
## 40 San Antonio TX Licensed Massage Therapist
## 41 San Antonio TX Dual Licensed Therapist
## 42 San Antonio TX Dual Licensed Therapist
## 43 San Antonio TX Massage Therapist - Independent Contractor
## 44 San Antonio TX Licensed Massage Therapist
## 45 San Antonio TX Massage Therapist
## 46 San Antonio TX Licensed Massage Therapist
## 47 San Antonio TX Licensed Massage Therapist
## 48 San Antonio TX Liscensed Massage Therapist
## 49 San Antonio TX Licensed Massage Therapist (LMT) PT/FT
## 50 San Antonio TX Massage Therapist (LMT)
## 51 San Antonio TX Massage Therapist - Independent Contractor
## 52 San Antonio TX Licensed Massage Therapist- 281N & TPC Pkwy
## 53 San Antonio TX Massage Therapist
## 54 San Antonio TX Licensed Massage Therapist
## 55 San Antonio TX Massage Therapist LMT
## 56 San Antonio TX Massage Therapist LMT
## 57 San Antonio TX Licensed Massage Therapist
## 58 San Antonio TX Dual Licensed Therapist
## 59 San Antonio TX Dual Licensed Therapist
## 60 San Antonio TX Massage Therapist
## 61 San Antonio TX Licensed Massage Therapist
## 62 San Antonio TX Licensed Massage Therapist
## 63 San Antonio TX Liscensed Massage Therapist
## 64 San Antonio TX Licensed Massage Therapist (LMT) PT/FT
## 65 San Antonio TX Massage Therapist (LMT)
## 66 San Antonio TX Massage Therapist - Independent Contractor
## 67 San Antonio TX Licensed Massage Therapist- 281N & TPC Pkwy
## 68 San Antonio TX Massage Therapist
## 69 San Antonio TX Licensed Massage Therapist
## 70 San Antonio TX Massage Therapist LMT
## 71 San Antonio TX Massage Therapist LMT
## 72 San Antonio TX Licensed Massage Therapist
## 73 San Antonio TX Dual Licensed Therapist
## 74 San Antonio TX Dual Licensed Therapist
## HiringAgency
## 1 San Antonio Elite ChiropracticSan Antonio, TX 78231
## 2 Massage Heights3.1San Antonio, TX (Stone Oak area)
## 3 Complete Therapies, L.L.C.San Antonio, TX
## 4 FLOATSan Antonio, TX 78201 (Jefferson-Monticello Park area)
## 5 Hand & Stone - San Antonio TX3.0San Antonio, TX 78258
## 6 Soothe3.7San Antonio, TX
## 7 Soothe3.7San Antonio, TX
## 8 Life Time3.6San Antonio, TX
## 9 Healing Sunshine Wellness InstituteSan Antonio, TX 78217 (Oak Grove Estates area)
## 10 Stay Young Mental Health & WellnessWindcrest, TX 78239
## 11 Healing Sunshine Wellness InstituteSan Antonio, TX 78217 (Oak Grove Estates area)
## 12 Bluegreen Vacations Corporation3.4San Antonio, TX 78256 (Friends Of Friedrich Wilderness Park area)
## 13 Benchmark Hospitality3.8San Antonio, TX 78256 (Friends Of Friedrich Wilderness Park area)
## 14 Indo-Pak Massage TherapySan Antonio, TX•Remote work available
## 15 The Day Spa @ Folawn'sSan Antonio, TX 78258
## 16 Elements3.6San Antonio, TX 78231
## 17 Massage Heights - Medical Center/Schertz Green Valley3.1San Antonio, TX 78240
## 18 Inspired Massage Therapy - Massage Heights4.9San Antonio, TX 78231
## 19 Beauty and Fitness CircleSan Antonio, TX 78230 (Vance Jackson area)
## 20 Andi's Therapeutic MassageSan Antonio, TX 78232
## 21 Phoenix Hospitality Group3.3San Antonio, TX 78235
## 22 Hand and Stone3.0San Antonio, TX 78258
## 23 Massage Envy3.2San Antonio, TX 78250 (Northwest Crossing area)+2 locations
## 24 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 25 Massage Heights3.1Schertz, TX 78154
## 26 Cambridge Spa Group LLCSan Antonio, TX
## 27 Massage Heights3.1Boerne, TX 78006
## 28 Massage Heights - Boerne3.1Boerne, TX 78006
## 29 Complete Therapies, L.L.C.San Antonio, TX
## 30 Soothe3.7San Antonio, TX
## 31 Soothe3.7San Antonio, TX
## 32 Hand & Stone - San Antonio TX3.0San Antonio, TX 78258
## 33 The Spa @ Fort SamSan Antonio, TX 78234 (Monte Vista area)
## 34 Massage Heights3.1San Antonio, TX (Stone Oak area)
## 35 Massage Heights - Medical Center/Schertz Green Valley3.1San Antonio, TX 78240
## 36 San Antonio Elite ChiropracticSan Antonio, TX 78231
## 37 Inspired Massage Therapy - Massage Heights4.9San Antonio, TX 78231
## 38 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 39 Massage Heights3.1Schertz, TX 78154
## 40 Cambridge Spa Group LLCSan Antonio, TX
## 41 Massage Heights3.1Boerne, TX 78006
## 42 Massage Heights - Boerne3.1Boerne, TX 78006
## 43 FLOATSan Antonio, TX 78201 (Jefferson-Monticello Park area)
## 44 Hand and Stone Spa3.0San Antonio, TX 78208
## 45 Zhen Day Spa & BeautySan Antonio, TX 78232
## 46 Massage Heights - Alamo RanchSan Antonio, TX 78253
## 47 Spavia Day Spa3.3San Antonio, TX 78254
## 48 Hillside Boutique HotelCastroville, TX 78009
## 49 spavia day spa San AntonioSan Antonio, TX 78254
## 50 Beauty and Fitness CircleSan Antonio, TX 78230 (Vance Jackson area)
## 51 Andi's Therapeutic MassageSan Antonio, TX 78232
## 52 Hand and Stone3.0San Antonio, TX 78258
## 53 Phoenix Hospitality Group3.3San Antonio, TX 78235
## 54 Massage Envy3.2San Antonio, TX 78250 (Northwest Crossing area)+2 locations
## 55 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 56 Massage Heights3.1Schertz, TX 78154
## 57 Cambridge Spa Group LLCSan Antonio, TX
## 58 Massage Heights3.1Boerne, TX 78006
## 59 Massage Heights - Boerne3.1Boerne, TX 78006
## 60 Zhen Day Spa & BeautySan Antonio, TX 78232
## 61 Massage Heights - Alamo RanchSan Antonio, TX 78253
## 62 Spavia Day Spa3.3San Antonio, TX 78254
## 63 Hillside Boutique HotelCastroville, TX 78009
## 64 spavia day spa San AntonioSan Antonio, TX 78254
## 65 Beauty and Fitness CircleSan Antonio, TX 78230 (Vance Jackson area)
## 66 Andi's Therapeutic MassageSan Antonio, TX 78232
## 67 Hand and Stone3.0San Antonio, TX 78258
## 68 Phoenix Hospitality Group3.3San Antonio, TX 78235
## 69 Massage Envy3.2San Antonio, TX 78250 (Northwest Crossing area)+2 locations
## 70 Massage Heights - Medical Center/Schertz Green Val...3.1Schertz, TX 78154
## 71 Massage Heights3.1Schertz, TX 78154
## 72 Cambridge Spa Group LLCSan Antonio, TX
## 73 Massage Heights3.1Boerne, TX 78006
## 74 Massage Heights - Boerne3.1Boerne, TX 78006
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 Just posted 8 45 30000 69000
## 2 24 8 45 30000 69000
## 3 30 8 45 30000 69000
## 4 13 8 45 30000 69000
## 5 7 8 45 30000 69000
## 6 24 8 45 30000 69000
## 7 24 8 45 30000 69000
## 8 Just posted 8 45 30000 69000
## 9 28 8 45 30000 69000
## 10 26 8 45 30000 69000
## 11 30 8 45 30000 69000
## 12 5 8 45 30000 69000
## 13 14 8 45 30000 69000
## 14 30 8 45 30000 69000
## 15 30 8 45 30000 69000
## 16 27 8 45 30000 69000
## 17 24 8 45 30000 69000
## 18 11 8 45 30000 69000
## 19 30 8 45 30000 69000
## 20 15 8 45 30000 69000
## 21 30 8 45 30000 69000
## 22 30 8 45 30000 69000
## 23 30 8 45 30000 69000
## 24 24 8 45 30000 69000
## 25 24 8 45 30000 69000
## 26 19 8 45 30000 69000
## 27 27 8 45 30000 69000
## 28 26 8 45 30000 69000
## 29 30 8 45 30000 69000
## 30 24 8 45 30000 69000
## 31 24 8 45 30000 69000
## 32 7 8 45 30000 69000
## 33 6 8 45 30000 69000
## 34 24 8 45 30000 69000
## 35 24 8 45 30000 69000
## 36 Just posted 8 45 30000 69000
## 37 11 8 45 30000 69000
## 38 24 8 45 30000 69000
## 39 24 8 45 30000 69000
## 40 19 8 45 30000 69000
## 41 27 8 45 30000 69000
## 42 26 8 45 30000 69000
## 43 13 8 45 30000 69000
## 44 Today 8 45 30000 69000
## 45 30 8 45 30000 69000
## 46 Today 8 45 30000 69000
## 47 30 8 45 30000 69000
## 48 30 8 45 30000 69000
## 49 30 8 45 30000 69000
## 50 30 8 45 30000 69000
## 51 15 8 45 30000 69000
## 52 30 8 45 30000 69000
## 53 30 8 45 30000 69000
## 54 30 8 45 30000 69000
## 55 24 8 45 30000 69000
## 56 24 8 45 30000 69000
## 57 19 8 45 30000 69000
## 58 27 8 45 30000 69000
## 59 26 8 45 30000 69000
## 60 30 8 45 30000 69000
## 61 Today 8 45 30000 69000
## 62 30 8 45 30000 69000
## 63 30 8 45 30000 69000
## 64 30 8 45 30000 69000
## 65 30 8 45 30000 69000
## 66 15 8 45 30000 69000
## 67 30 8 45 30000 69000
## 68 30 8 45 30000 69000
## 69 30 8 45 30000 69000
## 70 24 8 45 30000 69000
## 71 24 8 45 30000 69000
## 72 19 8 45 30000 69000
## 73 27 8 45 30000 69000
## 74 26 8 45 30000 69000
getIndeedJobData5pages('massage therapist', 'Dallas','TX')
## Warning in getIndeedJobData5pages("massage therapist", "Dallas", "TX"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Dallas", "TX"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist in Highland Park
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT)
## 4 Massage Therapist
## 5 Massage Therapist
## 6 Licensed Massage Therapist
## 7 $20/hr Professional, Dependable Licensed Massage Therapist (...
## 8 Licensed Massage Therapist - HUGE OPPORTUNITY!
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist (LMT)
## 12 Mobile Massage Therapist
## 13 Licensed Massage Therapist - Passionate Healer
## 14 Massage Therapist - Independent Contractor
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist (LMT)
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 DO YOU HAVE BOTH** Licensed Massage Therapist & Esthetician/...
## 21 Licensed Massage Therapist *** up to a $2500 signing bonus *...
## 22 Massage Therapist - Full Time
## 23 Licensed Massage Therapist, Independent Contractor
## 24 Licensed Massage Therapist (LMT)
## 25 Part-time female deep-tissue massage therapist needed
## 26 Massage Therapist
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Lead Massage Therapist/Sit Pay & Bonus
## 30 Licensed Massage Therapist - $1200 Sign-on Bonus
## 31 Licensed Massage Therapist - $3000 HIRING BONU$
## 32 Massage Therapist- Full or Part Time (Dallas, TX)
## 33 Massage Therapist (LMT)
## 34 Massage Therapist - The Colony, Texas
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist (LMT)
## 37 Licensed Massage Therapist--- $1500 SIGN ON BONUS
## 38 Licensed Massage Therapist
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist - The Colony, Texas
## 42 Licensed Massage Therapist
## 43 Licensed Massage Therapist (LMT)
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist (LMT)
## 47 Medical Massage Therapist
## 48 Massage Therapist
## 49 Licensed Massage Therapist - Sit Pay/Bonus
## 50 $20/hr Professional, Dependable Licensed Massage Therapist (...
## 51 Massage Therapist
## 52 Massage Therapist in Highland Park
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Lead Massage Therapist
## 60 Licensed Massage Therapist for On Call Chair Massage Work
## 61 Salon Massage Therapist
## 62 Lead Massage Therapist/Sit Pay & Bonus
## 63 $20/hr Professional, Dependable Licensed Massage Therapist (...
## 64 Licensed Massage Therapist (LMT)
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Licensed Massage Therapist--- $1500 SIGN ON BONUS
## 70 Licensed Massage Therapist
## 71 Massage Therapist in Highland Park
## 72 Massage Therapist - Part time at Northwood Club
## 73 MESSAGE ESTHETICIAN THERAPIST
## 74 Stretch Practitioner Southlake TX Full Time
## 75 Massage Therapist - Independent Contractor
## 76 Graduate Massage Therapist, Independent Contractor
## 77 Licensed Massage Therapist
## 78 Licensed Massage Therapist
## 79 Licensed Massage Therapist
## 80 On Call Chair Massage Work
## 81 Massage Therapist [CUSTOMIZATION REQUIRED]
## 82 Licensed Massage Therapist
## 83 Licensed Massage Therapist (LMT)
## 84 Licensed Massage Therapist
## 85 Licensed Massage Therapist
## 86 Licensed Massage Therapist
## 87 Massage Therapist
## 88 Licensed Massage Therapist--- $1500 SIGN ON BONUS
## 89 Licensed Massage Therapist
## 90 Massage Therapist in Highland Park
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$50,000 - $70,000 a year $50000 - $70000 50000.0 70000
## 2 \n$50,000 - $85,000 a year $50000 - $85000 50000.0 85000
## 3 \n$35 - $45 an hour $35 - $45 35.0 45
## 4 \n$35 - $45 an hour $35 - $45 35.0 45
## 5 \n$25 an hour $25 25.0 NA
## 6 \n$20 an hour $20 20.0 NA
## 7 \n$30 - $45 an hour $30 - $45 30.0 45
## 8 \n$40 - $50 an hour $40 - $50 40.0 50
## 9 \n$32 - $38 an hour $32 - $38 32.0 38
## 10 \n$40 - $50 an hour $40 - $50 40.0 50
## 11 \n$40 - $50 an hour $40 - $50 40.0 50
## 12 \n$30 - $45 an hour $30 - $45 30.0 45
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 14 \n$30 - $33 an hour $30 - $33 30.0 33
## 15 \n$30 - $40 an hour $30 - $40 30.0 40
## 16 \nFrom $25 an hour $25 25.0 NA
## 17 \n$18 - $30 an hour $18 - $30 18.0 30
## 18 \n$20 - $25 an hour $20 - $25 20.0 25
## 19 \n$20 - $25 an hour $20 - $25 20.0 25
## 20 \n$38 - $42 an hour $38 - $42 38.0 42
## 21 \n$2,000 - $4,000 a month $2000 - $4000 2000.0 4000
## 22 \n$17 - $19 an hour $17 - $19 17.0 19
## 23 \n$20 - $27 an hour $20 - $27 20.0 27
## 24 \n$25 - $35 an hour $25 - $35 25.0 35
## 25 \n$35 - $40 an hour $35 - $40 35.0 40
## 26 \n$35 - $45 an hour $35 - $45 35.0 45
## 27 \nFrom $25 an hour $25 25.0 NA
## 28 \n$50,000 - $85,000 a year $50000 - $85000 50000.0 85000
## 29 \n$20 - $40 an hour $20 - $40 20.0 40
## 30 \n$18 - $30 an hour $18 - $30 18.0 30
## 31 \n$18 - $30 an hour $18 - $30 18.0 30
## 32 \n$35 - $45 an hour $35 - $45 35.0 45
## 33 \n$30 - $40 an hour $30 - $40 30.0 40
## 34 \n$18.50 - $40.00 an hour $18.50 - $40.00 18.5 40
## 35 \n$25,000 - $60,000 a year $25000 - $60000 25000.0 60000
## 36 \n$39 - $50 an hour $39 - $50 39.0 50
## 37 \n$22 - $25 an hour $22 - $25 22.0 25
## 38 \n$35 - $45 an hour $35 - $45 35.0 45
## 39 \n$20 - $25 an hour $20 - $25 20.0 25
## 40 \n$20 an hour $20 20.0 NA
## 41 \n$35 - $45 an hour $35 - $45 35.0 45
## 42 \n$50,000 - $70,000 a year $50000 - $70000 50000.0 70000
## 43 \n$18 - $24 an hour $18 - $24 18.0 24
## 44 \n$35 - $45 an hour $35 - $45 35.0 45
## 45 \n$400 - $800 a week $400 - $800 a week 400.0 NA
## 46 \n$30 an hour $30 30.0 NA
## 47 \n$38,700 - $64,000 a year $38700 - $64000 38700.0 64000
## 48 \n$25 an hour $25 25.0 NA
## 49 \n$20 - $27 an hour $20 - $27 20.0 27
## 50 \n$20 an hour $20 20.0 NA
## 51 \n$50,000 - $85,000 a year $50000 - $85000 50000.0 85000
## 52 \n$18 - $30 an hour $18 - $30 18.0 30
## 53 \nFrom $25 an hour $25 25.0 NA
## 54 \n$35 - $45 an hour $35 - $45 35.0 45
## 55 \n$20 - $40 an hour $20 - $40 20.0 40
## 56 \n$18 - $30 an hour $18 - $30 18.0 30
## 57 \n$50,000 - $70,000 a year $50000 - $70000 50000.0 70000
## 58 \n$17 - $20 an hour $17 - $20 17.0 20
## 59 \n$20 - $25 an hour $20 - $25 20.0 25
## 60 \n$25 - $30 an hour $25 - $30 25.0 30
## 61 \n$15 - $17 an hour $15 - $17 15.0 17
## 62 \n$20 - $30 an hour $20 - $30 20.0 30
## 63 \n$25 an hour $25 25.0 NA
## 64 \n$25 an hour $25 25.0 NA
## 65 \n$50,000 - $85,000 a year $50000 - $85000 50000.0 85000
## 66 \nFrom $25 an hour $25 25.0 NA
## 67 \n$18 - $30 an hour $18 - $30 18.0 30
## 68 \n$35 - $45 an hour $35 - $45 35.0 45
## 69 \n$20 - $40 an hour $20 - $40 20.0 40
## 70 \n$18 - $30 an hour $18 - $30 18.0 30
## 71 \n$50,000 - $70,000 a year $50000 - $70000 50000.0 70000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 35 6656.373 9567.864 15
## 2 25 35 6656.373 9567.864 15
## 3 25 35 6656.373 9567.864 15
## 4 25 35 6656.373 9567.864 15
## 5 25 35 6656.373 9567.864 15
## 6 25 35 6656.373 9567.864 15
## 7 25 35 6656.373 9567.864 15
## 8 25 35 6656.373 9567.864 15
## 9 25 35 6656.373 9567.864 15
## 10 25 35 6656.373 9567.864 15
## 11 25 35 6656.373 9567.864 15
## 12 25 35 6656.373 9567.864 15
## 13 25 35 6656.373 9567.864 15
## 14 25 35 6656.373 9567.864 15
## 15 25 35 6656.373 9567.864 15
## 16 25 35 6656.373 9567.864 15
## 17 25 35 6656.373 9567.864 15
## 18 25 35 6656.373 9567.864 15
## 19 25 35 6656.373 9567.864 15
## 20 25 35 6656.373 9567.864 15
## 21 25 35 6656.373 9567.864 15
## 22 25 35 6656.373 9567.864 15
## 23 25 35 6656.373 9567.864 15
## 24 25 35 6656.373 9567.864 15
## 25 25 35 6656.373 9567.864 15
## 26 25 35 6656.373 9567.864 15
## 27 25 35 6656.373 9567.864 15
## 28 25 35 6656.373 9567.864 15
## 29 25 35 6656.373 9567.864 15
## 30 25 35 6656.373 9567.864 15
## 31 25 35 6656.373 9567.864 15
## 32 25 35 6656.373 9567.864 15
## 33 25 35 6656.373 9567.864 15
## 34 25 35 6656.373 9567.864 15
## 35 25 35 6656.373 9567.864 15
## 36 25 35 6656.373 9567.864 15
## 37 25 35 6656.373 9567.864 15
## 38 25 35 6656.373 9567.864 15
## 39 25 35 6656.373 9567.864 15
## 40 25 35 6656.373 9567.864 15
## 41 25 35 6656.373 9567.864 15
## 42 25 35 6656.373 9567.864 15
## 43 25 35 6656.373 9567.864 15
## 44 25 35 6656.373 9567.864 15
## 45 25 35 6656.373 9567.864 15
## 46 25 35 6656.373 9567.864 15
## 47 25 35 6656.373 9567.864 15
## 48 25 35 6656.373 9567.864 15
## 49 25 35 6656.373 9567.864 15
## 50 25 35 6656.373 9567.864 15
## 51 25 35 6656.373 9567.864 15
## 52 25 35 6656.373 9567.864 15
## 53 25 35 6656.373 9567.864 15
## 54 25 35 6656.373 9567.864 15
## 55 25 35 6656.373 9567.864 15
## 56 25 35 6656.373 9567.864 15
## 57 25 35 6656.373 9567.864 15
## 58 25 35 6656.373 9567.864 15
## 59 25 35 6656.373 9567.864 15
## 60 25 35 6656.373 9567.864 15
## 61 25 35 6656.373 9567.864 15
## 62 25 35 6656.373 9567.864 15
## 63 25 35 6656.373 9567.864 15
## 64 25 35 6656.373 9567.864 15
## 65 25 35 6656.373 9567.864 15
## 66 25 35 6656.373 9567.864 15
## 67 25 35 6656.373 9567.864 15
## 68 25 35 6656.373 9567.864 15
## 69 25 35 6656.373 9567.864 15
## 70 25 35 6656.373 9567.864 15
## 71 25 35 6656.373 9567.864 15
## maximumMaxSalary
## 1 85000
## 2 85000
## 3 85000
## 4 85000
## 5 85000
## 6 85000
## 7 85000
## 8 85000
## 9 85000
## 10 85000
## 11 85000
## 12 85000
## 13 85000
## 14 85000
## 15 85000
## 16 85000
## 17 85000
## 18 85000
## 19 85000
## 20 85000
## 21 85000
## 22 85000
## 23 85000
## 24 85000
## 25 85000
## 26 85000
## 27 85000
## 28 85000
## 29 85000
## 30 85000
## 31 85000
## 32 85000
## 33 85000
## 34 85000
## 35 85000
## 36 85000
## 37 85000
## 38 85000
## 39 85000
## 40 85000
## 41 85000
## 42 85000
## 43 85000
## 44 85000
## 45 85000
## 46 85000
## 47 85000
## 48 85000
## 49 85000
## 50 85000
## 51 85000
## 52 85000
## 53 85000
## 54 85000
## 55 85000
## 56 85000
## 57 85000
## 58 85000
## 59 85000
## 60 85000
## 61 85000
## 62 85000
## 63 85000
## 64 85000
## 65 85000
## 66 85000
## 67 85000
## 68 85000
## 69 85000
## 70 85000
## 71 85000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 10
## 3 30
## 4 30
## 5 15
## 6 12
## 7 30
## 8 1
## 9 Just posted
## 10 4
## 11 5
## 12 9
## 13 2
## 14 5
## 15 14
## 16 30
## 17 13
## 18 30
## 19 30
## 20 10
## 21 27
## 22 30
## 23 28
## 24 30
## 25 8
## 26 14
## 27 27
## 28 25
## 29 21
## 30 30
## 31 26
## 32 30
## 33 30
## 34 30
## 35 30
## 36 30
## 37 30
## 38 30
## 39 30
## 40 10
## 41 30
## 42 30
## 43 16
## 44 30
## 45 30
## 46 18
## 47 13
## 48 30
## 49 21
## 50 30
## 51 15
## 52 30
## 53 30
## 54 9
## 55 30
## 56 30
## 57 23
## 58 5
## 59 30
## 60 18
## 61 30
## 62 21
## 63 30
## 64 30
## 65 30
## 66 10
## 67 30
## 68 15
## 69 30
## 70 30
## 71 30
## 72 20
## 73 30
## 74 30
## 75 29
## 76 26
## 77 5
## 78 19
## 79 30
## 80 24
## 81 30
## 82 12
## 83 30
## 84 30
## 85 30
## 86 10
## 87 15
## 88 30
## 89 30
## 90 30
##
## [[4]]
## HiringAgency
## 1 Riviera SpaDallas, TX 75205 (Oak Lawn area)
## 2 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 3 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 4 ELEMENTS MASSAGE STUDIO3.6The Colony, TX 75056
## 5 Siena Massage3.8Frisco, TX 75035
## 6 Elevation Health NRHNorth Richland Hills, TX 76182 (Eastside area)
## 7 RevyveForney, TX 75126
## 8 Ramsey InsightDallas, TX
## 9 Toldson Therapy,LLCGarland, TX
## 10 G Health ConsultantsDallas, TX 75248 (Far North area)
## 11 Highland TherapiesDallas-Fort Worth, TX
## 12 RestDallas, TX
## 13 Ramsey InsightAllen, TX
## 14 Indo-Pak Massage TherapyGrand Prairie, TX•Remote work available
## 15 Dagnan ChiropracticIrving, TX
## 16 Elements3.6Dallas, TX 75230 (North Dallas area)+6 locations
## 17 Associates Physical therapyPlano, TX 75093
## 18 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 19 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 20 Revyve - Massage Chiropractic BodyworkForney, TX 75126
## 21 Modoma Massage and WellnessFrisco, TX 75034
## 22 Life Time3.6Dallas, TX+2 locations
## 23 Rooted MassageDallas, TX 75204 (Oak Lawn area)
## 24 Book a BirdieDallas-Fort Worth, TX
## 25 Johnson ChiropracticCrandall, TX 75114
## 26 Massage Envy South 3603.2Grand Prairie, TX 75052+18 locations
## 27 Renewing WellnessDallas, TX
## 28 ELEVEN WELLNESS + IVDallas, TX 75225 (North Dallas area)
## 29 Hand and Stone3.0Frisco, TX 75034
## 30 Massage Envy ColleyvilleColleyville, TX 76034
## 31 MassageLuXe3.0Southlake, TX 76092
## 32 The NOW, LLCDallas, TX 75202 (City Center District area)
## 33 Beauty and Fitness CircleDallas, TX 75202 (City Center District area)
## 34 Elements3.6Lewisville, TX 75056
## 35 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 36 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 37 Confidential - Massage TherapyFlower Mound, TX 75028
## 38 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 39 Massage Envy Casa LindaDallas, TX 75218 (Northeast Dallas area)
## 40 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 41 Elements3.6Lewisville, TX 75056
## 42 Hand and Stone3.0Dallas, TX 75231 (Lake Highlands area)+6 locations
## 43 Hand and Stone Massage and Facial Spa - Dallas Wes...3.0Dallas, TX (Oak Lawn area)
## 44 Massage Envy - AllianceDallas, TX 75204 (Oak Lawn area)+2 locations
## 45 Donna Leif Massage TherapyRichardson, TX 75082
## 46 The Blossom Spa LLCPantego, TX 76013 (West area)
## 47 Medical Massage RxFlower Mound, TX 75022
## 48 ELEMENTS MASSAGE STUDIO3.6The Colony, TX 75056+3 locations
## 49 Hand and Stone - Euless3.0Euless, TX
## 50 RevyveForney, TX 75126
## 51 Siena Massage3.8Frisco, TX 75035
## 52 Riviera SpaDallas, TX 75205 (Oak Lawn area)
## 53 Intellisoft Technologies, Inc3.5Carrollton, TX
## 54 Elements Massage - The ColonyThe Colony, TX 75056
## 55 Everybody Massage RockwallRockwall, TX 75087
## 56 L V Asian Massage & SpaSouthlake, TX 76092
## 57 Massage Envy Rowlett and Mesquite3.2Mesquite, TX 75150+5 locations
## 58 Massage Envy - City LineRichardson, TX 75074
## 59 Hand and Stone3.0Coppell, TX 75019
## 60 HealthWorks: A Family Wellness CenterPlano, TX 75075
## 61 JCPenney3.7Hurst, TX 76053
## 62 Hand and Stone3.0Frisco, TX 75034
## 63 RevyveForney, TX 75126
## 64 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 65 Massage Envy Casa LindaDallas, TX 75218 (Northeast Dallas area)
## 66 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 67 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 68 Siena Massage3.8Frisco, TX 75035
## 69 Confidential - Massage TherapyFlower Mound, TX 75028
## 70 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 71 Riviera SpaDallas, TX 75205 (Oak Lawn area)
## 72 Northwood Club3.1Dallas, TX 75240 (Far North area)
## 73 DIVINE FOOT CARE CENTERHurst, TX 76053
## 74 Stretch Zone2.7Southlake, TX 76092
## 75 Serendipity Med SpaSouthlake, TX 76092
## 76 Beyond the VeilBedford, TX 76021
## 77 Massage Envy - Campbell @ ColtDallas, TX 75248 (Far North area)
## 78 Cambridge Spa Group LLCDallas, TX
## 79 Hand & Stone Massage and Facial Spa3.0Mansfield, TX 76063+1 location
## 80 HealthWorks: A Family Wellness CenterPlano, TX 75075
## 81 Massage Envy3.2Waxahachie, TX 75165
## 82 Elevation Health NRHNorth Richland Hills, TX 76182 (Eastside area)
## 83 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 84 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 85 Massage Envy Casa LindaDallas, TX 75218 (Northeast Dallas area)
## 86 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 87 Siena Massage3.8Frisco, TX 75035
## 88 Confidential - Massage TherapyFlower Mound, TX 75028
## 89 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 90 Riviera SpaDallas, TX 75205 (Oak Lawn area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$50,000 - $70,000 a year $50000 - $70000 50000 70000
## 2 \n$50,000 - $85,000 a year $50000 - $85000 50000 85000
## 28 \n$50,000 - $85,000 a year $50000 - $85000 50000 85000
## 35 \n$25,000 - $60,000 a year $25000 - $60000 25000 60000
## 42 \n$50,000 - $70,000 a year $50000 - $70000 50000 70000
## 47 \n$38,700 - $64,000 a year $38700 - $64000 38700 64000
## 51 \n$50,000 - $85,000 a year $50000 - $85000 50000 85000
## 57 \n$50,000 - $70,000 a year $50000 - $70000 50000 70000
## 65 \n$50,000 - $85,000 a year $50000 - $85000 50000 85000
## 71 \n$50,000 - $70,000 a year $50000 - $70000 50000 70000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 50000 70000 46370 74400 25000
## 2 50000 70000 46370 74400 25000
## 28 50000 70000 46370 74400 25000
## 35 50000 70000 46370 74400 25000
## 42 50000 70000 46370 74400 25000
## 47 50000 70000 46370 74400 25000
## 51 50000 70000 46370 74400 25000
## 57 50000 70000 46370 74400 25000
## 65 50000 70000 46370 74400 25000
## 71 50000 70000 46370 74400 25000
## maximumMaxSalary
## 1 85000
## 2 85000
## 28 85000
## 35 85000
## 42 85000
## 47 85000
## 51 85000
## 57 85000
## 65 85000
## 71 85000
##
## [[6]]
## Salary salary minSalary maxSalary
## 3 \n$35 - $45 an hour $35 - $45 35.0 45
## 4 \n$35 - $45 an hour $35 - $45 35.0 45
## 5 \n$25 an hour $25 25.0 NA
## 6 \n$20 an hour $20 20.0 NA
## 7 \n$30 - $45 an hour $30 - $45 30.0 45
## 8 \n$40 - $50 an hour $40 - $50 40.0 50
## 9 \n$32 - $38 an hour $32 - $38 32.0 38
## 10 \n$40 - $50 an hour $40 - $50 40.0 50
## 11 \n$40 - $50 an hour $40 - $50 40.0 50
## 12 \n$30 - $45 an hour $30 - $45 30.0 45
## 14 \n$30 - $33 an hour $30 - $33 30.0 33
## 15 \n$30 - $40 an hour $30 - $40 30.0 40
## 16 \nFrom $25 an hour $25 25.0 NA
## 17 \n$18 - $30 an hour $18 - $30 18.0 30
## 18 \n$20 - $25 an hour $20 - $25 20.0 25
## 19 \n$20 - $25 an hour $20 - $25 20.0 25
## 20 \n$38 - $42 an hour $38 - $42 38.0 42
## 22 \n$17 - $19 an hour $17 - $19 17.0 19
## 23 \n$20 - $27 an hour $20 - $27 20.0 27
## 24 \n$25 - $35 an hour $25 - $35 25.0 35
## 25 \n$35 - $40 an hour $35 - $40 35.0 40
## 26 \n$35 - $45 an hour $35 - $45 35.0 45
## 27 \nFrom $25 an hour $25 25.0 NA
## 29 \n$20 - $40 an hour $20 - $40 20.0 40
## 30 \n$18 - $30 an hour $18 - $30 18.0 30
## 31 \n$18 - $30 an hour $18 - $30 18.0 30
## 32 \n$35 - $45 an hour $35 - $45 35.0 45
## 33 \n$30 - $40 an hour $30 - $40 30.0 40
## 34 \n$18.50 - $40.00 an hour $18.50 - $40.00 18.5 40
## 36 \n$39 - $50 an hour $39 - $50 39.0 50
## 37 \n$22 - $25 an hour $22 - $25 22.0 25
## 38 \n$35 - $45 an hour $35 - $45 35.0 45
## 39 \n$20 - $25 an hour $20 - $25 20.0 25
## 40 \n$20 an hour $20 20.0 NA
## 41 \n$35 - $45 an hour $35 - $45 35.0 45
## 43 \n$18 - $24 an hour $18 - $24 18.0 24
## 44 \n$35 - $45 an hour $35 - $45 35.0 45
## 46 \n$30 an hour $30 30.0 NA
## 48 \n$25 an hour $25 25.0 NA
## 49 \n$20 - $27 an hour $20 - $27 20.0 27
## 50 \n$20 an hour $20 20.0 NA
## 52 \n$18 - $30 an hour $18 - $30 18.0 30
## 53 \nFrom $25 an hour $25 25.0 NA
## 54 \n$35 - $45 an hour $35 - $45 35.0 45
## 55 \n$20 - $40 an hour $20 - $40 20.0 40
## 56 \n$18 - $30 an hour $18 - $30 18.0 30
## 58 \n$17 - $20 an hour $17 - $20 17.0 20
## 59 \n$20 - $25 an hour $20 - $25 20.0 25
## 60 \n$25 - $30 an hour $25 - $30 25.0 30
## 61 \n$15 - $17 an hour $15 - $17 15.0 17
## 62 \n$20 - $30 an hour $20 - $30 20.0 30
## 63 \n$25 an hour $25 25.0 NA
## 64 \n$25 an hour $25 25.0 NA
## 66 \nFrom $25 an hour $25 25.0 NA
## 67 \n$18 - $30 an hour $18 - $30 18.0 30
## 68 \n$35 - $45 an hour $35 - $45 35.0 45
## 69 \n$20 - $40 an hour $20 - $40 20.0 40
## 70 \n$18 - $30 an hour $18 - $30 18.0 30
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 25 39 25.90517 35.91304 15
## 4 25 39 25.90517 35.91304 15
## 5 25 39 25.90517 35.91304 15
## 6 25 39 25.90517 35.91304 15
## 7 25 39 25.90517 35.91304 15
## 8 25 39 25.90517 35.91304 15
## 9 25 39 25.90517 35.91304 15
## 10 25 39 25.90517 35.91304 15
## 11 25 39 25.90517 35.91304 15
## 12 25 39 25.90517 35.91304 15
## 14 25 39 25.90517 35.91304 15
## 15 25 39 25.90517 35.91304 15
## 16 25 39 25.90517 35.91304 15
## 17 25 39 25.90517 35.91304 15
## 18 25 39 25.90517 35.91304 15
## 19 25 39 25.90517 35.91304 15
## 20 25 39 25.90517 35.91304 15
## 22 25 39 25.90517 35.91304 15
## 23 25 39 25.90517 35.91304 15
## 24 25 39 25.90517 35.91304 15
## 25 25 39 25.90517 35.91304 15
## 26 25 39 25.90517 35.91304 15
## 27 25 39 25.90517 35.91304 15
## 29 25 39 25.90517 35.91304 15
## 30 25 39 25.90517 35.91304 15
## 31 25 39 25.90517 35.91304 15
## 32 25 39 25.90517 35.91304 15
## 33 25 39 25.90517 35.91304 15
## 34 25 39 25.90517 35.91304 15
## 36 25 39 25.90517 35.91304 15
## 37 25 39 25.90517 35.91304 15
## 38 25 39 25.90517 35.91304 15
## 39 25 39 25.90517 35.91304 15
## 40 25 39 25.90517 35.91304 15
## 41 25 39 25.90517 35.91304 15
## 43 25 39 25.90517 35.91304 15
## 44 25 39 25.90517 35.91304 15
## 46 25 39 25.90517 35.91304 15
## 48 25 39 25.90517 35.91304 15
## 49 25 39 25.90517 35.91304 15
## 50 25 39 25.90517 35.91304 15
## 52 25 39 25.90517 35.91304 15
## 53 25 39 25.90517 35.91304 15
## 54 25 39 25.90517 35.91304 15
## 55 25 39 25.90517 35.91304 15
## 56 25 39 25.90517 35.91304 15
## 58 25 39 25.90517 35.91304 15
## 59 25 39 25.90517 35.91304 15
## 60 25 39 25.90517 35.91304 15
## 61 25 39 25.90517 35.91304 15
## 62 25 39 25.90517 35.91304 15
## 63 25 39 25.90517 35.91304 15
## 64 25 39 25.90517 35.91304 15
## 66 25 39 25.90517 35.91304 15
## 67 25 39 25.90517 35.91304 15
## 68 25 39 25.90517 35.91304 15
## 69 25 39 25.90517 35.91304 15
## 70 25 39 25.90517 35.91304 15
## maximumMaxSalary
## 3 50
## 4 50
## 5 50
## 6 50
## 7 50
## 8 50
## 9 50
## 10 50
## 11 50
## 12 50
## 14 50
## 15 50
## 16 50
## 17 50
## 18 50
## 19 50
## 20 50
## 22 50
## 23 50
## 24 50
## 25 50
## 26 50
## 27 50
## 29 50
## 30 50
## 31 50
## 32 50
## 33 50
## 34 50
## 36 50
## 37 50
## 38 50
## 39 50
## 40 50
## 41 50
## 43 50
## 44 50
## 46 50
## 48 50
## 49 50
## 50 50
## 52 50
## 53 50
## 54 50
## 55 50
## 56 50
## 58 50
## 59 50
## 60 50
## 61 50
## 62 50
## 63 50
## 64 50
## 66 50
## 67 50
## 68 50
## 69 50
## 70 50
##
## [[7]]
## city state jobTitle
## 1 Dallas TX Massage Therapist in Highland Park
## 2 Dallas TX Licensed Massage Therapist
## 3 Dallas TX Licensed Massage Therapist (LMT)
## 4 Dallas TX Massage Therapist
## 5 Dallas TX Massage Therapist
## 6 Dallas TX Licensed Massage Therapist
## 7 Dallas TX $20/hr Professional, Dependable Licensed Massage Therapist (...
## 8 Dallas TX Licensed Massage Therapist - HUGE OPPORTUNITY!
## 9 Dallas TX Licensed Massage Therapist
## 10 Dallas TX Licensed Massage Therapist
## 11 Dallas TX Licensed Massage Therapist (LMT)
## 12 Dallas TX Mobile Massage Therapist
## 13 Dallas TX Licensed Massage Therapist - Passionate Healer
## 14 Dallas TX Massage Therapist - Independent Contractor
## 15 Dallas TX Licensed Massage Therapist
## 16 Dallas TX Massage Therapist
## 17 Dallas TX Licensed Massage Therapist (LMT)
## 18 Dallas TX Licensed Massage Therapist
## 19 Dallas TX Licensed Massage Therapist
## 20 Dallas TX DO YOU HAVE BOTH** Licensed Massage Therapist & Esthetician/...
## 21 Dallas TX Licensed Massage Therapist *** up to a $2500 signing bonus *...
## 22 Dallas TX Massage Therapist - Full Time
## 23 Dallas TX Licensed Massage Therapist, Independent Contractor
## 24 Dallas TX Licensed Massage Therapist (LMT)
## 25 Dallas TX Part-time female deep-tissue massage therapist needed
## 26 Dallas TX Massage Therapist
## 27 Dallas TX Licensed Massage Therapist
## 28 Dallas TX Licensed Massage Therapist
## 29 Dallas TX Lead Massage Therapist/Sit Pay & Bonus
## 30 Dallas TX Licensed Massage Therapist - $1200 Sign-on Bonus
## 31 Dallas TX Licensed Massage Therapist - $3000 HIRING BONU$
## 32 Dallas TX Massage Therapist- Full or Part Time (Dallas, TX)
## 33 Dallas TX Massage Therapist (LMT)
## 34 Dallas TX Massage Therapist - The Colony, Texas
## 35 Dallas TX Licensed Massage Therapist
## 36 Dallas TX Licensed Massage Therapist (LMT)
## 37 Dallas TX Licensed Massage Therapist--- $1500 SIGN ON BONUS
## 38 Dallas TX Licensed Massage Therapist
## 39 Dallas TX Licensed Massage Therapist
## 40 Dallas TX Licensed Massage Therapist
## 41 Dallas TX Massage Therapist - The Colony, Texas
## 42 Dallas TX Licensed Massage Therapist
## 43 Dallas TX Licensed Massage Therapist (LMT)
## 44 Dallas TX Licensed Massage Therapist
## 45 Dallas TX Licensed Massage Therapist
## 46 Dallas TX Licensed Massage Therapist (LMT)
## 47 Dallas TX Medical Massage Therapist
## 48 Dallas TX Massage Therapist
## 49 Dallas TX Licensed Massage Therapist - Sit Pay/Bonus
## 50 Dallas TX $20/hr Professional, Dependable Licensed Massage Therapist (...
## 51 Dallas TX Massage Therapist
## 52 Dallas TX Massage Therapist in Highland Park
## 53 Dallas TX Licensed Massage Therapist
## 54 Dallas TX Massage Therapist
## 55 Dallas TX Licensed Massage Therapist
## 56 Dallas TX Licensed Massage Therapist
## 57 Dallas TX Licensed Massage Therapist
## 58 Dallas TX Licensed Massage Therapist
## 59 Dallas TX Lead Massage Therapist
## 60 Dallas TX Licensed Massage Therapist for On Call Chair Massage Work
## 61 Dallas TX Salon Massage Therapist
## 62 Dallas TX Lead Massage Therapist/Sit Pay & Bonus
## 63 Dallas TX $20/hr Professional, Dependable Licensed Massage Therapist (...
## 64 Dallas TX Licensed Massage Therapist (LMT)
## 65 Dallas TX Licensed Massage Therapist
## 66 Dallas TX Licensed Massage Therapist
## 67 Dallas TX Licensed Massage Therapist
## 68 Dallas TX Massage Therapist
## 69 Dallas TX Licensed Massage Therapist--- $1500 SIGN ON BONUS
## 70 Dallas TX Licensed Massage Therapist
## 71 Dallas TX Massage Therapist in Highland Park
## 72 Dallas TX Massage Therapist - Part time at Northwood Club
## 73 Dallas TX MESSAGE ESTHETICIAN THERAPIST
## 74 Dallas TX Stretch Practitioner Southlake TX Full Time
## 75 Dallas TX Massage Therapist - Independent Contractor
## 76 Dallas TX Graduate Massage Therapist, Independent Contractor
## 77 Dallas TX Licensed Massage Therapist
## 78 Dallas TX Licensed Massage Therapist
## 79 Dallas TX Licensed Massage Therapist
## 80 Dallas TX On Call Chair Massage Work
## 81 Dallas TX Massage Therapist [CUSTOMIZATION REQUIRED]
## 82 Dallas TX Licensed Massage Therapist
## 83 Dallas TX Licensed Massage Therapist (LMT)
## 84 Dallas TX Licensed Massage Therapist
## 85 Dallas TX Licensed Massage Therapist
## 86 Dallas TX Licensed Massage Therapist
## 87 Dallas TX Massage Therapist
## 88 Dallas TX Licensed Massage Therapist--- $1500 SIGN ON BONUS
## 89 Dallas TX Licensed Massage Therapist
## 90 Dallas TX Massage Therapist in Highland Park
## HiringAgency
## 1 Riviera SpaDallas, TX 75205 (Oak Lawn area)
## 2 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 3 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 4 ELEMENTS MASSAGE STUDIO3.6The Colony, TX 75056
## 5 Siena Massage3.8Frisco, TX 75035
## 6 Elevation Health NRHNorth Richland Hills, TX 76182 (Eastside area)
## 7 RevyveForney, TX 75126
## 8 Ramsey InsightDallas, TX
## 9 Toldson Therapy,LLCGarland, TX
## 10 G Health ConsultantsDallas, TX 75248 (Far North area)
## 11 Highland TherapiesDallas-Fort Worth, TX
## 12 RestDallas, TX
## 13 Ramsey InsightAllen, TX
## 14 Indo-Pak Massage TherapyGrand Prairie, TX•Remote work available
## 15 Dagnan ChiropracticIrving, TX
## 16 Elements3.6Dallas, TX 75230 (North Dallas area)+6 locations
## 17 Associates Physical therapyPlano, TX 75093
## 18 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 19 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 20 Revyve - Massage Chiropractic BodyworkForney, TX 75126
## 21 Modoma Massage and WellnessFrisco, TX 75034
## 22 Life Time3.6Dallas, TX+2 locations
## 23 Rooted MassageDallas, TX 75204 (Oak Lawn area)
## 24 Book a BirdieDallas-Fort Worth, TX
## 25 Johnson ChiropracticCrandall, TX 75114
## 26 Massage Envy South 3603.2Grand Prairie, TX 75052+18 locations
## 27 Renewing WellnessDallas, TX
## 28 ELEVEN WELLNESS + IVDallas, TX 75225 (North Dallas area)
## 29 Hand and Stone3.0Frisco, TX 75034
## 30 Massage Envy ColleyvilleColleyville, TX 76034
## 31 MassageLuXe3.0Southlake, TX 76092
## 32 The NOW, LLCDallas, TX 75202 (City Center District area)
## 33 Beauty and Fitness CircleDallas, TX 75202 (City Center District area)
## 34 Elements3.6Lewisville, TX 75056
## 35 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 36 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 37 Confidential - Massage TherapyFlower Mound, TX 75028
## 38 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 39 Massage Envy Casa LindaDallas, TX 75218 (Northeast Dallas area)
## 40 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 41 Elements3.6Lewisville, TX 75056
## 42 Hand and Stone3.0Dallas, TX 75231 (Lake Highlands area)+6 locations
## 43 Hand and Stone Massage and Facial Spa - Dallas Wes...3.0Dallas, TX (Oak Lawn area)
## 44 Massage Envy - AllianceDallas, TX 75204 (Oak Lawn area)+2 locations
## 45 Donna Leif Massage TherapyRichardson, TX 75082
## 46 The Blossom Spa LLCPantego, TX 76013 (West area)
## 47 Medical Massage RxFlower Mound, TX 75022
## 48 ELEMENTS MASSAGE STUDIO3.6The Colony, TX 75056+3 locations
## 49 Hand and Stone - Euless3.0Euless, TX
## 50 RevyveForney, TX 75126
## 51 Siena Massage3.8Frisco, TX 75035
## 52 Riviera SpaDallas, TX 75205 (Oak Lawn area)
## 53 Intellisoft Technologies, Inc3.5Carrollton, TX
## 54 Elements Massage - The ColonyThe Colony, TX 75056
## 55 Everybody Massage RockwallRockwall, TX 75087
## 56 L V Asian Massage & SpaSouthlake, TX 76092
## 57 Massage Envy Rowlett and Mesquite3.2Mesquite, TX 75150+5 locations
## 58 Massage Envy - City LineRichardson, TX 75074
## 59 Hand and Stone3.0Coppell, TX 75019
## 60 HealthWorks: A Family Wellness CenterPlano, TX 75075
## 61 JCPenney3.7Hurst, TX 76053
## 62 Hand and Stone3.0Frisco, TX 75034
## 63 RevyveForney, TX 75126
## 64 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 65 Massage Envy Casa LindaDallas, TX 75218 (Northeast Dallas area)
## 66 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 67 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 68 Siena Massage3.8Frisco, TX 75035
## 69 Confidential - Massage TherapyFlower Mound, TX 75028
## 70 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 71 Riviera SpaDallas, TX 75205 (Oak Lawn area)
## 72 Northwood Club3.1Dallas, TX 75240 (Far North area)
## 73 DIVINE FOOT CARE CENTERHurst, TX 76053
## 74 Stretch Zone2.7Southlake, TX 76092
## 75 Serendipity Med SpaSouthlake, TX 76092
## 76 Beyond the VeilBedford, TX 76021
## 77 Massage Envy - Campbell @ ColtDallas, TX 75248 (Far North area)
## 78 Cambridge Spa Group LLCDallas, TX
## 79 Hand & Stone Massage and Facial Spa3.0Mansfield, TX 76063+1 location
## 80 HealthWorks: A Family Wellness CenterPlano, TX 75075
## 81 Massage Envy3.2Waxahachie, TX 75165
## 82 Elevation Health NRHNorth Richland Hills, TX 76182 (Eastside area)
## 83 Quad Sharp - Allen & Dallas, TxAllen, TX 75013
## 84 Hiatus Spa + Retreat3.2Dallas, TX (Bluffview area)
## 85 Massage Envy Casa LindaDallas, TX 75218 (Northeast Dallas area)
## 86 Hand & Stone Massage Massage and Facial Spa3.0Dallas, TX 75214 (Northeast Dallas area)
## 87 Siena Massage3.8Frisco, TX 75035
## 88 Confidential - Massage TherapyFlower Mound, TX 75028
## 89 Adventure Group LLCIrving, TX 75218 (Northeast Dallas area)
## 90 Riviera SpaDallas, TX 75205 (Oak Lawn area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 15 50 25000 85000
## 2 10 15 50 25000 85000
## 3 30 15 50 25000 85000
## 4 30 15 50 25000 85000
## 5 15 15 50 25000 85000
## 6 12 15 50 25000 85000
## 7 30 15 50 25000 85000
## 8 1 15 50 25000 85000
## 9 Just posted 15 50 25000 85000
## 10 4 15 50 25000 85000
## 11 5 15 50 25000 85000
## 12 9 15 50 25000 85000
## 13 2 15 50 25000 85000
## 14 5 15 50 25000 85000
## 15 14 15 50 25000 85000
## 16 30 15 50 25000 85000
## 17 13 15 50 25000 85000
## 18 30 15 50 25000 85000
## 19 30 15 50 25000 85000
## 20 10 15 50 25000 85000
## 21 27 15 50 25000 85000
## 22 30 15 50 25000 85000
## 23 28 15 50 25000 85000
## 24 30 15 50 25000 85000
## 25 8 15 50 25000 85000
## 26 14 15 50 25000 85000
## 27 27 15 50 25000 85000
## 28 25 15 50 25000 85000
## 29 21 15 50 25000 85000
## 30 30 15 50 25000 85000
## 31 26 15 50 25000 85000
## 32 30 15 50 25000 85000
## 33 30 15 50 25000 85000
## 34 30 15 50 25000 85000
## 35 30 15 50 25000 85000
## 36 30 15 50 25000 85000
## 37 30 15 50 25000 85000
## 38 30 15 50 25000 85000
## 39 30 15 50 25000 85000
## 40 10 15 50 25000 85000
## 41 30 15 50 25000 85000
## 42 30 15 50 25000 85000
## 43 16 15 50 25000 85000
## 44 30 15 50 25000 85000
## 45 30 15 50 25000 85000
## 46 18 15 50 25000 85000
## 47 13 15 50 25000 85000
## 48 30 15 50 25000 85000
## 49 21 15 50 25000 85000
## 50 30 15 50 25000 85000
## 51 15 15 50 25000 85000
## 52 30 15 50 25000 85000
## 53 30 15 50 25000 85000
## 54 9 15 50 25000 85000
## 55 30 15 50 25000 85000
## 56 30 15 50 25000 85000
## 57 23 15 50 25000 85000
## 58 5 15 50 25000 85000
## 59 30 15 50 25000 85000
## 60 18 15 50 25000 85000
## 61 30 15 50 25000 85000
## 62 21 15 50 25000 85000
## 63 30 15 50 25000 85000
## 64 30 15 50 25000 85000
## 65 30 15 50 25000 85000
## 66 10 15 50 25000 85000
## 67 30 15 50 25000 85000
## 68 15 15 50 25000 85000
## 69 30 15 50 25000 85000
## 70 30 15 50 25000 85000
## 71 30 15 50 25000 85000
## 72 20 15 50 25000 85000
## 73 30 15 50 25000 85000
## 74 30 15 50 25000 85000
## 75 29 15 50 25000 85000
## 76 26 15 50 25000 85000
## 77 5 15 50 25000 85000
## 78 19 15 50 25000 85000
## 79 30 15 50 25000 85000
## 80 24 15 50 25000 85000
## 81 30 15 50 25000 85000
## 82 12 15 50 25000 85000
## 83 30 15 50 25000 85000
## 84 30 15 50 25000 85000
## 85 30 15 50 25000 85000
## 86 10 15 50 25000 85000
## 87 15 15 50 25000 85000
## 88 30 15 50 25000 85000
## 89 30 15 50 25000 85000
## 90 30 15 50 25000 85000
Utah Salt Lake City, West Valley City, Provo
getIndeedJobData5pages('massage therapist', 'Salt Lake City','UT')
## Warning in getIndeedJobData5pages("massage therapist", "Salt Lake City", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Salt Lake City", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 License Massage Therapist Wanted!
## 2 Licensed Massage Therapist LMT
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Stretch Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Massage Therapist or Stretch Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Flexologist: Seeking personal trainers, massage therapists,...
## 24 Massage Therapist at Snowpine Lodge
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Lead Massage Therapist
## 29 Licensed Massage Therapist (LMT)
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist - Busiest Spa in Utah
## 32 Licensed Massage Therapist
## 33 Hiring LMT's. Sign on bonus $500 full time/$200 part time!
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist LMT
## 41 Massage Therapist or Stretch Therapist
## 42 License Massage Therapist Wanted!
## 43 Licensed Massage Therapist
## 44 Massage Therapist - Independent Contractor
## 45 Lead Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist (LMT)
## 48 Licensed Massage Therapist (LMT)
## 49 Massage Therapist - Busiest Spa in Utah
## 50 Licensed Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Licensed Massage Therapist
## 56 Hiring Stretch Therapist; "Flexologist"
## 57 Massage Therapist
## 58 Flexologist: Seeking personal trainers, massage therapists,...
## 59 Licensed Massage Therapist
## 60 Massage Therapist at Snowpine Lodge
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Lead Massage Therapist
## 64 Licensed Massage Therapist (LMT)
## 65 Licensed Massage Therapist (LMT)
## 66 Massage Therapist - Busiest Spa in Utah
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Licensed Massage Therapist
## 70 Hiring Stretch Therapist; "Flexologist"
## 71 Massage Therapist
## 72 Flexologist: Seeking personal trainers, massage therapists,...
## 73 Licensed Massage Therapist
## 74 Massage Therapist at Snowpine Lodge
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
## 77 Lead Massage Therapist
## 78 Licensed Massage Therapist (LMT)
## 79 Licensed Massage Therapist (LMT)
## 80 Massage Therapist - Busiest Spa in Utah
## 81 Licensed Massage Therapist
## 82 Hiring LMT's. Sign on bonus $500 full time/$200 part time!
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$10 - $30 an hour $10 - $30 10.0 30
## 2 \n$28 - $40 an hour $28 - $40 28.0 40
## 3 \n$20 - $43 an hour $20 - $43 20.0 43
## 4 \n$35 - $75 an hour $35 - $75 35.0 75
## 5 \n$18.50 an hour $18.50 18.5 NA
## 6 \n$40 - $50 an hour $40 - $50 40.0 50
## 7 \n$25 - $35 an hour $25 - $35 25.0 35
## 8 \n$25 - $30 an hour $25 - $30 25.0 30
## 9 \n$20 - $25 an hour $20 - $25 20.0 25
## 10 \n$25 - $45 an hour $25 - $45 25.0 45
## 11 \n$32 - $45 an hour $32 - $45 32.0 45
## 12 \n$25 - $29 an hour $25 - $29 25.0 29
## 13 \n$35,600 - $55,720 a year $35600 - $55720 35600.0 55720
## 14 \n$14 - $25 an hour $14 - $25 14.0 25
## 15 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 16 \n$25 - $30 an hour $25 - $30 25.0 30
## 17 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 18 \n$22 - $27 an hour $22 - $27 22.0 27
## 19 \n$38,000 - $54,000 a year $38000 - $54000 38000.0 54000
## 20 \n$22 - $28 an hour ++ $22 - $28 22.0 28
## 21 \n$11 - $23 an hour $11 - $23 11.0 23
## 22 \n$20 - $25 an hour $20 - $25 20.0 25
## 23 \n$25 - $45 an hour $25 - $45 25.0 45
## 24 \n$40 - $50 an hour $40 - $50 40.0 50
## 25 \n$35 - $75 an hour $35 - $75 35.0 75
## 26 \n$18.50 an hour $18.50 18.5 NA
## 27 \n$20 - $43 an hour $20 - $43 20.0 43
## 28 \n$35,000 - $50,000 a year $35000 - $50000 35000.0 50000
## 29 \n$28 - $40 an hour $28 - $40 28.0 40
## 30 \n$14 - $25 an hour $14 - $25 14.0 25
## 31 \n$10 - $30 an hour $10 - $30 10.0 30
## 32 \n$22 - $28 an hour ++ $22 - $28 22.0 28
## 33 \n$100 a day $100 100.0 NA
## 34 \n$11 - $23 an hour $11 - $23 11.0 23
## 35 \n$20 - $25 an hour $20 - $25 20.0 25
## 36 \n$28 - $32 an hour $28 - $32 28.0 32
## 37 \n$15 - $35 an hour $15 - $35 15.0 35
## 38 \n$25 - $30 an hour $25 - $30 25.0 30
## 39 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 40 \n$22 - $27 an hour $22 - $27 22.0 27
## 41 \n$38,000 - $54,000 a year $38000 - $54000 38000.0 54000
## 42 \n$22 - $28 an hour ++ $22 - $28 22.0 28
## 43 \n$11 - $23 an hour $11 - $23 11.0 23
## 44 \n$20 - $25 an hour $20 - $25 20.0 25
## 45 \n$25 - $30 an hour $25 - $30 25.0 30
## 46 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 47 \n$22 - $27 an hour $22 - $27 22.0 27
## 48 \n$38,000 - $54,000 a year $38000 - $54000 38000.0 54000
## 49 \n$22 - $28 an hour ++ $22 - $28 22.0 28
## 50 \n$11 - $23 an hour $11 - $23 11.0 23
## 51 \n$20 - $25 an hour $20 - $25 20.0 25
## 52 \n$25 - $45 an hour $25 - $45 25.0 45
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 25 28 5685.173 7125.901 10
## 2 25 28 5685.173 7125.901 10
## 3 25 28 5685.173 7125.901 10
## 4 25 28 5685.173 7125.901 10
## 5 25 28 5685.173 7125.901 10
## 6 25 28 5685.173 7125.901 10
## 7 25 28 5685.173 7125.901 10
## 8 25 28 5685.173 7125.901 10
## 9 25 28 5685.173 7125.901 10
## 10 25 28 5685.173 7125.901 10
## 11 25 28 5685.173 7125.901 10
## 12 25 28 5685.173 7125.901 10
## 13 25 28 5685.173 7125.901 10
## 14 25 28 5685.173 7125.901 10
## 15 25 28 5685.173 7125.901 10
## 16 25 28 5685.173 7125.901 10
## 17 25 28 5685.173 7125.901 10
## 18 25 28 5685.173 7125.901 10
## 19 25 28 5685.173 7125.901 10
## 20 25 28 5685.173 7125.901 10
## 21 25 28 5685.173 7125.901 10
## 22 25 28 5685.173 7125.901 10
## 23 25 28 5685.173 7125.901 10
## 24 25 28 5685.173 7125.901 10
## 25 25 28 5685.173 7125.901 10
## 26 25 28 5685.173 7125.901 10
## 27 25 28 5685.173 7125.901 10
## 28 25 28 5685.173 7125.901 10
## 29 25 28 5685.173 7125.901 10
## 30 25 28 5685.173 7125.901 10
## 31 25 28 5685.173 7125.901 10
## 32 25 28 5685.173 7125.901 10
## 33 25 28 5685.173 7125.901 10
## 34 25 28 5685.173 7125.901 10
## 35 25 28 5685.173 7125.901 10
## 36 25 28 5685.173 7125.901 10
## 37 25 28 5685.173 7125.901 10
## 38 25 28 5685.173 7125.901 10
## 39 25 28 5685.173 7125.901 10
## 40 25 28 5685.173 7125.901 10
## 41 25 28 5685.173 7125.901 10
## 42 25 28 5685.173 7125.901 10
## 43 25 28 5685.173 7125.901 10
## 44 25 28 5685.173 7125.901 10
## 45 25 28 5685.173 7125.901 10
## 46 25 28 5685.173 7125.901 10
## 47 25 28 5685.173 7125.901 10
## 48 25 28 5685.173 7125.901 10
## 49 25 28 5685.173 7125.901 10
## 50 25 28 5685.173 7125.901 10
## 51 25 28 5685.173 7125.901 10
## 52 25 28 5685.173 7125.901 10
## maximumMaxSalary
## 1 55720
## 2 55720
## 3 55720
## 4 55720
## 5 55720
## 6 55720
## 7 55720
## 8 55720
## 9 55720
## 10 55720
## 11 55720
## 12 55720
## 13 55720
## 14 55720
## 15 55720
## 16 55720
## 17 55720
## 18 55720
## 19 55720
## 20 55720
## 21 55720
## 22 55720
## 23 55720
## 24 55720
## 25 55720
## 26 55720
## 27 55720
## 28 55720
## 29 55720
## 30 55720
## 31 55720
## 32 55720
## 33 55720
## 34 55720
## 35 55720
## 36 55720
## 37 55720
## 38 55720
## 39 55720
## 40 55720
## 41 55720
## 42 55720
## 43 55720
## 44 55720
## 45 55720
## 46 55720
## 47 55720
## 48 55720
## 49 55720
## 50 55720
## 51 55720
## 52 55720
##
## [[3]]
## date_daysAgo
## 1 7
## 2 30
## 3 7
## 4 13
## 5 30
## 6 30
## 7 22
## 8 Just posted
## 9 Just posted
## 10 6
## 11 6
## 12 7
## 13 4
## 14 1
## 15 4
## 16 8
## 17 30
## 18 Today
## 19 24
## 20 17
## 21 30
## 22 30
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 28
## 29 30
## 30 14
## 31 9
## 32 30
## 33 30
## 34 22
## 35 30
## 36 13
## 37 30
## 38 7
## 39 Today
## 40 30
## 41 30
## 42 7
## 43 30
## 44 6
## 45 28
## 46 30
## 47 30
## 48 14
## 49 9
## 50 30
## 51 30
## 52 30
## 53 30
## 54 17
## 55 30
## 56 30
## 57 30
## 58 30
## 59 30
## 60 30
## 61 30
## 62 30
## 63 28
## 64 30
## 65 14
## 66 9
## 67 30
## 68 17
## 69 30
## 70 30
## 71 30
## 72 30
## 73 30
## 74 30
## 75 30
## 76 30
## 77 28
## 78 30
## 79 14
## 80 9
## 81 30
## 82 30
##
## [[4]]
## HiringAgency
## 1 Axis Chiropractic and Massage ClinicWest Valley City, UT 84119
## 2 Massage Envy SPA - South Jordan3.2South Jordan, UT 84095
## 3 AquaVie day spaSalt Lake City, UT 84106
## 4 Richelle's Salon and Day SpaHolladay, UT 84117
## 5 Belle Medical2.7Draper, UT
## 6 Massage Envy3.2Salt Lake City, UT 84106 (Sugar House area)
## 7 Return To HarmonyDraper, UT 84020
## 8 Hibiscus Springs SpaSalt Lake City, UT 84111 (Central City area)
## 9 The Massage CenterSalt Lake City, UT 84102 (East Central area)
## 10 Restore HyperwellnessSugar House, UT+1 location
## 11 Aspen Falls Spinal Care CenterSalt Lake City, UT 84111 (Central City area)
## 12 Blue Water BodyworkSalt Lake City, UT 84106 (Sugar House area)
## 13 Life Time3.6South Jordan, UT 84095
## 14 The Spa LoungeMurray, UT 84107+1 location
## 15 Iron Mountain ChiropracticHerriman, UT 84096
## 16 Xclusive Nail LoungeMurray, UT 84107
## 17 Runa Nordic SpaSalt Lake City, UT 84109
## 18 Windy City Massage3.2Park City, UT
## 19 Soothe3.7Salt Lake City, UT
## 20 ZenovateBountiful, UT
## 21 Sego Lily Spa3.0Bountiful, UT 84010
## 22 Elements3.6Sandy, UT 84070+3 locations
## 23 StretchLab Riverton3.8Riverton, UT
## 24 WTS International3.3Alta, UT 84092
## 25 Elements Massage3.6South Jordan, UT 84095
## 26 Spavia Day Spa3.3Sandy, UT 84070
## 27 Hand and Stone3.0Bountiful, UT 84010+1 location
## 28 Hand & Stone - Draper3.0Draper, UT 84020
## 29 Symbii Home Health and Hospice4.0Layton, UT 84041
## 30 Beyond SpaLayton, UT 84041
## 31 Massage Envy3.2Draper, UT 84020
## 32 Westside Therapeutic MassageClinton, UT 84075
## 33 Massage Life SpaLayton, UT 84041
## 34 Return To HarmonyDraper, UT 84020
## 35 Massage Envy3.2Salt Lake City, UT 84106 (Sugar House area)
## 36 Richelle's Salon and Day SpaHolladay, UT 84117
## 37 Belle Medical2.7Draper, UT
## 38 AquaVie day spaSalt Lake City, UT 84106
## 39 Windy City Massage3.2Park City, UT
## 40 Massage Envy SPA - South Jordan3.2South Jordan, UT 84095
## 41 Runa Nordic SpaSalt Lake City, UT 84109
## 42 Axis Chiropractic and Massage ClinicWest Valley City, UT 84119
## 43 Hand and Stone3.0Bountiful, UT 84010+1 location
## 44 Strong HealingsFarmington, UT 84025
## 45 Hand & Stone - Draper3.0Draper, UT 84020
## 46 Massage Envy3.2Salt Lake City, UT 84106 (Sugar House area)+9 locations
## 47 Symbii Home Health and Hospice4.0Layton, UT 84041
## 48 Beyond SpaLayton, UT 84041
## 49 Massage Envy3.2Draper, UT 84020
## 50 Westside Therapeutic MassageClinton, UT 84075
## 51 Soulstice Day Spa & SalonWest Jordan, UT 84084
## 52 Cameron Wellness Life SpaSugar House, UT
## 53 Willow Creek ChiropracticSandy, UT 84093
## 54 ZenovateBountiful, UT
## 55 Sego Lily Spa3.0Bountiful, UT 84010
## 56 StretchLab Fort Union3.8Midvale, UT
## 57 Elements3.6Sandy, UT 84070+3 locations
## 58 StretchLab Riverton3.8Riverton, UT
## 59 Elements Massage3.6South Jordan, UT 84095
## 60 WTS International3.3Alta, UT 84092
## 61 Spavia Day Spa3.3Sandy, UT 84070
## 62 Hand and Stone3.0Bountiful, UT 84010+1 location
## 63 Hand & Stone - Draper3.0Draper, UT 84020
## 64 Symbii Home Health and Hospice4.0Layton, UT 84041
## 65 Beyond SpaLayton, UT 84041
## 66 Massage Envy3.2Draper, UT 84020
## 67 Westside Therapeutic MassageClinton, UT 84075
## 68 ZenovateBountiful, UT
## 69 Sego Lily Spa3.0Bountiful, UT 84010
## 70 StretchLab Fort Union3.8Midvale, UT
## 71 Elements3.6Sandy, UT 84070+3 locations
## 72 StretchLab Riverton3.8Riverton, UT
## 73 Elements Massage3.6South Jordan, UT 84095
## 74 WTS International3.3Alta, UT 84092
## 75 Spavia Day Spa3.3Sandy, UT 84070
## 76 Hand and Stone3.0Bountiful, UT 84010+1 location
## 77 Hand & Stone - Draper3.0Draper, UT 84020
## 78 Symbii Home Health and Hospice4.0Layton, UT 84041
## 79 Beyond SpaLayton, UT 84041
## 80 Massage Envy3.2Draper, UT 84020
## 81 Westside Therapeutic MassageClinton, UT 84075
## 82 Massage Life SpaLayton, UT 84041
##
## [[5]]
## Salary salary minSalary maxSalary
## 13 \n$35,600 - $55,720 a year $35600 - $55720 35600 55720
## 15 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 17 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 19 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 28 \n$35,000 - $50,000 a year $35000 - $50000 35000 50000
## 39 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 41 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 46 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 48 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 13 35000 50000 32733.33 46968.89 25000
## 15 35000 50000 32733.33 46968.89 25000
## 17 35000 50000 32733.33 46968.89 25000
## 19 35000 50000 32733.33 46968.89 25000
## 28 35000 50000 32733.33 46968.89 25000
## 39 35000 50000 32733.33 46968.89 25000
## 41 35000 50000 32733.33 46968.89 25000
## 46 35000 50000 32733.33 46968.89 25000
## 48 35000 50000 32733.33 46968.89 25000
## maximumMaxSalary
## 13 55720
## 15 55720
## 17 55720
## 19 55720
## 28 55720
## 39 55720
## 41 55720
## 46 55720
## 48 55720
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$10 - $30 an hour $10 - $30 10.0 30 22
## 2 \n$28 - $40 an hour $28 - $40 28.0 40 22
## 3 \n$20 - $43 an hour $20 - $43 20.0 43 22
## 4 \n$35 - $75 an hour $35 - $75 35.0 75 22
## 5 \n$18.50 an hour $18.50 18.5 NA 22
## 6 \n$40 - $50 an hour $40 - $50 40.0 50 22
## 7 \n$25 - $35 an hour $25 - $35 25.0 35 22
## 8 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 9 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 10 \n$25 - $45 an hour $25 - $45 25.0 45 22
## 11 \n$32 - $45 an hour $32 - $45 32.0 45 22
## 12 \n$25 - $29 an hour $25 - $29 25.0 29 22
## 14 \n$14 - $25 an hour $14 - $25 14.0 25 22
## 16 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 18 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 20 \n$22 - $28 an hour ++ $22 - $28 22.0 28 22
## 21 \n$11 - $23 an hour $11 - $23 11.0 23 22
## 22 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 23 \n$25 - $45 an hour $25 - $45 25.0 45 22
## 24 \n$40 - $50 an hour $40 - $50 40.0 50 22
## 25 \n$35 - $75 an hour $35 - $75 35.0 75 22
## 26 \n$18.50 an hour $18.50 18.5 NA 22
## 27 \n$20 - $43 an hour $20 - $43 20.0 43 22
## 29 \n$28 - $40 an hour $28 - $40 28.0 40 22
## 30 \n$14 - $25 an hour $14 - $25 14.0 25 22
## 31 \n$10 - $30 an hour $10 - $30 10.0 30 22
## 32 \n$22 - $28 an hour ++ $22 - $28 22.0 28 22
## 34 \n$11 - $23 an hour $11 - $23 11.0 23 22
## 35 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 36 \n$28 - $32 an hour $28 - $32 28.0 32 22
## 37 \n$15 - $35 an hour $15 - $35 15.0 35 22
## 38 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 40 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 42 \n$22 - $28 an hour ++ $22 - $28 22.0 28 22
## 43 \n$11 - $23 an hour $11 - $23 11.0 23 22
## 44 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 45 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 47 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 49 \n$22 - $28 an hour ++ $22 - $28 22.0 28 22
## 50 \n$11 - $23 an hour $11 - $23 11.0 23 22
## 51 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 52 \n$25 - $45 an hour $25 - $45 25.0 45 22
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 22.11905 34.175 10 75
## 2 30 22.11905 34.175 10 75
## 3 30 22.11905 34.175 10 75
## 4 30 22.11905 34.175 10 75
## 5 30 22.11905 34.175 10 75
## 6 30 22.11905 34.175 10 75
## 7 30 22.11905 34.175 10 75
## 8 30 22.11905 34.175 10 75
## 9 30 22.11905 34.175 10 75
## 10 30 22.11905 34.175 10 75
## 11 30 22.11905 34.175 10 75
## 12 30 22.11905 34.175 10 75
## 14 30 22.11905 34.175 10 75
## 16 30 22.11905 34.175 10 75
## 18 30 22.11905 34.175 10 75
## 20 30 22.11905 34.175 10 75
## 21 30 22.11905 34.175 10 75
## 22 30 22.11905 34.175 10 75
## 23 30 22.11905 34.175 10 75
## 24 30 22.11905 34.175 10 75
## 25 30 22.11905 34.175 10 75
## 26 30 22.11905 34.175 10 75
## 27 30 22.11905 34.175 10 75
## 29 30 22.11905 34.175 10 75
## 30 30 22.11905 34.175 10 75
## 31 30 22.11905 34.175 10 75
## 32 30 22.11905 34.175 10 75
## 34 30 22.11905 34.175 10 75
## 35 30 22.11905 34.175 10 75
## 36 30 22.11905 34.175 10 75
## 37 30 22.11905 34.175 10 75
## 38 30 22.11905 34.175 10 75
## 40 30 22.11905 34.175 10 75
## 42 30 22.11905 34.175 10 75
## 43 30 22.11905 34.175 10 75
## 44 30 22.11905 34.175 10 75
## 45 30 22.11905 34.175 10 75
## 47 30 22.11905 34.175 10 75
## 49 30 22.11905 34.175 10 75
## 50 30 22.11905 34.175 10 75
## 51 30 22.11905 34.175 10 75
## 52 30 22.11905 34.175 10 75
##
## [[7]]
## city state
## 1 Salt Lake City UT
## 2 Salt Lake City UT
## 3 Salt Lake City UT
## 4 Salt Lake City UT
## 5 Salt Lake City UT
## 6 Salt Lake City UT
## 7 Salt Lake City UT
## 8 Salt Lake City UT
## 9 Salt Lake City UT
## 10 Salt Lake City UT
## 11 Salt Lake City UT
## 12 Salt Lake City UT
## 13 Salt Lake City UT
## 14 Salt Lake City UT
## 15 Salt Lake City UT
## 16 Salt Lake City UT
## 17 Salt Lake City UT
## 18 Salt Lake City UT
## 19 Salt Lake City UT
## 20 Salt Lake City UT
## 21 Salt Lake City UT
## 22 Salt Lake City UT
## 23 Salt Lake City UT
## 24 Salt Lake City UT
## 25 Salt Lake City UT
## 26 Salt Lake City UT
## 27 Salt Lake City UT
## 28 Salt Lake City UT
## 29 Salt Lake City UT
## 30 Salt Lake City UT
## 31 Salt Lake City UT
## 32 Salt Lake City UT
## 33 Salt Lake City UT
## 34 Salt Lake City UT
## 35 Salt Lake City UT
## 36 Salt Lake City UT
## 37 Salt Lake City UT
## 38 Salt Lake City UT
## 39 Salt Lake City UT
## 40 Salt Lake City UT
## 41 Salt Lake City UT
## 42 Salt Lake City UT
## 43 Salt Lake City UT
## 44 Salt Lake City UT
## 45 Salt Lake City UT
## 46 Salt Lake City UT
## 47 Salt Lake City UT
## 48 Salt Lake City UT
## 49 Salt Lake City UT
## 50 Salt Lake City UT
## 51 Salt Lake City UT
## 52 Salt Lake City UT
## 53 Salt Lake City UT
## 54 Salt Lake City UT
## 55 Salt Lake City UT
## 56 Salt Lake City UT
## 57 Salt Lake City UT
## 58 Salt Lake City UT
## 59 Salt Lake City UT
## 60 Salt Lake City UT
## 61 Salt Lake City UT
## 62 Salt Lake City UT
## 63 Salt Lake City UT
## 64 Salt Lake City UT
## 65 Salt Lake City UT
## 66 Salt Lake City UT
## 67 Salt Lake City UT
## 68 Salt Lake City UT
## 69 Salt Lake City UT
## 70 Salt Lake City UT
## 71 Salt Lake City UT
## 72 Salt Lake City UT
## 73 Salt Lake City UT
## 74 Salt Lake City UT
## 75 Salt Lake City UT
## 76 Salt Lake City UT
## 77 Salt Lake City UT
## 78 Salt Lake City UT
## 79 Salt Lake City UT
## 80 Salt Lake City UT
## 81 Salt Lake City UT
## 82 Salt Lake City UT
## jobTitle
## 1 License Massage Therapist Wanted!
## 2 Licensed Massage Therapist LMT
## 3 Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist (LMT)
## 8 Licensed Massage Therapist
## 9 Licensed Massage Therapist
## 10 Stretch Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Massage Therapist
## 16 Licensed Massage Therapist
## 17 Massage Therapist or Stretch Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Flexologist: Seeking personal trainers, massage therapists,...
## 24 Massage Therapist at Snowpine Lodge
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 Lead Massage Therapist
## 29 Licensed Massage Therapist (LMT)
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist - Busiest Spa in Utah
## 32 Licensed Massage Therapist
## 33 Hiring LMT's. Sign on bonus $500 full time/$200 part time!
## 34 Licensed Massage Therapist (LMT)
## 35 Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist LMT
## 41 Massage Therapist or Stretch Therapist
## 42 License Massage Therapist Wanted!
## 43 Licensed Massage Therapist
## 44 Massage Therapist - Independent Contractor
## 45 Lead Massage Therapist
## 46 Massage Therapist
## 47 Licensed Massage Therapist (LMT)
## 48 Licensed Massage Therapist (LMT)
## 49 Massage Therapist - Busiest Spa in Utah
## 50 Licensed Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Massage Therapist
## 55 Licensed Massage Therapist
## 56 Hiring Stretch Therapist; "Flexologist"
## 57 Massage Therapist
## 58 Flexologist: Seeking personal trainers, massage therapists,...
## 59 Licensed Massage Therapist
## 60 Massage Therapist at Snowpine Lodge
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Lead Massage Therapist
## 64 Licensed Massage Therapist (LMT)
## 65 Licensed Massage Therapist (LMT)
## 66 Massage Therapist - Busiest Spa in Utah
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Licensed Massage Therapist
## 70 Hiring Stretch Therapist; "Flexologist"
## 71 Massage Therapist
## 72 Flexologist: Seeking personal trainers, massage therapists,...
## 73 Licensed Massage Therapist
## 74 Massage Therapist at Snowpine Lodge
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
## 77 Lead Massage Therapist
## 78 Licensed Massage Therapist (LMT)
## 79 Licensed Massage Therapist (LMT)
## 80 Massage Therapist - Busiest Spa in Utah
## 81 Licensed Massage Therapist
## 82 Hiring LMT's. Sign on bonus $500 full time/$200 part time!
## HiringAgency
## 1 Axis Chiropractic and Massage ClinicWest Valley City, UT 84119
## 2 Massage Envy SPA - South Jordan3.2South Jordan, UT 84095
## 3 AquaVie day spaSalt Lake City, UT 84106
## 4 Richelle's Salon and Day SpaHolladay, UT 84117
## 5 Belle Medical2.7Draper, UT
## 6 Massage Envy3.2Salt Lake City, UT 84106 (Sugar House area)
## 7 Return To HarmonyDraper, UT 84020
## 8 Hibiscus Springs SpaSalt Lake City, UT 84111 (Central City area)
## 9 The Massage CenterSalt Lake City, UT 84102 (East Central area)
## 10 Restore HyperwellnessSugar House, UT+1 location
## 11 Aspen Falls Spinal Care CenterSalt Lake City, UT 84111 (Central City area)
## 12 Blue Water BodyworkSalt Lake City, UT 84106 (Sugar House area)
## 13 Life Time3.6South Jordan, UT 84095
## 14 The Spa LoungeMurray, UT 84107+1 location
## 15 Iron Mountain ChiropracticHerriman, UT 84096
## 16 Xclusive Nail LoungeMurray, UT 84107
## 17 Runa Nordic SpaSalt Lake City, UT 84109
## 18 Windy City Massage3.2Park City, UT
## 19 Soothe3.7Salt Lake City, UT
## 20 ZenovateBountiful, UT
## 21 Sego Lily Spa3.0Bountiful, UT 84010
## 22 Elements3.6Sandy, UT 84070+3 locations
## 23 StretchLab Riverton3.8Riverton, UT
## 24 WTS International3.3Alta, UT 84092
## 25 Elements Massage3.6South Jordan, UT 84095
## 26 Spavia Day Spa3.3Sandy, UT 84070
## 27 Hand and Stone3.0Bountiful, UT 84010+1 location
## 28 Hand & Stone - Draper3.0Draper, UT 84020
## 29 Symbii Home Health and Hospice4.0Layton, UT 84041
## 30 Beyond SpaLayton, UT 84041
## 31 Massage Envy3.2Draper, UT 84020
## 32 Westside Therapeutic MassageClinton, UT 84075
## 33 Massage Life SpaLayton, UT 84041
## 34 Return To HarmonyDraper, UT 84020
## 35 Massage Envy3.2Salt Lake City, UT 84106 (Sugar House area)
## 36 Richelle's Salon and Day SpaHolladay, UT 84117
## 37 Belle Medical2.7Draper, UT
## 38 AquaVie day spaSalt Lake City, UT 84106
## 39 Windy City Massage3.2Park City, UT
## 40 Massage Envy SPA - South Jordan3.2South Jordan, UT 84095
## 41 Runa Nordic SpaSalt Lake City, UT 84109
## 42 Axis Chiropractic and Massage ClinicWest Valley City, UT 84119
## 43 Hand and Stone3.0Bountiful, UT 84010+1 location
## 44 Strong HealingsFarmington, UT 84025
## 45 Hand & Stone - Draper3.0Draper, UT 84020
## 46 Massage Envy3.2Salt Lake City, UT 84106 (Sugar House area)+9 locations
## 47 Symbii Home Health and Hospice4.0Layton, UT 84041
## 48 Beyond SpaLayton, UT 84041
## 49 Massage Envy3.2Draper, UT 84020
## 50 Westside Therapeutic MassageClinton, UT 84075
## 51 Soulstice Day Spa & SalonWest Jordan, UT 84084
## 52 Cameron Wellness Life SpaSugar House, UT
## 53 Willow Creek ChiropracticSandy, UT 84093
## 54 ZenovateBountiful, UT
## 55 Sego Lily Spa3.0Bountiful, UT 84010
## 56 StretchLab Fort Union3.8Midvale, UT
## 57 Elements3.6Sandy, UT 84070+3 locations
## 58 StretchLab Riverton3.8Riverton, UT
## 59 Elements Massage3.6South Jordan, UT 84095
## 60 WTS International3.3Alta, UT 84092
## 61 Spavia Day Spa3.3Sandy, UT 84070
## 62 Hand and Stone3.0Bountiful, UT 84010+1 location
## 63 Hand & Stone - Draper3.0Draper, UT 84020
## 64 Symbii Home Health and Hospice4.0Layton, UT 84041
## 65 Beyond SpaLayton, UT 84041
## 66 Massage Envy3.2Draper, UT 84020
## 67 Westside Therapeutic MassageClinton, UT 84075
## 68 ZenovateBountiful, UT
## 69 Sego Lily Spa3.0Bountiful, UT 84010
## 70 StretchLab Fort Union3.8Midvale, UT
## 71 Elements3.6Sandy, UT 84070+3 locations
## 72 StretchLab Riverton3.8Riverton, UT
## 73 Elements Massage3.6South Jordan, UT 84095
## 74 WTS International3.3Alta, UT 84092
## 75 Spavia Day Spa3.3Sandy, UT 84070
## 76 Hand and Stone3.0Bountiful, UT 84010+1 location
## 77 Hand & Stone - Draper3.0Draper, UT 84020
## 78 Symbii Home Health and Hospice4.0Layton, UT 84041
## 79 Beyond SpaLayton, UT 84041
## 80 Massage Envy3.2Draper, UT 84020
## 81 Westside Therapeutic MassageClinton, UT 84075
## 82 Massage Life SpaLayton, UT 84041
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 7 10 75 25000 55720
## 2 30 10 75 25000 55720
## 3 7 10 75 25000 55720
## 4 13 10 75 25000 55720
## 5 30 10 75 25000 55720
## 6 30 10 75 25000 55720
## 7 22 10 75 25000 55720
## 8 Just posted 10 75 25000 55720
## 9 Just posted 10 75 25000 55720
## 10 6 10 75 25000 55720
## 11 6 10 75 25000 55720
## 12 7 10 75 25000 55720
## 13 4 10 75 25000 55720
## 14 1 10 75 25000 55720
## 15 4 10 75 25000 55720
## 16 8 10 75 25000 55720
## 17 30 10 75 25000 55720
## 18 Today 10 75 25000 55720
## 19 24 10 75 25000 55720
## 20 17 10 75 25000 55720
## 21 30 10 75 25000 55720
## 22 30 10 75 25000 55720
## 23 30 10 75 25000 55720
## 24 30 10 75 25000 55720
## 25 30 10 75 25000 55720
## 26 30 10 75 25000 55720
## 27 30 10 75 25000 55720
## 28 28 10 75 25000 55720
## 29 30 10 75 25000 55720
## 30 14 10 75 25000 55720
## 31 9 10 75 25000 55720
## 32 30 10 75 25000 55720
## 33 30 10 75 25000 55720
## 34 22 10 75 25000 55720
## 35 30 10 75 25000 55720
## 36 13 10 75 25000 55720
## 37 30 10 75 25000 55720
## 38 7 10 75 25000 55720
## 39 Today 10 75 25000 55720
## 40 30 10 75 25000 55720
## 41 30 10 75 25000 55720
## 42 7 10 75 25000 55720
## 43 30 10 75 25000 55720
## 44 6 10 75 25000 55720
## 45 28 10 75 25000 55720
## 46 30 10 75 25000 55720
## 47 30 10 75 25000 55720
## 48 14 10 75 25000 55720
## 49 9 10 75 25000 55720
## 50 30 10 75 25000 55720
## 51 30 10 75 25000 55720
## 52 30 10 75 25000 55720
## 53 30 10 75 25000 55720
## 54 17 10 75 25000 55720
## 55 30 10 75 25000 55720
## 56 30 10 75 25000 55720
## 57 30 10 75 25000 55720
## 58 30 10 75 25000 55720
## 59 30 10 75 25000 55720
## 60 30 10 75 25000 55720
## 61 30 10 75 25000 55720
## 62 30 10 75 25000 55720
## 63 28 10 75 25000 55720
## 64 30 10 75 25000 55720
## 65 14 10 75 25000 55720
## 66 9 10 75 25000 55720
## 67 30 10 75 25000 55720
## 68 17 10 75 25000 55720
## 69 30 10 75 25000 55720
## 70 30 10 75 25000 55720
## 71 30 10 75 25000 55720
## 72 30 10 75 25000 55720
## 73 30 10 75 25000 55720
## 74 30 10 75 25000 55720
## 75 30 10 75 25000 55720
## 76 30 10 75 25000 55720
## 77 28 10 75 25000 55720
## 78 30 10 75 25000 55720
## 79 14 10 75 25000 55720
## 80 9 10 75 25000 55720
## 81 30 10 75 25000 55720
## 82 30 10 75 25000 55720
getIndeedJobData5pages('massage therapist', 'West Valley City','UT')
## Warning in getIndeedJobData5pages("massage therapist", "West Valley City", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "West Valley City", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 License Massage Therapist Wanted!
## 2 Licensed Massage Therapist LMT
## 3 Massage Therapist or Stretch Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Stretch Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist
## 18 Flexologist: Seeking personal trainers, massage therapists,...
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Licensed Massage Therapist (LMT)
## 22 Massage Therapist at Snowpine Lodge
## 23 Licensed Massage Therapist
## 24 Lead Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist - Busiest Spa in Utah
## 27 Licensed Massage Therapist (LMT)
## 28 Hiring Stretch Therapist; "Flexologist"
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Massage Therapist - Independent Contractor
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Flexologist: Seeking personal trainers, massage therapists,...
## 35 Licensed Massage Therapist (LMT)
## 36 Massage Therapist
## 37 Massage Therapist at Snowpine Lodge
## 38 Licensed Massage Therapist
## 39 Lead Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist - Busiest Spa in Utah
## 42 Licensed Massage Therapist (LMT)
## 43 Hiring Stretch Therapist; "Flexologist"
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist - Independent Contractor
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Flexologist: Seeking personal trainers, massage therapists,...
## 50 Licensed Massage Therapist (LMT)
## 51 Massage Therapist
## 52 Massage Therapist at Snowpine Lodge
## 53 Licensed Massage Therapist
## 54 Lead Massage Therapist
## 55 Licensed Massage Therapist
## 56 Massage Therapist - Busiest Spa in Utah
## 57 Licensed Massage Therapist (LMT)
## 58 Hiring Stretch Therapist; "Flexologist"
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist - Independent Contractor
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Flexologist: Seeking personal trainers, massage therapists,...
## 65 Licensed Massage Therapist (LMT)
## 66 Massage Therapist
## 67 Massage Therapist at Snowpine Lodge
## 68 Licensed Massage Therapist
## 69 Lead Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage Therapist - Busiest Spa in Utah
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$10 - $30 an hour $10 - $30 10.0 30
## 2 \n$28 - $40 an hour $28 - $40 28.0 40
## 3 \n$14 - $25 an hour $14 - $25 14.0 25
## 4 \n$40 - $50 an hour $40 - $50 40.0 50
## 5 \n$20 - $43 an hour $20 - $43 20.0 43
## 6 \n$28 - $32 an hour $28 - $32 28.0 32
## 7 \n$20 - $40 an hour $20 - $40 20.0 40
## 8 \n$18.50 an hour $18.50 18.5 NA
## 9 \n$35 - $75 an hour $35 - $75 35.0 75
## 10 \n$25 - $35 an hour $25 - $35 25.0 35
## 11 \n$25 - $30 an hour $25 - $30 25.0 30
## 12 \n$32 - $45 an hour $32 - $45 32.0 45
## 13 \n$25 - $29 an hour $25 - $29 25.0 29
## 14 \n$15 - $35 an hour $15 - $35 15.0 35
## 15 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 16 \n$20 - $25 an hour $20 - $25 20.0 25
## 17 \n$22 - $27 an hour $22 - $27 22.0 27
## 18 \n$25 - $30 an hour $25 - $30 25.0 30
## 19 \n$19 - $50 an hour $19 - $50 19.0 50
## 20 \n$38,000 - $54,000 a year $38000 - $54000 38000.0 54000
## 21 \n$22 - $27 an hour $22 - $27 22.0 27
## 22 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 23 \n$20 - $25 an hour $20 - $25 20.0 25
## 24 \n$22 - $27 an hour $22 - $27 22.0 27
## 25 \n$19 - $50 an hour $19 - $50 19.0 50
## 26 \n$25 - $30 an hour $25 - $30 25.0 30
## 27 \n$38,000 - $54,000 a year $38000 - $54000 38000.0 54000
## 28 \n$22 - $27 an hour $22 - $27 22.0 27
## 29 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 30 \n$20 - $25 an hour $20 - $25 20.0 25
## 31 \n$22 - $27 an hour $22 - $27 22.0 27
## 32 \n$19 - $50 an hour $19 - $50 19.0 50
## 33 \n$25 - $30 an hour $25 - $30 25.0 30
## 34 \n$38,000 - $54,000 a year $38000 - $54000 38000.0 54000
## 35 \n$22 - $27 an hour $22 - $27 22.0 27
## 36 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 37 \n$20 - $25 an hour $20 - $25 20.0 25
## 38 \n$22 - $27 an hour $22 - $27 22.0 27
## 39 \n$19 - $50 an hour $19 - $50 19.0 50
## 40 \n$25 - $30 an hour $25 - $30 25.0 30
## 41 \n$38,000 - $54,000 a year $38000 - $54000 38000.0 54000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22 28 4213.305 5405.722 10
## 2 22 28 4213.305 5405.722 10
## 3 22 28 4213.305 5405.722 10
## 4 22 28 4213.305 5405.722 10
## 5 22 28 4213.305 5405.722 10
## 6 22 28 4213.305 5405.722 10
## 7 22 28 4213.305 5405.722 10
## 8 22 28 4213.305 5405.722 10
## 9 22 28 4213.305 5405.722 10
## 10 22 28 4213.305 5405.722 10
## 11 22 28 4213.305 5405.722 10
## 12 22 28 4213.305 5405.722 10
## 13 22 28 4213.305 5405.722 10
## 14 22 28 4213.305 5405.722 10
## 15 22 28 4213.305 5405.722 10
## 16 22 28 4213.305 5405.722 10
## 17 22 28 4213.305 5405.722 10
## 18 22 28 4213.305 5405.722 10
## 19 22 28 4213.305 5405.722 10
## 20 22 28 4213.305 5405.722 10
## 21 22 28 4213.305 5405.722 10
## 22 22 28 4213.305 5405.722 10
## 23 22 28 4213.305 5405.722 10
## 24 22 28 4213.305 5405.722 10
## 25 22 28 4213.305 5405.722 10
## 26 22 28 4213.305 5405.722 10
## 27 22 28 4213.305 5405.722 10
## 28 22 28 4213.305 5405.722 10
## 29 22 28 4213.305 5405.722 10
## 30 22 28 4213.305 5405.722 10
## 31 22 28 4213.305 5405.722 10
## 32 22 28 4213.305 5405.722 10
## 33 22 28 4213.305 5405.722 10
## 34 22 28 4213.305 5405.722 10
## 35 22 28 4213.305 5405.722 10
## 36 22 28 4213.305 5405.722 10
## 37 22 28 4213.305 5405.722 10
## 38 22 28 4213.305 5405.722 10
## 39 22 28 4213.305 5405.722 10
## 40 22 28 4213.305 5405.722 10
## 41 22 28 4213.305 5405.722 10
## maximumMaxSalary
## 1 54000
## 2 54000
## 3 54000
## 4 54000
## 5 54000
## 6 54000
## 7 54000
## 8 54000
## 9 54000
## 10 54000
## 11 54000
## 12 54000
## 13 54000
## 14 54000
## 15 54000
## 16 54000
## 17 54000
## 18 54000
## 19 54000
## 20 54000
## 21 54000
## 22 54000
## 23 54000
## 24 54000
## 25 54000
## 26 54000
## 27 54000
## 28 54000
## 29 54000
## 30 54000
## 31 54000
## 32 54000
## 33 54000
## 34 54000
## 35 54000
## 36 54000
## 37 54000
## 38 54000
## 39 54000
## 40 54000
## 41 54000
##
## [[3]]
## date_daysAgo
## 1 7
## 2 30
## 3 30
## 4 22
## 5 7
## 6 30
## 7 27
## 8 30
## 9 13
## 10 Just posted
## 11 Just posted
## 12 1
## 13 4
## 14 6
## 15 30
## 16 17
## 17 30
## 18 30
## 19 30
## 20 17
## 21 3
## 22 30
## 23 30
## 24 28
## 25 30
## 26 9
## 27 30
## 28 30
## 29 30
## 30 30
## 31 17
## 32 30
## 33 30
## 34 30
## 35 3
## 36 17
## 37 30
## 38 30
## 39 28
## 40 30
## 41 9
## 42 30
## 43 30
## 44 30
## 45 30
## 46 17
## 47 30
## 48 30
## 49 30
## 50 3
## 51 17
## 52 30
## 53 30
## 54 28
## 55 30
## 56 9
## 57 30
## 58 30
## 59 30
## 60 30
## 61 17
## 62 30
## 63 30
## 64 30
## 65 3
## 66 17
## 67 30
## 68 30
## 69 28
## 70 30
## 71 9
##
## [[4]]
## HiringAgency
## 1 Axis Chiropractic and Massage ClinicWest Valley City, UT 84119
## 2 Massage Envy SPA - South Jordan3.2South Jordan, UT 84095
## 3 Runa Nordic SpaSalt Lake City, UT 84109
## 4 Return To HarmonyDraper, UT 84020
## 5 AquaVie day spaSalt Lake City, UT 84106
## 6 Soulstice Day Spa & SalonWest Jordan, UT 84084
## 7 Institute of Chiropractic & Acupuncture TherapyWest Jordan, UT 84088
## 8 Belle Medical2.7Draper, UT
## 9 Richelle's Salon and Day SpaHolladay, UT 84117
## 10 Hibiscus Springs SpaSalt Lake City, UT 84111 (Central City area)
## 11 The Massage CenterSalt Lake City, UT 84102 (East Central area)
## 12 The Spa LoungeMurray, UT 84107+1 location
## 13 Iron Mountain ChiropracticHerriman, UT 84096
## 14 Restore HyperwellnessDraper, UT 84020+1 location
## 15 Cameron Wellness Life SpaSugar House, UT
## 16 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 17 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 18 StretchLab Riverton3.8Riverton, UT
## 19 Elements Massage3.6South Jordan, UT 84095
## 20 ZenovateBountiful, UT
## 21 Massage Envy American ForkAmerican Fork, UT 84003
## 22 WTS International3.3Alta, UT 84092
## 23 Spavia Day Spa3.3Sandy, UT 84070
## 24 Hand & Stone - Draper3.0Draper, UT 84020
## 25 Hand and Stone3.0Draper, UT 84020+1 location
## 26 Massage Envy3.2Draper, UT 84020
## 27 Family Chiropractic & WellnessDraper, UT 84020
## 28 StretchLab Fort Union3.8Midvale, UT
## 29 Willow Creek ChiropracticSandy, UT 84093
## 30 PS Lifestyle3.0Salt Lake City, UT
## 31 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 32 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 33 Elements Massage3.6South Jordan, UT 84095
## 34 StretchLab Riverton3.8Riverton, UT
## 35 Massage Envy American ForkAmerican Fork, UT 84003
## 36 ZenovateBountiful, UT
## 37 WTS International3.3Alta, UT 84092
## 38 Spavia Day Spa3.3Sandy, UT 84070
## 39 Hand & Stone - Draper3.0Draper, UT 84020
## 40 Hand and Stone3.0Draper, UT 84020+1 location
## 41 Massage Envy3.2Draper, UT 84020
## 42 Family Chiropractic & WellnessDraper, UT 84020
## 43 StretchLab Fort Union3.8Midvale, UT
## 44 Willow Creek ChiropracticSandy, UT 84093
## 45 PS Lifestyle3.0Salt Lake City, UT
## 46 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 47 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 48 Elements Massage3.6South Jordan, UT 84095
## 49 StretchLab Riverton3.8Riverton, UT
## 50 Massage Envy American ForkAmerican Fork, UT 84003
## 51 ZenovateBountiful, UT
## 52 WTS International3.3Alta, UT 84092
## 53 Spavia Day Spa3.3Sandy, UT 84070
## 54 Hand & Stone - Draper3.0Draper, UT 84020
## 55 Hand and Stone3.0Draper, UT 84020+1 location
## 56 Massage Envy3.2Draper, UT 84020
## 57 Family Chiropractic & WellnessDraper, UT 84020
## 58 StretchLab Fort Union3.8Midvale, UT
## 59 Willow Creek ChiropracticSandy, UT 84093
## 60 PS Lifestyle3.0Salt Lake City, UT
## 61 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 62 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 63 Elements Massage3.6South Jordan, UT 84095
## 64 StretchLab Riverton3.8Riverton, UT
## 65 Massage Envy American ForkAmerican Fork, UT 84003
## 66 ZenovateBountiful, UT
## 67 WTS International3.3Alta, UT 84092
## 68 Spavia Day Spa3.3Sandy, UT 84070
## 69 Hand & Stone - Draper3.0Draper, UT 84020
## 70 Hand and Stone3.0Draper, UT 84020+1 location
## 71 Massage Envy3.2Draper, UT 84020
##
## [[5]]
## Salary salary minSalary maxSalary
## 20 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 27 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 34 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## 41 \n$38,000 - $54,000 a year $38000 - $54000 38000 54000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 20 38000 54000 38000 54000 38000
## 27 38000 54000 38000 54000 38000
## 34 38000 54000 38000 54000 38000
## 41 38000 54000 38000 54000 38000
## maximumMaxSalary
## 20 54000
## 27 54000
## 34 54000
## 41 54000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$10 - $30 an hour $10 - $30 10.0 30 22
## 2 \n$28 - $40 an hour $28 - $40 28.0 40 22
## 3 \n$14 - $25 an hour $14 - $25 14.0 25 22
## 4 \n$40 - $50 an hour $40 - $50 40.0 50 22
## 5 \n$20 - $43 an hour $20 - $43 20.0 43 22
## 6 \n$28 - $32 an hour $28 - $32 28.0 32 22
## 7 \n$20 - $40 an hour $20 - $40 20.0 40 22
## 8 \n$18.50 an hour $18.50 18.5 NA 22
## 9 \n$35 - $75 an hour $35 - $75 35.0 75 22
## 10 \n$25 - $35 an hour $25 - $35 25.0 35 22
## 11 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 12 \n$32 - $45 an hour $32 - $45 32.0 45 22
## 13 \n$25 - $29 an hour $25 - $29 25.0 29 22
## 14 \n$15 - $35 an hour $15 - $35 15.0 35 22
## 16 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 17 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 18 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 19 \n$19 - $50 an hour $19 - $50 19.0 50 22
## 21 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 23 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 24 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 25 \n$19 - $50 an hour $19 - $50 19.0 50 22
## 26 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 28 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 30 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 31 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 32 \n$19 - $50 an hour $19 - $50 19.0 50 22
## 33 \n$25 - $30 an hour $25 - $30 25.0 30 22
## 35 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 37 \n$20 - $25 an hour $20 - $25 20.0 25 22
## 38 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 39 \n$19 - $50 an hour $19 - $50 19.0 50 22
## 40 \n$25 - $30 an hour $25 - $30 25.0 30 22
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 22.59091 34.9375 10 75
## 2 30 22.59091 34.9375 10 75
## 3 30 22.59091 34.9375 10 75
## 4 30 22.59091 34.9375 10 75
## 5 30 22.59091 34.9375 10 75
## 6 30 22.59091 34.9375 10 75
## 7 30 22.59091 34.9375 10 75
## 8 30 22.59091 34.9375 10 75
## 9 30 22.59091 34.9375 10 75
## 10 30 22.59091 34.9375 10 75
## 11 30 22.59091 34.9375 10 75
## 12 30 22.59091 34.9375 10 75
## 13 30 22.59091 34.9375 10 75
## 14 30 22.59091 34.9375 10 75
## 16 30 22.59091 34.9375 10 75
## 17 30 22.59091 34.9375 10 75
## 18 30 22.59091 34.9375 10 75
## 19 30 22.59091 34.9375 10 75
## 21 30 22.59091 34.9375 10 75
## 23 30 22.59091 34.9375 10 75
## 24 30 22.59091 34.9375 10 75
## 25 30 22.59091 34.9375 10 75
## 26 30 22.59091 34.9375 10 75
## 28 30 22.59091 34.9375 10 75
## 30 30 22.59091 34.9375 10 75
## 31 30 22.59091 34.9375 10 75
## 32 30 22.59091 34.9375 10 75
## 33 30 22.59091 34.9375 10 75
## 35 30 22.59091 34.9375 10 75
## 37 30 22.59091 34.9375 10 75
## 38 30 22.59091 34.9375 10 75
## 39 30 22.59091 34.9375 10 75
## 40 30 22.59091 34.9375 10 75
##
## [[7]]
## city state
## 1 West Valley City UT
## 2 West Valley City UT
## 3 West Valley City UT
## 4 West Valley City UT
## 5 West Valley City UT
## 6 West Valley City UT
## 7 West Valley City UT
## 8 West Valley City UT
## 9 West Valley City UT
## 10 West Valley City UT
## 11 West Valley City UT
## 12 West Valley City UT
## 13 West Valley City UT
## 14 West Valley City UT
## 15 West Valley City UT
## 16 West Valley City UT
## 17 West Valley City UT
## 18 West Valley City UT
## 19 West Valley City UT
## 20 West Valley City UT
## 21 West Valley City UT
## 22 West Valley City UT
## 23 West Valley City UT
## 24 West Valley City UT
## 25 West Valley City UT
## 26 West Valley City UT
## 27 West Valley City UT
## 28 West Valley City UT
## 29 West Valley City UT
## 30 West Valley City UT
## 31 West Valley City UT
## 32 West Valley City UT
## 33 West Valley City UT
## 34 West Valley City UT
## 35 West Valley City UT
## 36 West Valley City UT
## 37 West Valley City UT
## 38 West Valley City UT
## 39 West Valley City UT
## 40 West Valley City UT
## 41 West Valley City UT
## 42 West Valley City UT
## 43 West Valley City UT
## 44 West Valley City UT
## 45 West Valley City UT
## 46 West Valley City UT
## 47 West Valley City UT
## 48 West Valley City UT
## 49 West Valley City UT
## 50 West Valley City UT
## 51 West Valley City UT
## 52 West Valley City UT
## 53 West Valley City UT
## 54 West Valley City UT
## 55 West Valley City UT
## 56 West Valley City UT
## 57 West Valley City UT
## 58 West Valley City UT
## 59 West Valley City UT
## 60 West Valley City UT
## 61 West Valley City UT
## 62 West Valley City UT
## 63 West Valley City UT
## 64 West Valley City UT
## 65 West Valley City UT
## 66 West Valley City UT
## 67 West Valley City UT
## 68 West Valley City UT
## 69 West Valley City UT
## 70 West Valley City UT
## 71 West Valley City UT
## jobTitle
## 1 License Massage Therapist Wanted!
## 2 Licensed Massage Therapist LMT
## 3 Massage Therapist or Stretch Therapist
## 4 Licensed Massage Therapist (LMT)
## 5 Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Massage Therapist
## 9 Licensed Massage Therapist
## 10 Licensed Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Stretch Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist - Independent Contractor
## 17 Massage Therapist
## 18 Flexologist: Seeking personal trainers, massage therapists,...
## 19 Licensed Massage Therapist
## 20 Massage Therapist
## 21 Licensed Massage Therapist (LMT)
## 22 Massage Therapist at Snowpine Lodge
## 23 Licensed Massage Therapist
## 24 Lead Massage Therapist
## 25 Licensed Massage Therapist
## 26 Massage Therapist - Busiest Spa in Utah
## 27 Licensed Massage Therapist (LMT)
## 28 Hiring Stretch Therapist; "Flexologist"
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist
## 31 Massage Therapist - Independent Contractor
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Flexologist: Seeking personal trainers, massage therapists,...
## 35 Licensed Massage Therapist (LMT)
## 36 Massage Therapist
## 37 Massage Therapist at Snowpine Lodge
## 38 Licensed Massage Therapist
## 39 Lead Massage Therapist
## 40 Licensed Massage Therapist
## 41 Massage Therapist - Busiest Spa in Utah
## 42 Licensed Massage Therapist (LMT)
## 43 Hiring Stretch Therapist; "Flexologist"
## 44 Licensed Massage Therapist
## 45 Licensed Massage Therapist
## 46 Massage Therapist - Independent Contractor
## 47 Massage Therapist
## 48 Licensed Massage Therapist
## 49 Flexologist: Seeking personal trainers, massage therapists,...
## 50 Licensed Massage Therapist (LMT)
## 51 Massage Therapist
## 52 Massage Therapist at Snowpine Lodge
## 53 Licensed Massage Therapist
## 54 Lead Massage Therapist
## 55 Licensed Massage Therapist
## 56 Massage Therapist - Busiest Spa in Utah
## 57 Licensed Massage Therapist (LMT)
## 58 Hiring Stretch Therapist; "Flexologist"
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist
## 61 Massage Therapist - Independent Contractor
## 62 Massage Therapist
## 63 Licensed Massage Therapist
## 64 Flexologist: Seeking personal trainers, massage therapists,...
## 65 Licensed Massage Therapist (LMT)
## 66 Massage Therapist
## 67 Massage Therapist at Snowpine Lodge
## 68 Licensed Massage Therapist
## 69 Lead Massage Therapist
## 70 Licensed Massage Therapist
## 71 Massage Therapist - Busiest Spa in Utah
## HiringAgency
## 1 Axis Chiropractic and Massage ClinicWest Valley City, UT 84119
## 2 Massage Envy SPA - South Jordan3.2South Jordan, UT 84095
## 3 Runa Nordic SpaSalt Lake City, UT 84109
## 4 Return To HarmonyDraper, UT 84020
## 5 AquaVie day spaSalt Lake City, UT 84106
## 6 Soulstice Day Spa & SalonWest Jordan, UT 84084
## 7 Institute of Chiropractic & Acupuncture TherapyWest Jordan, UT 84088
## 8 Belle Medical2.7Draper, UT
## 9 Richelle's Salon and Day SpaHolladay, UT 84117
## 10 Hibiscus Springs SpaSalt Lake City, UT 84111 (Central City area)
## 11 The Massage CenterSalt Lake City, UT 84102 (East Central area)
## 12 The Spa LoungeMurray, UT 84107+1 location
## 13 Iron Mountain ChiropracticHerriman, UT 84096
## 14 Restore HyperwellnessDraper, UT 84020+1 location
## 15 Cameron Wellness Life SpaSugar House, UT
## 16 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 17 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 18 StretchLab Riverton3.8Riverton, UT
## 19 Elements Massage3.6South Jordan, UT 84095
## 20 ZenovateBountiful, UT
## 21 Massage Envy American ForkAmerican Fork, UT 84003
## 22 WTS International3.3Alta, UT 84092
## 23 Spavia Day Spa3.3Sandy, UT 84070
## 24 Hand & Stone - Draper3.0Draper, UT 84020
## 25 Hand and Stone3.0Draper, UT 84020+1 location
## 26 Massage Envy3.2Draper, UT 84020
## 27 Family Chiropractic & WellnessDraper, UT 84020
## 28 StretchLab Fort Union3.8Midvale, UT
## 29 Willow Creek ChiropracticSandy, UT 84093
## 30 PS Lifestyle3.0Salt Lake City, UT
## 31 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 32 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 33 Elements Massage3.6South Jordan, UT 84095
## 34 StretchLab Riverton3.8Riverton, UT
## 35 Massage Envy American ForkAmerican Fork, UT 84003
## 36 ZenovateBountiful, UT
## 37 WTS International3.3Alta, UT 84092
## 38 Spavia Day Spa3.3Sandy, UT 84070
## 39 Hand & Stone - Draper3.0Draper, UT 84020
## 40 Hand and Stone3.0Draper, UT 84020+1 location
## 41 Massage Envy3.2Draper, UT 84020
## 42 Family Chiropractic & WellnessDraper, UT 84020
## 43 StretchLab Fort Union3.8Midvale, UT
## 44 Willow Creek ChiropracticSandy, UT 84093
## 45 PS Lifestyle3.0Salt Lake City, UT
## 46 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 47 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 48 Elements Massage3.6South Jordan, UT 84095
## 49 StretchLab Riverton3.8Riverton, UT
## 50 Massage Envy American ForkAmerican Fork, UT 84003
## 51 ZenovateBountiful, UT
## 52 WTS International3.3Alta, UT 84092
## 53 Spavia Day Spa3.3Sandy, UT 84070
## 54 Hand & Stone - Draper3.0Draper, UT 84020
## 55 Hand and Stone3.0Draper, UT 84020+1 location
## 56 Massage Envy3.2Draper, UT 84020
## 57 Family Chiropractic & WellnessDraper, UT 84020
## 58 StretchLab Fort Union3.8Midvale, UT
## 59 Willow Creek ChiropracticSandy, UT 84093
## 60 PS Lifestyle3.0Salt Lake City, UT
## 61 Indo-Pak Massage TherapySalt Lake City, UT•Remote work available
## 62 Elements3.6Cottonwood Heights, UT 84121+3 locations
## 63 Elements Massage3.6South Jordan, UT 84095
## 64 StretchLab Riverton3.8Riverton, UT
## 65 Massage Envy American ForkAmerican Fork, UT 84003
## 66 ZenovateBountiful, UT
## 67 WTS International3.3Alta, UT 84092
## 68 Spavia Day Spa3.3Sandy, UT 84070
## 69 Hand & Stone - Draper3.0Draper, UT 84020
## 70 Hand and Stone3.0Draper, UT 84020+1 location
## 71 Massage Envy3.2Draper, UT 84020
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 7 10 75 38000 54000
## 2 30 10 75 38000 54000
## 3 30 10 75 38000 54000
## 4 22 10 75 38000 54000
## 5 7 10 75 38000 54000
## 6 30 10 75 38000 54000
## 7 27 10 75 38000 54000
## 8 30 10 75 38000 54000
## 9 13 10 75 38000 54000
## 10 Just posted 10 75 38000 54000
## 11 Just posted 10 75 38000 54000
## 12 1 10 75 38000 54000
## 13 4 10 75 38000 54000
## 14 6 10 75 38000 54000
## 15 30 10 75 38000 54000
## 16 17 10 75 38000 54000
## 17 30 10 75 38000 54000
## 18 30 10 75 38000 54000
## 19 30 10 75 38000 54000
## 20 17 10 75 38000 54000
## 21 3 10 75 38000 54000
## 22 30 10 75 38000 54000
## 23 30 10 75 38000 54000
## 24 28 10 75 38000 54000
## 25 30 10 75 38000 54000
## 26 9 10 75 38000 54000
## 27 30 10 75 38000 54000
## 28 30 10 75 38000 54000
## 29 30 10 75 38000 54000
## 30 30 10 75 38000 54000
## 31 17 10 75 38000 54000
## 32 30 10 75 38000 54000
## 33 30 10 75 38000 54000
## 34 30 10 75 38000 54000
## 35 3 10 75 38000 54000
## 36 17 10 75 38000 54000
## 37 30 10 75 38000 54000
## 38 30 10 75 38000 54000
## 39 28 10 75 38000 54000
## 40 30 10 75 38000 54000
## 41 9 10 75 38000 54000
## 42 30 10 75 38000 54000
## 43 30 10 75 38000 54000
## 44 30 10 75 38000 54000
## 45 30 10 75 38000 54000
## 46 17 10 75 38000 54000
## 47 30 10 75 38000 54000
## 48 30 10 75 38000 54000
## 49 30 10 75 38000 54000
## 50 3 10 75 38000 54000
## 51 17 10 75 38000 54000
## 52 30 10 75 38000 54000
## 53 30 10 75 38000 54000
## 54 28 10 75 38000 54000
## 55 30 10 75 38000 54000
## 56 9 10 75 38000 54000
## 57 30 10 75 38000 54000
## 58 30 10 75 38000 54000
## 59 30 10 75 38000 54000
## 60 30 10 75 38000 54000
## 61 17 10 75 38000 54000
## 62 30 10 75 38000 54000
## 63 30 10 75 38000 54000
## 64 30 10 75 38000 54000
## 65 3 10 75 38000 54000
## 66 17 10 75 38000 54000
## 67 30 10 75 38000 54000
## 68 30 10 75 38000 54000
## 69 28 10 75 38000 54000
## 70 30 10 75 38000 54000
## 71 9 10 75 38000 54000
getIndeedJobData5pages('massage therapist', 'Provo','UT')
## Warning in getIndeedJobData5pages("massage therapist", "Provo", "UT"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Provo", "UT"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Lead Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Licensed Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Stretch Therapist
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist (LMT)
## 13 Massage Therapist
## 14 Massage Therapist
## 15 Licensed Massage Therapist (LMT)
## 16 Massage Therapist
## 17 Massage Therapist
## 18 Licensed Massage Therapist (LMT)
## 19 Massage Therapist
## 20 Massage Therapist at Snowpine Lodge
## 21 Flexologist: Seeking personal trainers, massage therapists,...
## 22 Lead Massage Therapist
## 23 Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist Full Time
## 26 Massage Therapist - Busiest Spa in Utah
## 27 Licensed Massage Therapist
## 28 Lead Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## 31 Lead Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist (LMT)
## 34 Massage Therapist
## 35 Massage Therapist at Snowpine Lodge
## 36 Flexologist: Seeking personal trainers, massage therapists,...
## 37 Lead Massage Therapist
## 38 Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist Full Time
## 41 Massage Therapist - Busiest Spa in Utah
## 42 Licensed Massage Therapist
## 43 Massage Therapist
## 44 Licensed Massage Therapist
## 45 Massage Therapist
## 46 Licensed Massage Therapist
## 47 Licensed Massage Therapist (LMT)
## 48 Stretch Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Licensed Massage Therapist (LMT)
## 52 Massage Therapist
## 53 Lead Massage Therapist
## 54 Massage Therapist at Snowpine Lodge
## 55 Flexologist: Seeking personal trainers, massage therapists,...
## 56 Licensed Massage Therapist
## 57 Massage Therapist
## 58 Massage Therapist Full Time
## 59 Massage Therapist - Busiest Spa in Utah
## 60 Massage Therapist
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist (LMT)
## 63 Stretch Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Licensed Massage Therapist (LMT)
## 67 Massage Therapist
## 68 Lead Massage Therapist
## 69 Massage Therapist at Snowpine Lodge
## 70 Flexologist: Seeking personal trainers, massage therapists,...
## 71 Licensed Massage Therapist
## 72 Massage Therapist
## 73 Massage Therapist Full Time
## 74 Massage Therapist - Busiest Spa in Utah
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$28 - $35 an hour $28 - $35 28.0 35
## 2 \n$40 - $50 an hour $40 - $50 40.0 50
## 3 \n$18 - $20 an hour $18 - $20 18.0 20
## 4 \n$20 - $24 an hour $20 - $24 20.0 24
## 5 \n$19 - $50 an hour $19 - $50 19.0 50
## 6 \n$16 - $24 an hour $16 - $24 16.0 24
## 7 \n$32 - $45 an hour $32 - $45 32.0 45
## 8 \n$22 - $27 an hour $22 - $27 22.0 27
## 9 \n$18.50 an hour $18.50 18.5 NA
## 10 \n$40 - $50 an hour $40 - $50 40.0 50
## 11 \n$18.50 an hour $18.50 18.5 NA
## 12 \n$32 - $45 an hour $32 - $45 32.0 45
## 13 \n$22 - $27 an hour $22 - $27 22.0 27
## 14 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 15 \n$28 - $35 an hour $28 - $35 28.0 35
## 16 \n$40 - $50 an hour $40 - $50 40.0 50
## 17 \n$32 - $45 an hour $32 - $45 32.0 45
## 18 \n$22 - $27 an hour $22 - $27 22.0 27
## 19 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 20 \n$18.50 an hour $18.50 18.5 NA
## 21 \n$28 - $35 an hour $28 - $35 28.0 35
## 22 \n$20 - $24 an hour $20 - $24 20.0 24
## 23 \n$19 - $50 an hour $19 - $50 19.0 50
## 24 \n$16 - $24 an hour $16 - $24 16.0 24
## 25 \n$32 - $45 an hour $32 - $45 32.0 45
## 26 \n$22 - $27 an hour $22 - $27 22.0 27
## 27 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## 28 \n$20 - $24 an hour $20 - $24 20.0 24
## 29 \n$19 - $50 an hour $19 - $50 19.0 50
## 30 \n$16 - $24 an hour $16 - $24 16.0 24
## 31 \n$32 - $45 an hour $32 - $45 32.0 45
## 32 \n$22 - $27 an hour $22 - $27 22.0 27
## 33 \n$25,000 - $35,000 a year $25000 - $35000 25000.0 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22 28 3051.894 3835.579 16
## 2 22 28 3051.894 3835.579 16
## 3 22 28 3051.894 3835.579 16
## 4 22 28 3051.894 3835.579 16
## 5 22 28 3051.894 3835.579 16
## 6 22 28 3051.894 3835.579 16
## 7 22 28 3051.894 3835.579 16
## 8 22 28 3051.894 3835.579 16
## 9 22 28 3051.894 3835.579 16
## 10 22 28 3051.894 3835.579 16
## 11 22 28 3051.894 3835.579 16
## 12 22 28 3051.894 3835.579 16
## 13 22 28 3051.894 3835.579 16
## 14 22 28 3051.894 3835.579 16
## 15 22 28 3051.894 3835.579 16
## 16 22 28 3051.894 3835.579 16
## 17 22 28 3051.894 3835.579 16
## 18 22 28 3051.894 3835.579 16
## 19 22 28 3051.894 3835.579 16
## 20 22 28 3051.894 3835.579 16
## 21 22 28 3051.894 3835.579 16
## 22 22 28 3051.894 3835.579 16
## 23 22 28 3051.894 3835.579 16
## 24 22 28 3051.894 3835.579 16
## 25 22 28 3051.894 3835.579 16
## 26 22 28 3051.894 3835.579 16
## 27 22 28 3051.894 3835.579 16
## 28 22 28 3051.894 3835.579 16
## 29 22 28 3051.894 3835.579 16
## 30 22 28 3051.894 3835.579 16
## 31 22 28 3051.894 3835.579 16
## 32 22 28 3051.894 3835.579 16
## 33 22 28 3051.894 3835.579 16
## maximumMaxSalary
## 1 35000
## 2 35000
## 3 35000
## 4 35000
## 5 35000
## 6 35000
## 7 35000
## 8 35000
## 9 35000
## 10 35000
## 11 35000
## 12 35000
## 13 35000
## 14 35000
## 15 35000
## 16 35000
## 17 35000
## 18 35000
## 19 35000
## 20 35000
## 21 35000
## 22 35000
## 23 35000
## 24 35000
## 25 35000
## 26 35000
## 27 35000
## 28 35000
## 29 35000
## 30 35000
## 31 35000
## 32 35000
## 33 35000
##
## [[3]]
## date_daysAgo
## 1 15
## 2 22
## 3 7
## 4 7
## 5 12
## 6 6
## 7 6
## 8 3
## 9 6
## 10 13
## 11 12
## 12 30
## 13 30
## 14 30
## 15 22
## 16 30
## 17 12
## 18 30
## 19 30
## 20 30
## 21 30
## 22 28
## 23 30
## 24 30
## 25 30
## 26 9
## 27 7
## 28 7
## 29 15
## 30 22
## 31 7
## 32 12
## 33 30
## 34 30
## 35 30
## 36 30
## 37 28
## 38 30
## 39 30
## 40 30
## 41 9
## 42 7
## 43 30
## 44 15
## 45 6
## 46 6
## 47 3
## 48 6
## 49 13
## 50 12
## 51 30
## 52 30
## 53 7
## 54 30
## 55 30
## 56 7
## 57 30
## 58 30
## 59 9
## 60 6
## 61 6
## 62 3
## 63 6
## 64 13
## 65 12
## 66 30
## 67 30
## 68 7
## 69 30
## 70 30
## 71 7
## 72 30
## 73 30
## 74 9
##
## [[4]]
## HiringAgency
## 1 Massage Green Spa - Lehi, UtahLehi, UT 84043
## 2 Return To HarmonyDraper, UT 84020
## 3 Hand and Stone Spa3.0Draper, UT 84020
## 4 Hand and Stone Spa3.0Draper, UT 84020
## 5 Valley Creek SpaProvo, UT 84604 (Riverside area)
## 6 Amara Day Spa Salon & BoutiqueOrem, UT 84057 (Timpview area)
## 7 Maple Ridge Chiropractic & MassageSpringville, UT 84663
## 8 Massage Envy American ForkAmerican Fork, UT 84003
## 9 Restore HyperwellnessDraper, UT 84020
## 10 Shear Indulgence Spa N SalonSpanish Fork, UT 84660
## 11 The Spa LoungeDraper, UT 84020
## 12 Family Chiropractic & WellnessDraper, UT 84020
## 13 Zermatt Resort4.2Midway, UT 84049
## 14 Belle Medical2.7Draper, UT
## 15 Return To HarmonyDraper, UT 84020
## 16 Belle Medical2.7Draper, UT
## 17 The Spa LoungeDraper, UT 84020
## 18 Family Chiropractic & WellnessDraper, UT 84020
## 19 Zermatt Resort4.2Midway, UT 84049
## 20 WTS International3.3Alta, UT 84092
## 21 StretchLab Riverton3.8Riverton, UT
## 22 Hand & Stone - Draper3.0Draper, UT 84020
## 23 Elements3.6Sandy, UT 84070
## 24 Hand and Stone3.0Draper, UT 84020
## 25 Massage Envy3.2American Fork, UT 84003+1 location
## 26 Massage Envy3.2Draper, UT 84020
## 27 Hand and Stone Spa3.0Draper, UT 84020
## 28 Hand and Stone Spa3.0Draper, UT 84020
## 29 Massage Green Spa - Lehi, UtahLehi, UT 84043
## 30 Return To HarmonyDraper, UT 84020
## 31 Hand and Stone Spa3.0Draper, UT 84020
## 32 The Spa LoungeDraper, UT 84020
## 33 Family Chiropractic & WellnessDraper, UT 84020
## 34 Zermatt Resort4.2Midway, UT 84049
## 35 WTS International3.3Alta, UT 84092
## 36 StretchLab Riverton3.8Riverton, UT
## 37 Hand & Stone - Draper3.0Draper, UT 84020
## 38 Elements3.6Sandy, UT 84070
## 39 Hand and Stone3.0Draper, UT 84020
## 40 Massage Envy3.2American Fork, UT 84003+1 location
## 41 Massage Envy3.2Draper, UT 84020
## 42 Hand and Stone Spa3.0Draper, UT 84020
## 43 Belle Medical2.7Draper, UT
## 44 Massage Green Spa - Lehi, UtahLehi, UT 84043
## 45 Amara Day Spa Salon & BoutiqueOrem, UT 84057 (Timpview area)
## 46 Maple Ridge Chiropractic & MassageSpringville, UT 84663
## 47 Massage Envy American ForkAmerican Fork, UT 84003
## 48 Restore HyperwellnessDraper, UT 84020
## 49 Shear Indulgence Spa N SalonSpanish Fork, UT 84660
## 50 The Spa LoungeDraper, UT 84020
## 51 Family Chiropractic & WellnessDraper, UT 84020
## 52 Zermatt Resort4.2Midway, UT 84049
## 53 Hand and Stone Spa3.0Draper, UT 84020
## 54 WTS International3.3Alta, UT 84092
## 55 StretchLab Riverton3.8Riverton, UT
## 56 Hand and Stone Spa3.0Draper, UT 84020
## 57 Elements3.6Sandy, UT 84070
## 58 Massage Envy3.2American Fork, UT 84003+1 location
## 59 Massage Envy3.2Draper, UT 84020
## 60 Amara Day Spa Salon & BoutiqueOrem, UT 84057 (Timpview area)
## 61 Maple Ridge Chiropractic & MassageSpringville, UT 84663
## 62 Massage Envy American ForkAmerican Fork, UT 84003
## 63 Restore HyperwellnessDraper, UT 84020
## 64 Shear Indulgence Spa N SalonSpanish Fork, UT 84660
## 65 The Spa LoungeDraper, UT 84020
## 66 Family Chiropractic & WellnessDraper, UT 84020
## 67 Zermatt Resort4.2Midway, UT 84049
## 68 Hand and Stone Spa3.0Draper, UT 84020
## 69 WTS International3.3Alta, UT 84092
## 70 StretchLab Riverton3.8Riverton, UT
## 71 Hand and Stone Spa3.0Draper, UT 84020
## 72 Elements3.6Sandy, UT 84070
## 73 Massage Envy3.2American Fork, UT 84003+1 location
## 74 Massage Envy3.2Draper, UT 84020
##
## [[5]]
## Salary salary minSalary maxSalary
## 14 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 19 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 27 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## 33 \n$25,000 - $35,000 a year $25000 - $35000 25000 35000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 14 25000 35000 25000 35000 25000
## 19 25000 35000 25000 35000 25000
## 27 25000 35000 25000 35000 25000
## 33 25000 35000 25000 35000 25000
## maximumMaxSalary
## 14 35000
## 19 35000
## 27 35000
## 33 35000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$28 - $35 an hour $28 - $35 28.0 35 22
## 2 \n$40 - $50 an hour $40 - $50 40.0 50 22
## 3 \n$18 - $20 an hour $18 - $20 18.0 20 22
## 4 \n$20 - $24 an hour $20 - $24 20.0 24 22
## 5 \n$19 - $50 an hour $19 - $50 19.0 50 22
## 6 \n$16 - $24 an hour $16 - $24 16.0 24 22
## 7 \n$32 - $45 an hour $32 - $45 32.0 45 22
## 8 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 9 \n$18.50 an hour $18.50 18.5 NA 22
## 10 \n$40 - $50 an hour $40 - $50 40.0 50 22
## 11 \n$18.50 an hour $18.50 18.5 NA 22
## 12 \n$32 - $45 an hour $32 - $45 32.0 45 22
## 13 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 15 \n$28 - $35 an hour $28 - $35 28.0 35 22
## 16 \n$40 - $50 an hour $40 - $50 40.0 50 22
## 17 \n$32 - $45 an hour $32 - $45 32.0 45 22
## 18 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 20 \n$18.50 an hour $18.50 18.5 NA 22
## 21 \n$28 - $35 an hour $28 - $35 28.0 35 22
## 22 \n$20 - $24 an hour $20 - $24 20.0 24 22
## 23 \n$19 - $50 an hour $19 - $50 19.0 50 22
## 24 \n$16 - $24 an hour $16 - $24 16.0 24 22
## 25 \n$32 - $45 an hour $32 - $45 32.0 45 22
## 26 \n$22 - $27 an hour $22 - $27 22.0 27 22
## 28 \n$20 - $24 an hour $20 - $24 20.0 24 22
## 29 \n$19 - $50 an hour $19 - $50 19.0 50 22
## 30 \n$16 - $24 an hour $16 - $24 16.0 24 22
## 31 \n$32 - $45 an hour $32 - $45 32.0 45 22
## 32 \n$22 - $27 an hour $22 - $27 22.0 27 22
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 35 24.56897 35.73077 16 50
## 2 35 24.56897 35.73077 16 50
## 3 35 24.56897 35.73077 16 50
## 4 35 24.56897 35.73077 16 50
## 5 35 24.56897 35.73077 16 50
## 6 35 24.56897 35.73077 16 50
## 7 35 24.56897 35.73077 16 50
## 8 35 24.56897 35.73077 16 50
## 9 35 24.56897 35.73077 16 50
## 10 35 24.56897 35.73077 16 50
## 11 35 24.56897 35.73077 16 50
## 12 35 24.56897 35.73077 16 50
## 13 35 24.56897 35.73077 16 50
## 15 35 24.56897 35.73077 16 50
## 16 35 24.56897 35.73077 16 50
## 17 35 24.56897 35.73077 16 50
## 18 35 24.56897 35.73077 16 50
## 20 35 24.56897 35.73077 16 50
## 21 35 24.56897 35.73077 16 50
## 22 35 24.56897 35.73077 16 50
## 23 35 24.56897 35.73077 16 50
## 24 35 24.56897 35.73077 16 50
## 25 35 24.56897 35.73077 16 50
## 26 35 24.56897 35.73077 16 50
## 28 35 24.56897 35.73077 16 50
## 29 35 24.56897 35.73077 16 50
## 30 35 24.56897 35.73077 16 50
## 31 35 24.56897 35.73077 16 50
## 32 35 24.56897 35.73077 16 50
##
## [[7]]
## city state jobTitle
## 1 Provo UT Licensed Massage Therapist
## 2 Provo UT Licensed Massage Therapist (LMT)
## 3 Provo UT Lead Massage Therapist
## 4 Provo UT Licensed Massage Therapist
## 5 Provo UT Licensed Massage Therapist
## 6 Provo UT Massage Therapist
## 7 Provo UT Licensed Massage Therapist
## 8 Provo UT Licensed Massage Therapist (LMT)
## 9 Provo UT Stretch Therapist
## 10 Provo UT Licensed Massage Therapist
## 11 Provo UT Massage Therapist
## 12 Provo UT Licensed Massage Therapist (LMT)
## 13 Provo UT Massage Therapist
## 14 Provo UT Massage Therapist
## 15 Provo UT Licensed Massage Therapist (LMT)
## 16 Provo UT Massage Therapist
## 17 Provo UT Massage Therapist
## 18 Provo UT Licensed Massage Therapist (LMT)
## 19 Provo UT Massage Therapist
## 20 Provo UT Massage Therapist at Snowpine Lodge
## 21 Provo UT Flexologist: Seeking personal trainers, massage therapists,...
## 22 Provo UT Lead Massage Therapist
## 23 Provo UT Massage Therapist
## 24 Provo UT Licensed Massage Therapist
## 25 Provo UT Massage Therapist Full Time
## 26 Provo UT Massage Therapist - Busiest Spa in Utah
## 27 Provo UT Licensed Massage Therapist
## 28 Provo UT Lead Massage Therapist
## 29 Provo UT Licensed Massage Therapist
## 30 Provo UT Licensed Massage Therapist (LMT)
## 31 Provo UT Lead Massage Therapist
## 32 Provo UT Massage Therapist
## 33 Provo UT Licensed Massage Therapist (LMT)
## 34 Provo UT Massage Therapist
## 35 Provo UT Massage Therapist at Snowpine Lodge
## 36 Provo UT Flexologist: Seeking personal trainers, massage therapists,...
## 37 Provo UT Lead Massage Therapist
## 38 Provo UT Massage Therapist
## 39 Provo UT Licensed Massage Therapist
## 40 Provo UT Massage Therapist Full Time
## 41 Provo UT Massage Therapist - Busiest Spa in Utah
## 42 Provo UT Licensed Massage Therapist
## 43 Provo UT Massage Therapist
## 44 Provo UT Licensed Massage Therapist
## 45 Provo UT Massage Therapist
## 46 Provo UT Licensed Massage Therapist
## 47 Provo UT Licensed Massage Therapist (LMT)
## 48 Provo UT Stretch Therapist
## 49 Provo UT Licensed Massage Therapist
## 50 Provo UT Massage Therapist
## 51 Provo UT Licensed Massage Therapist (LMT)
## 52 Provo UT Massage Therapist
## 53 Provo UT Lead Massage Therapist
## 54 Provo UT Massage Therapist at Snowpine Lodge
## 55 Provo UT Flexologist: Seeking personal trainers, massage therapists,...
## 56 Provo UT Licensed Massage Therapist
## 57 Provo UT Massage Therapist
## 58 Provo UT Massage Therapist Full Time
## 59 Provo UT Massage Therapist - Busiest Spa in Utah
## 60 Provo UT Massage Therapist
## 61 Provo UT Licensed Massage Therapist
## 62 Provo UT Licensed Massage Therapist (LMT)
## 63 Provo UT Stretch Therapist
## 64 Provo UT Licensed Massage Therapist
## 65 Provo UT Massage Therapist
## 66 Provo UT Licensed Massage Therapist (LMT)
## 67 Provo UT Massage Therapist
## 68 Provo UT Lead Massage Therapist
## 69 Provo UT Massage Therapist at Snowpine Lodge
## 70 Provo UT Flexologist: Seeking personal trainers, massage therapists,...
## 71 Provo UT Licensed Massage Therapist
## 72 Provo UT Massage Therapist
## 73 Provo UT Massage Therapist Full Time
## 74 Provo UT Massage Therapist - Busiest Spa in Utah
## HiringAgency date_daysAgo
## 1 Massage Green Spa - Lehi, UtahLehi, UT 84043 15
## 2 Return To HarmonyDraper, UT 84020 22
## 3 Hand and Stone Spa3.0Draper, UT 84020 7
## 4 Hand and Stone Spa3.0Draper, UT 84020 7
## 5 Valley Creek SpaProvo, UT 84604 (Riverside area) 12
## 6 Amara Day Spa Salon & BoutiqueOrem, UT 84057 (Timpview area) 6
## 7 Maple Ridge Chiropractic & MassageSpringville, UT 84663 6
## 8 Massage Envy American ForkAmerican Fork, UT 84003 3
## 9 Restore HyperwellnessDraper, UT 84020 6
## 10 Shear Indulgence Spa N SalonSpanish Fork, UT 84660 13
## 11 The Spa LoungeDraper, UT 84020 12
## 12 Family Chiropractic & WellnessDraper, UT 84020 30
## 13 Zermatt Resort4.2Midway, UT 84049 30
## 14 Belle Medical2.7Draper, UT 30
## 15 Return To HarmonyDraper, UT 84020 22
## 16 Belle Medical2.7Draper, UT 30
## 17 The Spa LoungeDraper, UT 84020 12
## 18 Family Chiropractic & WellnessDraper, UT 84020 30
## 19 Zermatt Resort4.2Midway, UT 84049 30
## 20 WTS International3.3Alta, UT 84092 30
## 21 StretchLab Riverton3.8Riverton, UT 30
## 22 Hand & Stone - Draper3.0Draper, UT 84020 28
## 23 Elements3.6Sandy, UT 84070 30
## 24 Hand and Stone3.0Draper, UT 84020 30
## 25 Massage Envy3.2American Fork, UT 84003+1 location 30
## 26 Massage Envy3.2Draper, UT 84020 9
## 27 Hand and Stone Spa3.0Draper, UT 84020 7
## 28 Hand and Stone Spa3.0Draper, UT 84020 7
## 29 Massage Green Spa - Lehi, UtahLehi, UT 84043 15
## 30 Return To HarmonyDraper, UT 84020 22
## 31 Hand and Stone Spa3.0Draper, UT 84020 7
## 32 The Spa LoungeDraper, UT 84020 12
## 33 Family Chiropractic & WellnessDraper, UT 84020 30
## 34 Zermatt Resort4.2Midway, UT 84049 30
## 35 WTS International3.3Alta, UT 84092 30
## 36 StretchLab Riverton3.8Riverton, UT 30
## 37 Hand & Stone - Draper3.0Draper, UT 84020 28
## 38 Elements3.6Sandy, UT 84070 30
## 39 Hand and Stone3.0Draper, UT 84020 30
## 40 Massage Envy3.2American Fork, UT 84003+1 location 30
## 41 Massage Envy3.2Draper, UT 84020 9
## 42 Hand and Stone Spa3.0Draper, UT 84020 7
## 43 Belle Medical2.7Draper, UT 30
## 44 Massage Green Spa - Lehi, UtahLehi, UT 84043 15
## 45 Amara Day Spa Salon & BoutiqueOrem, UT 84057 (Timpview area) 6
## 46 Maple Ridge Chiropractic & MassageSpringville, UT 84663 6
## 47 Massage Envy American ForkAmerican Fork, UT 84003 3
## 48 Restore HyperwellnessDraper, UT 84020 6
## 49 Shear Indulgence Spa N SalonSpanish Fork, UT 84660 13
## 50 The Spa LoungeDraper, UT 84020 12
## 51 Family Chiropractic & WellnessDraper, UT 84020 30
## 52 Zermatt Resort4.2Midway, UT 84049 30
## 53 Hand and Stone Spa3.0Draper, UT 84020 7
## 54 WTS International3.3Alta, UT 84092 30
## 55 StretchLab Riverton3.8Riverton, UT 30
## 56 Hand and Stone Spa3.0Draper, UT 84020 7
## 57 Elements3.6Sandy, UT 84070 30
## 58 Massage Envy3.2American Fork, UT 84003+1 location 30
## 59 Massage Envy3.2Draper, UT 84020 9
## 60 Amara Day Spa Salon & BoutiqueOrem, UT 84057 (Timpview area) 6
## 61 Maple Ridge Chiropractic & MassageSpringville, UT 84663 6
## 62 Massage Envy American ForkAmerican Fork, UT 84003 3
## 63 Restore HyperwellnessDraper, UT 84020 6
## 64 Shear Indulgence Spa N SalonSpanish Fork, UT 84660 13
## 65 The Spa LoungeDraper, UT 84020 12
## 66 Family Chiropractic & WellnessDraper, UT 84020 30
## 67 Zermatt Resort4.2Midway, UT 84049 30
## 68 Hand and Stone Spa3.0Draper, UT 84020 7
## 69 WTS International3.3Alta, UT 84092 30
## 70 StretchLab Riverton3.8Riverton, UT 30
## 71 Hand and Stone Spa3.0Draper, UT 84020 7
## 72 Elements3.6Sandy, UT 84070 30
## 73 Massage Envy3.2American Fork, UT 84003+1 location 30
## 74 Massage Envy3.2Draper, UT 84020 9
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 16 50 25000 35000
## 2 16 50 25000 35000
## 3 16 50 25000 35000
## 4 16 50 25000 35000
## 5 16 50 25000 35000
## 6 16 50 25000 35000
## 7 16 50 25000 35000
## 8 16 50 25000 35000
## 9 16 50 25000 35000
## 10 16 50 25000 35000
## 11 16 50 25000 35000
## 12 16 50 25000 35000
## 13 16 50 25000 35000
## 14 16 50 25000 35000
## 15 16 50 25000 35000
## 16 16 50 25000 35000
## 17 16 50 25000 35000
## 18 16 50 25000 35000
## 19 16 50 25000 35000
## 20 16 50 25000 35000
## 21 16 50 25000 35000
## 22 16 50 25000 35000
## 23 16 50 25000 35000
## 24 16 50 25000 35000
## 25 16 50 25000 35000
## 26 16 50 25000 35000
## 27 16 50 25000 35000
## 28 16 50 25000 35000
## 29 16 50 25000 35000
## 30 16 50 25000 35000
## 31 16 50 25000 35000
## 32 16 50 25000 35000
## 33 16 50 25000 35000
## 34 16 50 25000 35000
## 35 16 50 25000 35000
## 36 16 50 25000 35000
## 37 16 50 25000 35000
## 38 16 50 25000 35000
## 39 16 50 25000 35000
## 40 16 50 25000 35000
## 41 16 50 25000 35000
## 42 16 50 25000 35000
## 43 16 50 25000 35000
## 44 16 50 25000 35000
## 45 16 50 25000 35000
## 46 16 50 25000 35000
## 47 16 50 25000 35000
## 48 16 50 25000 35000
## 49 16 50 25000 35000
## 50 16 50 25000 35000
## 51 16 50 25000 35000
## 52 16 50 25000 35000
## 53 16 50 25000 35000
## 54 16 50 25000 35000
## 55 16 50 25000 35000
## 56 16 50 25000 35000
## 57 16 50 25000 35000
## 58 16 50 25000 35000
## 59 16 50 25000 35000
## 60 16 50 25000 35000
## 61 16 50 25000 35000
## 62 16 50 25000 35000
## 63 16 50 25000 35000
## 64 16 50 25000 35000
## 65 16 50 25000 35000
## 66 16 50 25000 35000
## 67 16 50 25000 35000
## 68 16 50 25000 35000
## 69 16 50 25000 35000
## 70 16 50 25000 35000
## 71 16 50 25000 35000
## 72 16 50 25000 35000
## 73 16 50 25000 35000
## 74 16 50 25000 35000
Vermont Burlington, South Burlington, Rutland
getIndeedJobData5pages('massage therapist', 'Burlington','VT')
## [[1]]
## jobTitle
## 1 Massage Therapist/Chiropractic Assistant
## 2 Massage Therapist - Independent Contractor
## 3 Massage Therapist (Resort Spa)
## 4 Massage Therapist - Full Time
## 5 Licensed Massage Therapist
## 6 MASSAGE THERAPIST - FULL OR PART TIME
## 7 Massage Therapist/Chiropractic Assistant
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist (Resort Spa)
## 10 Massage Therapist - Full Time
## 11 Licensed Massage Therapist
## 12 MASSAGE THERAPIST - FULL OR PART TIME
## 13 Massage Therapist/Chiropractic Assistant
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist (Resort Spa)
## 16 Massage Therapist - Full Time
## 17 Licensed Massage Therapist
## 18 MASSAGE THERAPIST - FULL OR PART TIME
## 19 Massage Therapist/Chiropractic Assistant
## 20 Massage Therapist - Independent Contractor
## 21 Massage Therapist (Resort Spa)
## 22 Massage Therapist - Full Time
## 23 Licensed Massage Therapist
## 24 MASSAGE THERAPIST - FULL OR PART TIME
## 25 Massage Therapist/Chiropractic Assistant
## 26 Massage Therapist - Independent Contractor
## 27 Massage Therapist (Resort Spa)
## 28 Massage Therapist - Full Time
## 29 Licensed Massage Therapist
## 30 MASSAGE THERAPIST - FULL OR PART TIME
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$13 - $17 an hour $13 - $17 13 17
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$23 - $28 an hour $23 - $28 23 28
## 4 \n$13 - $17 an hour $13 - $17 13 17
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$23 - $28 an hour $23 - $28 23 28
## 7 \n$13 - $17 an hour $13 - $17 13 17
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$23 - $28 an hour $23 - $28 23 28
## 10 \n$13 - $17 an hour $13 - $17 13 17
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$23 - $28 an hour $23 - $28 23 28
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 23 25.5 1678.667 2846.833 13
## 2 23 25.5 1678.667 2846.833 13
## 3 23 25.5 1678.667 2846.833 13
## 4 23 25.5 1678.667 2846.833 13
## 5 23 25.5 1678.667 2846.833 13
## 6 23 25.5 1678.667 2846.833 13
## 7 23 25.5 1678.667 2846.833 13
## 8 23 25.5 1678.667 2846.833 13
## 9 23 25.5 1678.667 2846.833 13
## 10 23 25.5 1678.667 2846.833 13
## 11 23 25.5 1678.667 2846.833 13
## 12 23 25.5 1678.667 2846.833 13
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
##
## [[3]]
## date_daysAgo
## 1 9
## 2 17
## 3 30
## 4 27
## 5 12
## 6 30
## 7 9
## 8 17
## 9 30
## 10 27
## 11 12
## 12 30
## 13 9
## 14 17
## 15 30
## 16 27
## 17 12
## 18 30
## 19 9
## 20 17
## 21 30
## 22 27
## 23 12
## 24 30
## 25 9
## 26 17
## 27 30
## 28 27
## 29 12
## 30 30
##
## [[4]]
## HiringAgency
## 1 Onion River ChiropracticWinooski, VT 05404
## 2 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 3 Benchmark Hospitality3.8Essex, VT
## 4 Massage Envy3.2Williston, VT 05495
## 5 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 6 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 7 Onion River ChiropracticWinooski, VT 05404
## 8 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 9 Benchmark Hospitality3.8Essex, VT
## 10 Massage Envy3.2Williston, VT 05495
## 11 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 12 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 13 Onion River ChiropracticWinooski, VT 05404
## 14 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 15 Benchmark Hospitality3.8Essex, VT
## 16 Massage Envy3.2Williston, VT 05495
## 17 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 18 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 19 Onion River ChiropracticWinooski, VT 05404
## 20 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 21 Benchmark Hospitality3.8Essex, VT
## 22 Massage Envy3.2Williston, VT 05495
## 23 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 24 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 25 Onion River ChiropracticWinooski, VT 05404
## 26 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 27 Benchmark Hospitality3.8Essex, VT
## 28 Massage Envy3.2Williston, VT 05495
## 29 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 30 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$13 - $17 an hour $13 - $17 13 17 18
## 3 \n$23 - $28 an hour $23 - $28 23 28 18
## 4 \n$13 - $17 an hour $13 - $17 13 17 18
## 6 \n$23 - $28 an hour $23 - $28 23 28 18
## 7 \n$13 - $17 an hour $13 - $17 13 17 18
## 9 \n$23 - $28 an hour $23 - $28 23 28 18
## 10 \n$13 - $17 an hour $13 - $17 13 17 18
## 12 \n$23 - $28 an hour $23 - $28 23 28 18
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 22.5 18 22.5 13 28
## 3 22.5 18 22.5 13 28
## 4 22.5 18 22.5 13 28
## 6 22.5 18 22.5 13 28
## 7 22.5 18 22.5 13 28
## 9 22.5 18 22.5 13 28
## 10 22.5 18 22.5 13 28
## 12 22.5 18 22.5 13 28
##
## [[7]]
## city state jobTitle
## 1 Burlington VT Massage Therapist/Chiropractic Assistant
## 2 Burlington VT Massage Therapist - Independent Contractor
## 3 Burlington VT Massage Therapist (Resort Spa)
## 4 Burlington VT Massage Therapist - Full Time
## 5 Burlington VT Licensed Massage Therapist
## 6 Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 7 Burlington VT Massage Therapist/Chiropractic Assistant
## 8 Burlington VT Massage Therapist - Independent Contractor
## 9 Burlington VT Massage Therapist (Resort Spa)
## 10 Burlington VT Massage Therapist - Full Time
## 11 Burlington VT Licensed Massage Therapist
## 12 Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 13 Burlington VT Massage Therapist/Chiropractic Assistant
## 14 Burlington VT Massage Therapist - Independent Contractor
## 15 Burlington VT Massage Therapist (Resort Spa)
## 16 Burlington VT Massage Therapist - Full Time
## 17 Burlington VT Licensed Massage Therapist
## 18 Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 19 Burlington VT Massage Therapist/Chiropractic Assistant
## 20 Burlington VT Massage Therapist - Independent Contractor
## 21 Burlington VT Massage Therapist (Resort Spa)
## 22 Burlington VT Massage Therapist - Full Time
## 23 Burlington VT Licensed Massage Therapist
## 24 Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 25 Burlington VT Massage Therapist/Chiropractic Assistant
## 26 Burlington VT Massage Therapist - Independent Contractor
## 27 Burlington VT Massage Therapist (Resort Spa)
## 28 Burlington VT Massage Therapist - Full Time
## 29 Burlington VT Licensed Massage Therapist
## 30 Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## HiringAgency date_daysAgo
## 1 Onion River ChiropracticWinooski, VT 05404 9
## 2 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 3 Benchmark Hospitality3.8Essex, VT 30
## 4 Massage Envy3.2Williston, VT 05495 27
## 5 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 6 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 7 Onion River ChiropracticWinooski, VT 05404 9
## 8 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 9 Benchmark Hospitality3.8Essex, VT 30
## 10 Massage Envy3.2Williston, VT 05495 27
## 11 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 12 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 13 Onion River ChiropracticWinooski, VT 05404 9
## 14 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 15 Benchmark Hospitality3.8Essex, VT 30
## 16 Massage Envy3.2Williston, VT 05495 27
## 17 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 18 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 19 Onion River ChiropracticWinooski, VT 05404 9
## 20 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 21 Benchmark Hospitality3.8Essex, VT 30
## 22 Massage Envy3.2Williston, VT 05495 27
## 23 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 24 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 25 Onion River ChiropracticWinooski, VT 05404 9
## 26 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 27 Benchmark Hospitality3.8Essex, VT 30
## 28 Massage Envy3.2Williston, VT 05495 27
## 29 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 30 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 13 28 NA NA
## 2 13 28 NA NA
## 3 13 28 NA NA
## 4 13 28 NA NA
## 5 13 28 NA NA
## 6 13 28 NA NA
## 7 13 28 NA NA
## 8 13 28 NA NA
## 9 13 28 NA NA
## 10 13 28 NA NA
## 11 13 28 NA NA
## 12 13 28 NA NA
## 13 13 28 NA NA
## 14 13 28 NA NA
## 15 13 28 NA NA
## 16 13 28 NA NA
## 17 13 28 NA NA
## 18 13 28 NA NA
## 19 13 28 NA NA
## 20 13 28 NA NA
## 21 13 28 NA NA
## 22 13 28 NA NA
## 23 13 28 NA NA
## 24 13 28 NA NA
## 25 13 28 NA NA
## 26 13 28 NA NA
## 27 13 28 NA NA
## 28 13 28 NA NA
## 29 13 28 NA NA
## 30 13 28 NA NA
getIndeedJobData5pages('massage therapist', 'South Burlington','VT')
## [[1]]
## jobTitle
## 1 Massage Therapist/Chiropractic Assistant
## 2 Massage Therapist - Independent Contractor
## 3 Massage Therapist (Resort Spa)
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Full Time
## 6 MASSAGE THERAPIST - FULL OR PART TIME
## 7 Massage Therapist/Chiropractic Assistant
## 8 Massage Therapist - Independent Contractor
## 9 Massage Therapist (Resort Spa)
## 10 Licensed Massage Therapist
## 11 Massage Therapist - Full Time
## 12 MASSAGE THERAPIST - FULL OR PART TIME
## 13 Massage Therapist/Chiropractic Assistant
## 14 Massage Therapist - Independent Contractor
## 15 Massage Therapist (Resort Spa)
## 16 Licensed Massage Therapist
## 17 Massage Therapist - Full Time
## 18 MASSAGE THERAPIST - FULL OR PART TIME
## 19 Massage Therapist/Chiropractic Assistant
## 20 Massage Therapist - Independent Contractor
## 21 Massage Therapist (Resort Spa)
## 22 Licensed Massage Therapist
## 23 Massage Therapist - Full Time
## 24 MASSAGE THERAPIST - FULL OR PART TIME
## 25 Massage Therapist/Chiropractic Assistant
## 26 Massage Therapist - Independent Contractor
## 27 Massage Therapist (Resort Spa)
## 28 Licensed Massage Therapist
## 29 Massage Therapist - Full Time
## 30 MASSAGE THERAPIST - FULL OR PART TIME
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$13 - $17 an hour $13 - $17 13 17
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 3 \n$23 - $28 an hour $23 - $28 23 28
## 4 \n$13 - $17 an hour $13 - $17 13 17
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \n$23 - $28 an hour $23 - $28 23 28
## 7 \n$13 - $17 an hour $13 - $17 13 17
## 8 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 9 \n$23 - $28 an hour $23 - $28 23 28
## 10 \n$13 - $17 an hour $13 - $17 13 17
## 11 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 12 \n$23 - $28 an hour $23 - $28 23 28
## 13 \n$13 - $17 an hour $13 - $17 13 17
## 14 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 15 \n$23 - $28 an hour $23 - $28 23 28
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 23 25.5 1678.667 2846.833 13
## 2 23 25.5 1678.667 2846.833 13
## 3 23 25.5 1678.667 2846.833 13
## 4 23 25.5 1678.667 2846.833 13
## 5 23 25.5 1678.667 2846.833 13
## 6 23 25.5 1678.667 2846.833 13
## 7 23 25.5 1678.667 2846.833 13
## 8 23 25.5 1678.667 2846.833 13
## 9 23 25.5 1678.667 2846.833 13
## 10 23 25.5 1678.667 2846.833 13
## 11 23 25.5 1678.667 2846.833 13
## 12 23 25.5 1678.667 2846.833 13
## 13 23 25.5 1678.667 2846.833 13
## 14 23 25.5 1678.667 2846.833 13
## 15 23 25.5 1678.667 2846.833 13
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
##
## [[3]]
## date_daysAgo
## 1 9
## 2 17
## 3 30
## 4 12
## 5 27
## 6 30
## 7 9
## 8 17
## 9 30
## 10 12
## 11 27
## 12 30
## 13 9
## 14 17
## 15 30
## 16 12
## 17 27
## 18 30
## 19 9
## 20 17
## 21 30
## 22 12
## 23 27
## 24 30
## 25 9
## 26 17
## 27 30
## 28 12
## 29 27
## 30 30
##
## [[4]]
## HiringAgency
## 1 Onion River ChiropracticWinooski, VT 05404
## 2 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 3 Benchmark Hospitality3.8Essex, VT
## 4 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 5 Massage Envy3.2Williston, VT 05495
## 6 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 7 Onion River ChiropracticWinooski, VT 05404
## 8 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 9 Benchmark Hospitality3.8Essex, VT
## 10 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 11 Massage Envy3.2Williston, VT 05495
## 12 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 13 Onion River ChiropracticWinooski, VT 05404
## 14 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 15 Benchmark Hospitality3.8Essex, VT
## 16 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 17 Massage Envy3.2Williston, VT 05495
## 18 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 19 Onion River ChiropracticWinooski, VT 05404
## 20 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 21 Benchmark Hospitality3.8Essex, VT
## 22 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 23 Massage Envy3.2Williston, VT 05495
## 24 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
## 25 Onion River ChiropracticWinooski, VT 05404
## 26 Indo-Pak Massage TherapyBurlington, VT•Remote work available
## 27 Benchmark Hospitality3.8Essex, VT
## 28 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672
## 29 Massage Envy3.2Williston, VT 05495
## 30 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$13 - $17 an hour $13 - $17 13 17 18
## 3 \n$23 - $28 an hour $23 - $28 23 28 18
## 4 \n$13 - $17 an hour $13 - $17 13 17 18
## 6 \n$23 - $28 an hour $23 - $28 23 28 18
## 7 \n$13 - $17 an hour $13 - $17 13 17 18
## 9 \n$23 - $28 an hour $23 - $28 23 28 18
## 10 \n$13 - $17 an hour $13 - $17 13 17 18
## 12 \n$23 - $28 an hour $23 - $28 23 28 18
## 13 \n$13 - $17 an hour $13 - $17 13 17 18
## 15 \n$23 - $28 an hour $23 - $28 23 28 18
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 22.5 18 22.5 13 28
## 3 22.5 18 22.5 13 28
## 4 22.5 18 22.5 13 28
## 6 22.5 18 22.5 13 28
## 7 22.5 18 22.5 13 28
## 9 22.5 18 22.5 13 28
## 10 22.5 18 22.5 13 28
## 12 22.5 18 22.5 13 28
## 13 22.5 18 22.5 13 28
## 15 22.5 18 22.5 13 28
##
## [[7]]
## city state jobTitle
## 1 South Burlington VT Massage Therapist/Chiropractic Assistant
## 2 South Burlington VT Massage Therapist - Independent Contractor
## 3 South Burlington VT Massage Therapist (Resort Spa)
## 4 South Burlington VT Licensed Massage Therapist
## 5 South Burlington VT Massage Therapist - Full Time
## 6 South Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 7 South Burlington VT Massage Therapist/Chiropractic Assistant
## 8 South Burlington VT Massage Therapist - Independent Contractor
## 9 South Burlington VT Massage Therapist (Resort Spa)
## 10 South Burlington VT Licensed Massage Therapist
## 11 South Burlington VT Massage Therapist - Full Time
## 12 South Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 13 South Burlington VT Massage Therapist/Chiropractic Assistant
## 14 South Burlington VT Massage Therapist - Independent Contractor
## 15 South Burlington VT Massage Therapist (Resort Spa)
## 16 South Burlington VT Licensed Massage Therapist
## 17 South Burlington VT Massage Therapist - Full Time
## 18 South Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 19 South Burlington VT Massage Therapist/Chiropractic Assistant
## 20 South Burlington VT Massage Therapist - Independent Contractor
## 21 South Burlington VT Massage Therapist (Resort Spa)
## 22 South Burlington VT Licensed Massage Therapist
## 23 South Burlington VT Massage Therapist - Full Time
## 24 South Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## 25 South Burlington VT Massage Therapist/Chiropractic Assistant
## 26 South Burlington VT Massage Therapist - Independent Contractor
## 27 South Burlington VT Massage Therapist (Resort Spa)
## 28 South Burlington VT Licensed Massage Therapist
## 29 South Burlington VT Massage Therapist - Full Time
## 30 South Burlington VT MASSAGE THERAPIST - FULL OR PART TIME
## HiringAgency date_daysAgo
## 1 Onion River ChiropracticWinooski, VT 05404 9
## 2 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 3 Benchmark Hospitality3.8Essex, VT 30
## 4 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 5 Massage Envy3.2Williston, VT 05495 27
## 6 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 7 Onion River ChiropracticWinooski, VT 05404 9
## 8 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 9 Benchmark Hospitality3.8Essex, VT 30
## 10 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 11 Massage Envy3.2Williston, VT 05495 27
## 12 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 13 Onion River ChiropracticWinooski, VT 05404 9
## 14 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 15 Benchmark Hospitality3.8Essex, VT 30
## 16 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 17 Massage Envy3.2Williston, VT 05495 27
## 18 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 19 Onion River ChiropracticWinooski, VT 05404 9
## 20 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 21 Benchmark Hospitality3.8Essex, VT 30
## 22 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 23 Massage Envy3.2Williston, VT 05495 27
## 24 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## 25 Onion River ChiropracticWinooski, VT 05404 9
## 26 Indo-Pak Massage TherapyBurlington, VT•Remote work available 17
## 27 Benchmark Hospitality3.8Essex, VT 30
## 28 Stoweflake Mountain Resort & Spa3.2Stowe, VT 05672 12
## 29 Massage Envy3.2Williston, VT 05495 27
## 30 Stoweflake Mountain Resort and Spa3.2Stowe, VT 05672 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 13 28 NA NA
## 2 13 28 NA NA
## 3 13 28 NA NA
## 4 13 28 NA NA
## 5 13 28 NA NA
## 6 13 28 NA NA
## 7 13 28 NA NA
## 8 13 28 NA NA
## 9 13 28 NA NA
## 10 13 28 NA NA
## 11 13 28 NA NA
## 12 13 28 NA NA
## 13 13 28 NA NA
## 14 13 28 NA NA
## 15 13 28 NA NA
## 16 13 28 NA NA
## 17 13 28 NA NA
## 18 13 28 NA NA
## 19 13 28 NA NA
## 20 13 28 NA NA
## 21 13 28 NA NA
## 22 13 28 NA NA
## 23 13 28 NA NA
## 24 13 28 NA NA
## 25 13 28 NA NA
## 26 13 28 NA NA
## 27 13 28 NA NA
## 28 13 28 NA NA
## 29 13 28 NA NA
## 30 13 28 NA NA
getIndeedJobData5pages('massage therapist', 'Rutland','VT')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$24 - $29 an hour $24 - $29 24 29 24
## 2 \n$24 - $29 an hour $24 - $29 24 29 24
## 3 \n$24 - $29 an hour $24 - $29 24 29 24
## 4 \n$24 - $29 an hour $24 - $29 24 29 24
## 5 \n$24 - $29 an hour $24 - $29 24 29 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 26.5 24 26.5 24 29
## 2 26.5 24 26.5 24 29
## 3 26.5 24 26.5 24 29
## 4 26.5 24 26.5 24 29
## 5 26.5 24 26.5 24 29
##
## [[3]]
## date_daysAgo
## 1 29
## 2 29
## 3 29
## 4 29
## 5 29
##
## [[4]]
## HiringAgency
## 1 Five Elements Salon & Day SpaRutland, VT 05701
## 2 Five Elements Salon & Day SpaRutland, VT 05701
## 3 Five Elements Salon & Day SpaRutland, VT 05701
## 4 Five Elements Salon & Day SpaRutland, VT 05701
## 5 Five Elements Salon & Day SpaRutland, VT 05701
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$24 - $29 an hour $24 - $29 24 29 24
## 2 \n$24 - $29 an hour $24 - $29 24 29 24
## 3 \n$24 - $29 an hour $24 - $29 24 29 24
## 4 \n$24 - $29 an hour $24 - $29 24 29 24
## 5 \n$24 - $29 an hour $24 - $29 24 29 24
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 29 24 29 24 29
## 2 29 24 29 24 29
## 3 29 24 29 24 29
## 4 29 24 29 24 29
## 5 29 24 29 24 29
##
## [[7]]
## city state jobTitle
## 1 Rutland VT Licensed Massage Therapist
## 2 Rutland VT Licensed Massage Therapist
## 3 Rutland VT Licensed Massage Therapist
## 4 Rutland VT Licensed Massage Therapist
## 5 Rutland VT Licensed Massage Therapist
## HiringAgency date_daysAgo MinHourlySalary
## 1 Five Elements Salon & Day SpaRutland, VT 05701 29 24
## 2 Five Elements Salon & Day SpaRutland, VT 05701 29 24
## 3 Five Elements Salon & Day SpaRutland, VT 05701 29 24
## 4 Five Elements Salon & Day SpaRutland, VT 05701 29 24
## 5 Five Elements Salon & Day SpaRutland, VT 05701 29 24
## MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 29 NA NA
## 2 29 NA NA
## 3 29 NA NA
## 4 29 NA NA
## 5 29 NA NA
Virginia Virginia Beach, Chesapeake, Norfolk
getIndeedJobData5pages('massage therapist', 'Virginia Beach','VA')
## Warning in getIndeedJobData5pages("massage therapist", "Virginia Beach", : NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Virginia Beach", : NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Newly Qualified Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist for NEW Location Opening Soon
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Newly Qualified Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 11 Massage Therapist
## 12 Senior Massage Therapist
## 13 Senior Massage Therapist
## 14 2020 LICENSED MASSAGE THERAPISTS!!
## 15 Licensed Massage Therapist
## 16 Newly Qualified Massage Therapist
## 17 Massage Therapist for NEW Location Opening Soon
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 21 Mobile Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Senior Massage Therapist
## 25 Senior Massage Therapist
## 26 2020 LICENSED MASSAGE THERAPISTS!!
## 27 Newly Qualified Massage Therapist
## 28 Senior Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist for NEW Location Opening Soon
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 35 Massage Therapist - Independent Contractor
## 36 Licensed Massage Therapist
## 37 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 38 Mobile Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Part Time Massage Therapist
## 42 Licensed Massage Therapist
## 43 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 44 Massage Therapist - Independent Contractor
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 48 Mobile Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Massage Therapist for NEW Location Opening Soon
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Newly Qualified Massage Therapist
## 55 Massage Therapist
## 56 Part Time Massage Therapist
## 57 Licensed Massage Therapist
## 58 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 59 Massage Therapist - Independent Contractor
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 63 Mobile Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist for NEW Location Opening Soon
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist
## 69 Newly Qualified Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 an hour $23 23.0 NA
## 2 \n$37,977 - $45,071 a year $37977 - $45071 37977.0 45071
## 3 \n$20 - $30 an hour $20 - $30 20.0 30
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 5 \n$18 - $35 an hour $18 - $35 18.0 35
## 6 \n$30 - $50 an hour $30 - $50 30.0 50
## 7 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 8 \n$16 - $25 an hour $16 - $25 16.0 25
## 9 \n$23 an hour $23 23.0 NA
## 10 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 11 \n$45 - $70 an hour $45 - $70 45.0 70
## 12 \n$30 - $50 an hour $30 - $50 30.0 50
## 13 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 14 \n$16 - $25 an hour $16 - $25 16.0 25
## 15 \n$16 - $20 an hour $16 - $20 16.0 20
## 16 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 17 \n$23 - $25 an hour $23 - $25 23.0 25
## 18 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 19 \n$45 - $70 an hour $45 - $70 45.0 70
## 20 \n$16 - $20 an hour $16 - $20 16.0 20
## 21 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 22 \n$23 - $25 an hour $23 - $25 23.0 25
## 23 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 24 \n$45 - $70 an hour $45 - $70 45.0 70
## 25 \n$23 an hour $23 23.0 NA
## 26 \n$16 - $20 an hour $16 - $20 16.0 20
## 27 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 28 \n$23 - $25 an hour $23 - $25 23.0 25
## 29 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 30 \n$45 - $70 an hour $45 - $70 45.0 70
## 31 \n$23 an hour $23 23.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22.5 25 1409.629 1754.474 16
## 2 22.5 25 1409.629 1754.474 16
## 3 22.5 25 1409.629 1754.474 16
## 4 22.5 25 1409.629 1754.474 16
## 5 22.5 25 1409.629 1754.474 16
## 6 22.5 25 1409.629 1754.474 16
## 7 22.5 25 1409.629 1754.474 16
## 8 22.5 25 1409.629 1754.474 16
## 9 22.5 25 1409.629 1754.474 16
## 10 22.5 25 1409.629 1754.474 16
## 11 22.5 25 1409.629 1754.474 16
## 12 22.5 25 1409.629 1754.474 16
## 13 22.5 25 1409.629 1754.474 16
## 14 22.5 25 1409.629 1754.474 16
## 15 22.5 25 1409.629 1754.474 16
## 16 22.5 25 1409.629 1754.474 16
## 17 22.5 25 1409.629 1754.474 16
## 18 22.5 25 1409.629 1754.474 16
## 19 22.5 25 1409.629 1754.474 16
## 20 22.5 25 1409.629 1754.474 16
## 21 22.5 25 1409.629 1754.474 16
## 22 22.5 25 1409.629 1754.474 16
## 23 22.5 25 1409.629 1754.474 16
## 24 22.5 25 1409.629 1754.474 16
## 25 22.5 25 1409.629 1754.474 16
## 26 22.5 25 1409.629 1754.474 16
## 27 22.5 25 1409.629 1754.474 16
## 28 22.5 25 1409.629 1754.474 16
## 29 22.5 25 1409.629 1754.474 16
## 30 22.5 25 1409.629 1754.474 16
## 31 22.5 25 1409.629 1754.474 16
## maximumMaxSalary
## 1 45071
## 2 45071
## 3 45071
## 4 45071
## 5 45071
## 6 45071
## 7 45071
## 8 45071
## 9 45071
## 10 45071
## 11 45071
## 12 45071
## 13 45071
## 14 45071
## 15 45071
## 16 45071
## 17 45071
## 18 45071
## 19 45071
## 20 45071
## 21 45071
## 22 45071
## 23 45071
## 24 45071
## 25 45071
## 26 45071
## 27 45071
## 28 45071
## 29 45071
## 30 45071
## 31 45071
##
## [[3]]
## date_daysAgo
## 1 11
## 2 7
## 3 30
## 4 Today
## 5 Today
## 6 30
## 7 Today
## 8 16
## 9 5
## 10 24
## 11 30
## 12 16
## 13 7
## 14 4
## 15 20
## 16 7
## 17 Today
## 18 Today
## 19 11
## 20 30
## 21 30
## 22 30
## 23 18
## 24 7
## 25 16
## 26 4
## 27 30
## 28 30
## 29 20
## 30 Today
## 31 30
## 32 Today
## 33 30
## 34 30
## 35 14
## 36 30
## 37 30
## 38 30
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 14
## 45 10
## 46 30
## 47 30
## 48 30
## 49 30
## 50 Today
## 51 Today
## 52 18
## 53 11
## 54 7
## 55 30
## 56 30
## 57 30
## 58 30
## 59 14
## 60 10
## 61 30
## 62 30
## 63 30
## 64 30
## 65 Today
## 66 Today
## 67 18
## 68 11
## 69 7
##
## [[4]]
## HiringAgency
## 1 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 2 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 3 Holistic Family Practice2.8Virginia Beach, VA 23451 (Linkhorn Park area)
## 4 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 5 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 6 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 7 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 8 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 9 Indo-Pak Massage TherapyNorfolk, VA•Remote work available
## 10 Wellness Clinic4.0Virginia Beach, VA 23461 (Northeast area)
## 11 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 12 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 13 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 14 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 15 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 16 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 17 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 18 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 19 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 20 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 21 Indo-Pak Massage TherapyChesapeake, VA
## 22 Mizani FitnessHampton, VA
## 23 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 24 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 25 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 26 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 27 Hand and Stone3.0Virginia Beach, VA 23456
## 28 Hand and Stone3.0Virginia Beach, VA 23456
## 29 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 30 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 31 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)+1 location
## 32 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 33 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 34 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 35 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 36 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 37 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 38 Indo-Pak Massage TherapyChesapeake, VA
## 39 Mizani FitnessHampton, VA
## 40 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)+1 location
## 41 Hand and Stone3.0Virginia Beach, VA 23456
## 42 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 43 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 44 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 45 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 46 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 47 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 48 Indo-Pak Massage TherapyChesapeake, VA
## 49 Mizani FitnessHampton, VA
## 50 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 51 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 52 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 53 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 54 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 55 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)+1 location
## 56 Hand and Stone3.0Virginia Beach, VA 23456
## 57 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 58 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 59 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 60 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 61 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 62 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 63 Indo-Pak Massage TherapyChesapeake, VA
## 64 Mizani FitnessHampton, VA
## 65 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 66 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 67 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 68 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 69 Hand and Stone Spa3.0Virginia Beach, VA 23450
##
## [[5]]
## Salary salary minSalary maxSalary
## 2 \n$37,977 - $45,071 a year $37977 - $45071 37977 45071
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 2 37977 45071 37977 45071 37977
## maximumMaxSalary
## 2 45071
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$23 an hour $23 23.0 NA
## 3 \n$20 - $30 an hour $20 - $30 20.0 30
## 5 \n$18 - $35 an hour $18 - $35 18.0 35
## 6 \n$30 - $50 an hour $30 - $50 30.0 50
## 7 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 8 \n$16 - $25 an hour $16 - $25 16.0 25
## 9 \n$23 an hour $23 23.0 NA
## 10 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 11 \n$45 - $70 an hour $45 - $70 45.0 70
## 12 \n$30 - $50 an hour $30 - $50 30.0 50
## 13 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 14 \n$16 - $25 an hour $16 - $25 16.0 25
## 15 \n$16 - $20 an hour $16 - $20 16.0 20
## 16 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 17 \n$23 - $25 an hour $23 - $25 23.0 25
## 18 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 19 \n$45 - $70 an hour $45 - $70 45.0 70
## 20 \n$16 - $20 an hour $16 - $20 16.0 20
## 21 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 22 \n$23 - $25 an hour $23 - $25 23.0 25
## 23 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 24 \n$45 - $70 an hour $45 - $70 45.0 70
## 25 \n$23 an hour $23 23.0 NA
## 26 \n$16 - $20 an hour $16 - $20 16.0 20
## 27 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 28 \n$23 - $25 an hour $23 - $25 23.0 25
## 29 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 30 \n$45 - $70 an hour $45 - $70 45.0 70
## 31 \n$23 an hour $23 23.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22.5 40 24.87931 39.6 16
## 3 22.5 40 24.87931 39.6 16
## 5 22.5 40 24.87931 39.6 16
## 6 22.5 40 24.87931 39.6 16
## 7 22.5 40 24.87931 39.6 16
## 8 22.5 40 24.87931 39.6 16
## 9 22.5 40 24.87931 39.6 16
## 10 22.5 40 24.87931 39.6 16
## 11 22.5 40 24.87931 39.6 16
## 12 22.5 40 24.87931 39.6 16
## 13 22.5 40 24.87931 39.6 16
## 14 22.5 40 24.87931 39.6 16
## 15 22.5 40 24.87931 39.6 16
## 16 22.5 40 24.87931 39.6 16
## 17 22.5 40 24.87931 39.6 16
## 18 22.5 40 24.87931 39.6 16
## 19 22.5 40 24.87931 39.6 16
## 20 22.5 40 24.87931 39.6 16
## 21 22.5 40 24.87931 39.6 16
## 22 22.5 40 24.87931 39.6 16
## 23 22.5 40 24.87931 39.6 16
## 24 22.5 40 24.87931 39.6 16
## 25 22.5 40 24.87931 39.6 16
## 26 22.5 40 24.87931 39.6 16
## 27 22.5 40 24.87931 39.6 16
## 28 22.5 40 24.87931 39.6 16
## 29 22.5 40 24.87931 39.6 16
## 30 22.5 40 24.87931 39.6 16
## 31 22.5 40 24.87931 39.6 16
## maximumMaxSalary
## 1 70
## 3 70
## 5 70
## 6 70
## 7 70
## 8 70
## 9 70
## 10 70
## 11 70
## 12 70
## 13 70
## 14 70
## 15 70
## 16 70
## 17 70
## 18 70
## 19 70
## 20 70
## 21 70
## 22 70
## 23 70
## 24 70
## 25 70
## 26 70
## 27 70
## 28 70
## 29 70
## 30 70
## 31 70
##
## [[7]]
## city state
## 1 Virginia Beach VA
## 2 Virginia Beach VA
## 3 Virginia Beach VA
## 4 Virginia Beach VA
## 5 Virginia Beach VA
## 6 Virginia Beach VA
## 7 Virginia Beach VA
## 8 Virginia Beach VA
## 9 Virginia Beach VA
## 10 Virginia Beach VA
## 11 Virginia Beach VA
## 12 Virginia Beach VA
## 13 Virginia Beach VA
## 14 Virginia Beach VA
## 15 Virginia Beach VA
## 16 Virginia Beach VA
## 17 Virginia Beach VA
## 18 Virginia Beach VA
## 19 Virginia Beach VA
## 20 Virginia Beach VA
## 21 Virginia Beach VA
## 22 Virginia Beach VA
## 23 Virginia Beach VA
## 24 Virginia Beach VA
## 25 Virginia Beach VA
## 26 Virginia Beach VA
## 27 Virginia Beach VA
## 28 Virginia Beach VA
## 29 Virginia Beach VA
## 30 Virginia Beach VA
## 31 Virginia Beach VA
## 32 Virginia Beach VA
## 33 Virginia Beach VA
## 34 Virginia Beach VA
## 35 Virginia Beach VA
## 36 Virginia Beach VA
## 37 Virginia Beach VA
## 38 Virginia Beach VA
## 39 Virginia Beach VA
## 40 Virginia Beach VA
## 41 Virginia Beach VA
## 42 Virginia Beach VA
## 43 Virginia Beach VA
## 44 Virginia Beach VA
## 45 Virginia Beach VA
## 46 Virginia Beach VA
## 47 Virginia Beach VA
## 48 Virginia Beach VA
## 49 Virginia Beach VA
## 50 Virginia Beach VA
## 51 Virginia Beach VA
## 52 Virginia Beach VA
## 53 Virginia Beach VA
## 54 Virginia Beach VA
## 55 Virginia Beach VA
## 56 Virginia Beach VA
## 57 Virginia Beach VA
## 58 Virginia Beach VA
## 59 Virginia Beach VA
## 60 Virginia Beach VA
## 61 Virginia Beach VA
## 62 Virginia Beach VA
## 63 Virginia Beach VA
## 64 Virginia Beach VA
## 65 Virginia Beach VA
## 66 Virginia Beach VA
## 67 Virginia Beach VA
## 68 Virginia Beach VA
## 69 Virginia Beach VA
## jobTitle
## 1 Licensed Massage Therapist
## 2 Newly Qualified Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist for NEW Location Opening Soon
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Newly Qualified Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 11 Massage Therapist
## 12 Senior Massage Therapist
## 13 Senior Massage Therapist
## 14 2020 LICENSED MASSAGE THERAPISTS!!
## 15 Licensed Massage Therapist
## 16 Newly Qualified Massage Therapist
## 17 Massage Therapist for NEW Location Opening Soon
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 21 Mobile Massage Therapist
## 22 Licensed Massage Therapist
## 23 Licensed Massage Therapist
## 24 Senior Massage Therapist
## 25 Senior Massage Therapist
## 26 2020 LICENSED MASSAGE THERAPISTS!!
## 27 Newly Qualified Massage Therapist
## 28 Senior Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist for NEW Location Opening Soon
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 35 Massage Therapist - Independent Contractor
## 36 Licensed Massage Therapist
## 37 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 38 Mobile Massage Therapist
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Part Time Massage Therapist
## 42 Licensed Massage Therapist
## 43 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 44 Massage Therapist - Independent Contractor
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 48 Mobile Massage Therapist
## 49 Licensed Massage Therapist
## 50 Massage Therapist
## 51 Massage Therapist for NEW Location Opening Soon
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Newly Qualified Massage Therapist
## 55 Massage Therapist
## 56 Part Time Massage Therapist
## 57 Licensed Massage Therapist
## 58 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 59 Massage Therapist - Independent Contractor
## 60 Licensed Massage Therapist
## 61 Licensed Massage Therapist
## 62 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 63 Mobile Massage Therapist
## 64 Licensed Massage Therapist
## 65 Massage Therapist
## 66 Massage Therapist for NEW Location Opening Soon
## 67 Licensed Massage Therapist
## 68 Licensed Massage Therapist
## 69 Newly Qualified Massage Therapist
## HiringAgency
## 1 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 2 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 3 Holistic Family Practice2.8Virginia Beach, VA 23451 (Linkhorn Park area)
## 4 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 5 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 6 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 7 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 8 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 9 Indo-Pak Massage TherapyNorfolk, VA•Remote work available
## 10 Wellness Clinic4.0Virginia Beach, VA 23461 (Northeast area)
## 11 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 12 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 13 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 14 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 15 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 16 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 17 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 18 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 19 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 20 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 21 Indo-Pak Massage TherapyChesapeake, VA
## 22 Mizani FitnessHampton, VA
## 23 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 24 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 25 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 26 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 27 Hand and Stone3.0Virginia Beach, VA 23456
## 28 Hand and Stone3.0Virginia Beach, VA 23456
## 29 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 30 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 31 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)+1 location
## 32 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 33 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 34 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 35 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 36 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 37 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 38 Indo-Pak Massage TherapyChesapeake, VA
## 39 Mizani FitnessHampton, VA
## 40 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)+1 location
## 41 Hand and Stone3.0Virginia Beach, VA 23456
## 42 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 43 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 44 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 45 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 46 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 47 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 48 Indo-Pak Massage TherapyChesapeake, VA
## 49 Mizani FitnessHampton, VA
## 50 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 51 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 52 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 53 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 54 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 55 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)+1 location
## 56 Hand and Stone3.0Virginia Beach, VA 23456
## 57 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 58 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 59 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 60 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 61 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 62 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 63 Indo-Pak Massage TherapyChesapeake, VA
## 64 Mizani FitnessHampton, VA
## 65 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 66 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 67 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 68 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 69 Hand and Stone Spa3.0Virginia Beach, VA 23450
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 11 16 70 37977 45071
## 2 7 16 70 37977 45071
## 3 30 16 70 37977 45071
## 4 Today 16 70 37977 45071
## 5 Today 16 70 37977 45071
## 6 30 16 70 37977 45071
## 7 Today 16 70 37977 45071
## 8 16 16 70 37977 45071
## 9 5 16 70 37977 45071
## 10 24 16 70 37977 45071
## 11 30 16 70 37977 45071
## 12 16 16 70 37977 45071
## 13 7 16 70 37977 45071
## 14 4 16 70 37977 45071
## 15 20 16 70 37977 45071
## 16 7 16 70 37977 45071
## 17 Today 16 70 37977 45071
## 18 Today 16 70 37977 45071
## 19 11 16 70 37977 45071
## 20 30 16 70 37977 45071
## 21 30 16 70 37977 45071
## 22 30 16 70 37977 45071
## 23 18 16 70 37977 45071
## 24 7 16 70 37977 45071
## 25 16 16 70 37977 45071
## 26 4 16 70 37977 45071
## 27 30 16 70 37977 45071
## 28 30 16 70 37977 45071
## 29 20 16 70 37977 45071
## 30 Today 16 70 37977 45071
## 31 30 16 70 37977 45071
## 32 Today 16 70 37977 45071
## 33 30 16 70 37977 45071
## 34 30 16 70 37977 45071
## 35 14 16 70 37977 45071
## 36 30 16 70 37977 45071
## 37 30 16 70 37977 45071
## 38 30 16 70 37977 45071
## 39 30 16 70 37977 45071
## 40 30 16 70 37977 45071
## 41 30 16 70 37977 45071
## 42 30 16 70 37977 45071
## 43 30 16 70 37977 45071
## 44 14 16 70 37977 45071
## 45 10 16 70 37977 45071
## 46 30 16 70 37977 45071
## 47 30 16 70 37977 45071
## 48 30 16 70 37977 45071
## 49 30 16 70 37977 45071
## 50 Today 16 70 37977 45071
## 51 Today 16 70 37977 45071
## 52 18 16 70 37977 45071
## 53 11 16 70 37977 45071
## 54 7 16 70 37977 45071
## 55 30 16 70 37977 45071
## 56 30 16 70 37977 45071
## 57 30 16 70 37977 45071
## 58 30 16 70 37977 45071
## 59 14 16 70 37977 45071
## 60 10 16 70 37977 45071
## 61 30 16 70 37977 45071
## 62 30 16 70 37977 45071
## 63 30 16 70 37977 45071
## 64 30 16 70 37977 45071
## 65 Today 16 70 37977 45071
## 66 Today 16 70 37977 45071
## 67 18 16 70 37977 45071
## 68 11 16 70 37977 45071
## 69 7 16 70 37977 45071
getIndeedJobData5pages('massage therapist', 'Chesapeake','VA')
## Warning in getIndeedJobData5pages("massage therapist", "Chesapeake", "VA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Chesapeake", "VA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Medical office reopening after Covid seeking a Massage Thera...
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Newly Qualified Massage Therapist
## 7 Massage Therapist for NEW Location Opening Soon
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Newly Qualified Massage Therapist
## 11 Massage Therapist
## 12 Senior Massage Therapist
## 13 Licensed Massage Therapist
## 14 Senior Massage Therapist
## 15 Mobile Massage Therapist
## 16 Mobile Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Massage Therapist
## 20 2020 LICENSED MASSAGE THERAPISTS!!
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 23 Senior Massage Therapist
## 24 Massage Therapist - Independent Contractor
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 29 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 30 Massage Therapist- Competitive pay plans! - Flexible schedul...
## 31 Mobile Massage Therapist
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist
## 35 2020 LICENSED MASSAGE THERAPISTS!!
## 36 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 37 Licensed Massage Therapist
## 38 Senior Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 44 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 45 Massage Therapist- Competitive pay plans! - Flexible schedul...
## 46 Licensed Massage Therapist
## 47 Massage Therapist - Independent Contractor
## 48 Senior Massage Therapist
## 49 Part Time Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 54 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 55 Massage Therapist- Competitive pay plans! - Flexible schedul...
## 56 Newly Qualified Massage Therapist
## 57 Licensed Massage Therapist
## 58 Massage Therapist
## 59 Medical office reopening after Covid seeking a Massage Thera...
## 60 Licensed Massage Therapist
## 61 Mobile Massage Therapist
## 62 Massage Therapist
## 63 Massage Therapist
## 64 Massage Therapist
## 65 2020 LICENSED MASSAGE THERAPISTS!!
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 68 Senior Massage Therapist
## 69 Massage Therapist - Independent Contractor
## 70 Licensed Massage Therapist
## 71 Licensed Massage Therapist
## 72 Licensed Massage Therapist
## 73 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 74 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 75 Massage Therapist- Competitive pay plans! - Flexible schedul...
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 an hour $23 23.0 NA
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 3 \n$20 - $30 an hour $20 - $30 20.0 30
## 4 \n$30 - $50 an hour $30 - $50 30.0 50
## 5 \n$45 - $70 an hour $45 - $70 45.0 70
## 6 \n$45 - $70 an hour $45 - $70 45.0 70
## 7 \n$37,977 - $45,071 a year $37977 - $45071 37977.0 45071
## 8 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 9 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 10 \n$18 - $35 an hour $18 - $35 18.0 35
## 11 \n$23 - $25 an hour $23 - $25 23.0 25
## 12 \n$16 - $25 an hour $16 - $25 16.0 25
## 13 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 14 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 15 \n$45 - $70 an hour $45 - $70 45.0 70
## 16 \n$37,977 - $45,071 a year $37977 - $45071 37977.0 45071
## 17 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 18 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 19 \n$18 - $35 an hour $18 - $35 18.0 35
## 20 \n$23 - $25 an hour $23 - $25 23.0 25
## 21 \n$16 - $25 an hour $16 - $25 16.0 25
## 22 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 23 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 24 \n$23 - $25 an hour $23 - $25 23.0 25
## 25 \n$16 - $25 an hour $16 - $25 16.0 25
## 26 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 27 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 28 \n$23 an hour $23 23.0 NA
## 29 \n$45 - $70 an hour $45 - $70 45.0 70
## 30 \n$37,977 - $45,071 a year $37977 - $45071 37977.0 45071
## 31 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 32 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 33 \n$18 - $35 an hour $18 - $35 18.0 35
## 34 \n$23 - $25 an hour $23 - $25 23.0 25
## 35 \n$16 - $25 an hour $16 - $25 16.0 25
## 36 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 37 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22.5 27.5 3235.797 3725.312 16
## 2 22.5 27.5 3235.797 3725.312 16
## 3 22.5 27.5 3235.797 3725.312 16
## 4 22.5 27.5 3235.797 3725.312 16
## 5 22.5 27.5 3235.797 3725.312 16
## 6 22.5 27.5 3235.797 3725.312 16
## 7 22.5 27.5 3235.797 3725.312 16
## 8 22.5 27.5 3235.797 3725.312 16
## 9 22.5 27.5 3235.797 3725.312 16
## 10 22.5 27.5 3235.797 3725.312 16
## 11 22.5 27.5 3235.797 3725.312 16
## 12 22.5 27.5 3235.797 3725.312 16
## 13 22.5 27.5 3235.797 3725.312 16
## 14 22.5 27.5 3235.797 3725.312 16
## 15 22.5 27.5 3235.797 3725.312 16
## 16 22.5 27.5 3235.797 3725.312 16
## 17 22.5 27.5 3235.797 3725.312 16
## 18 22.5 27.5 3235.797 3725.312 16
## 19 22.5 27.5 3235.797 3725.312 16
## 20 22.5 27.5 3235.797 3725.312 16
## 21 22.5 27.5 3235.797 3725.312 16
## 22 22.5 27.5 3235.797 3725.312 16
## 23 22.5 27.5 3235.797 3725.312 16
## 24 22.5 27.5 3235.797 3725.312 16
## 25 22.5 27.5 3235.797 3725.312 16
## 26 22.5 27.5 3235.797 3725.312 16
## 27 22.5 27.5 3235.797 3725.312 16
## 28 22.5 27.5 3235.797 3725.312 16
## 29 22.5 27.5 3235.797 3725.312 16
## 30 22.5 27.5 3235.797 3725.312 16
## 31 22.5 27.5 3235.797 3725.312 16
## 32 22.5 27.5 3235.797 3725.312 16
## 33 22.5 27.5 3235.797 3725.312 16
## 34 22.5 27.5 3235.797 3725.312 16
## 35 22.5 27.5 3235.797 3725.312 16
## 36 22.5 27.5 3235.797 3725.312 16
## 37 22.5 27.5 3235.797 3725.312 16
## maximumMaxSalary
## 1 45071
## 2 45071
## 3 45071
## 4 45071
## 5 45071
## 6 45071
## 7 45071
## 8 45071
## 9 45071
## 10 45071
## 11 45071
## 12 45071
## 13 45071
## 14 45071
## 15 45071
## 16 45071
## 17 45071
## 18 45071
## 19 45071
## 20 45071
## 21 45071
## 22 45071
## 23 45071
## 24 45071
## 25 45071
## 26 45071
## 27 45071
## 28 45071
## 29 45071
## 30 45071
## 31 45071
## 32 45071
## 33 45071
## 34 45071
## 35 45071
## 36 45071
## 37 45071
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 18
## 4 11
## 5 5
## 6 7
## 7 Today
## 8 Today
## 9 30
## 10 16
## 11 Today
## 12 16
## 13 7
## 14 7
## 15 30
## 16 30
## 17 30
## 18 30
## 19 30
## 20 4
## 21 7
## 22 29
## 23 7
## 24 14
## 25 20
## 26 30
## 27 30
## 28 30
## 29 30
## 30 30
## 31 30
## 32 30
## 33 30
## 34 30
## 35 4
## 36 29
## 37 7
## 38 7
## 39 14
## 40 20
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 30
## 47 14
## 48 30
## 49 30
## 50 20
## 51 30
## 52 30
## 53 30
## 54 30
## 55 30
## 56 7
## 57 11
## 58 30
## 59 30
## 60 18
## 61 30
## 62 30
## 63 30
## 64 30
## 65 4
## 66 7
## 67 29
## 68 7
## 69 14
## 70 20
## 71 30
## 72 30
## 73 30
## 74 30
## 75 30
##
## [[4]]
## HiringAgency
## 1 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 2 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 3 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 4 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 5 Indo-Pak Massage TherapyNorfolk, VA•Remote work available
## 6 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 7 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 8 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 9 Holistic Family Practice2.8Virginia Beach, VA 23451 (Linkhorn Park area)
## 10 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 11 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 12 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 13 Hand and Stone Spa3.0Chesapeake, VA 23322
## 14 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 15 Indo-Pak Massage TherapyChesapeake, VA
## 16 Indo-Pak Massage TherapyChesapeake, VA
## 17 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 18 Massage Envy3.2Chesapeake, VA 23322+5 locations
## 19 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 20 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 21 Hand and Stone Spa3.0Chesapeake, VA 23322
## 22 Wellness Clinic4.0Virginia Beach, VA 23456
## 23 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 24 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 25 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 26 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 27 Mizani FitnessHampton, VA
## 28 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 29 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 30 Massage Envy3.2Chesapeake, VA 23322+1 location
## 31 Indo-Pak Massage TherapyChesapeake, VA
## 32 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 33 Massage Envy3.2Chesapeake, VA 23322+5 locations
## 34 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 35 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 36 Wellness Clinic4.0Virginia Beach, VA 23456
## 37 Hand and Stone Spa3.0Chesapeake, VA 23322
## 38 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 39 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 40 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 41 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 42 Mizani FitnessHampton, VA
## 43 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 44 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 45 Massage Envy3.2Chesapeake, VA 23322+1 location
## 46 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 47 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 48 Hand and Stone3.0Virginia Beach, VA 23456
## 49 Hand and Stone3.0Virginia Beach, VA 23456
## 50 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 51 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 52 Mizani FitnessHampton, VA
## 53 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 54 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 55 Massage Envy3.2Chesapeake, VA 23322+1 location
## 56 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 57 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 58 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 59 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 60 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 61 Indo-Pak Massage TherapyChesapeake, VA
## 62 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 63 Massage Envy3.2Chesapeake, VA 23322+5 locations
## 64 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 65 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 66 Hand and Stone Spa3.0Chesapeake, VA 23322
## 67 Wellness Clinic4.0Virginia Beach, VA 23456
## 68 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 69 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 70 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 71 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 72 Mizani FitnessHampton, VA
## 73 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 74 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 75 Massage Envy3.2Chesapeake, VA 23322+1 location
##
## [[5]]
## Salary salary minSalary maxSalary
## 7 \n$37,977 - $45,071 a year $37977 - $45071 37977 45071
## 16 \n$37,977 - $45,071 a year $37977 - $45071 37977 45071
## 30 \n$37,977 - $45,071 a year $37977 - $45071 37977 45071
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 7 37977 45071 37977 45071 37977
## 16 37977 45071 37977 45071 37977
## 30 37977 45071 37977 45071 37977
## maximumMaxSalary
## 7 45071
## 16 45071
## 30 45071
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$23 an hour $23 23.0 NA
## 3 \n$20 - $30 an hour $20 - $30 20.0 30
## 4 \n$30 - $50 an hour $30 - $50 30.0 50
## 5 \n$45 - $70 an hour $45 - $70 45.0 70
## 6 \n$45 - $70 an hour $45 - $70 45.0 70
## 8 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 9 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 10 \n$18 - $35 an hour $18 - $35 18.0 35
## 11 \n$23 - $25 an hour $23 - $25 23.0 25
## 12 \n$16 - $25 an hour $16 - $25 16.0 25
## 13 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 14 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 15 \n$45 - $70 an hour $45 - $70 45.0 70
## 17 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 18 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 19 \n$18 - $35 an hour $18 - $35 18.0 35
## 20 \n$23 - $25 an hour $23 - $25 23.0 25
## 21 \n$16 - $25 an hour $16 - $25 16.0 25
## 22 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 23 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 24 \n$23 - $25 an hour $23 - $25 23.0 25
## 25 \n$16 - $25 an hour $16 - $25 16.0 25
## 26 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 27 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 28 \n$23 an hour $23 23.0 NA
## 29 \n$45 - $70 an hour $45 - $70 45.0 70
## 31 \n$20 - $60 an hour ++ $20 - $60 20.0 60
## 32 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 33 \n$18 - $35 an hour $18 - $35 18.0 35
## 34 \n$23 - $25 an hour $23 - $25 23.0 25
## 35 \n$16 - $25 an hour $16 - $25 16.0 25
## 36 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 37 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22.5 40 24.04545 41.45161 16
## 3 22.5 40 24.04545 41.45161 16
## 4 22.5 40 24.04545 41.45161 16
## 5 22.5 40 24.04545 41.45161 16
## 6 22.5 40 24.04545 41.45161 16
## 8 22.5 40 24.04545 41.45161 16
## 9 22.5 40 24.04545 41.45161 16
## 10 22.5 40 24.04545 41.45161 16
## 11 22.5 40 24.04545 41.45161 16
## 12 22.5 40 24.04545 41.45161 16
## 13 22.5 40 24.04545 41.45161 16
## 14 22.5 40 24.04545 41.45161 16
## 15 22.5 40 24.04545 41.45161 16
## 17 22.5 40 24.04545 41.45161 16
## 18 22.5 40 24.04545 41.45161 16
## 19 22.5 40 24.04545 41.45161 16
## 20 22.5 40 24.04545 41.45161 16
## 21 22.5 40 24.04545 41.45161 16
## 22 22.5 40 24.04545 41.45161 16
## 23 22.5 40 24.04545 41.45161 16
## 24 22.5 40 24.04545 41.45161 16
## 25 22.5 40 24.04545 41.45161 16
## 26 22.5 40 24.04545 41.45161 16
## 27 22.5 40 24.04545 41.45161 16
## 28 22.5 40 24.04545 41.45161 16
## 29 22.5 40 24.04545 41.45161 16
## 31 22.5 40 24.04545 41.45161 16
## 32 22.5 40 24.04545 41.45161 16
## 33 22.5 40 24.04545 41.45161 16
## 34 22.5 40 24.04545 41.45161 16
## 35 22.5 40 24.04545 41.45161 16
## 36 22.5 40 24.04545 41.45161 16
## 37 22.5 40 24.04545 41.45161 16
## maximumMaxSalary
## 1 70
## 3 70
## 4 70
## 5 70
## 6 70
## 8 70
## 9 70
## 10 70
## 11 70
## 12 70
## 13 70
## 14 70
## 15 70
## 17 70
## 18 70
## 19 70
## 20 70
## 21 70
## 22 70
## 23 70
## 24 70
## 25 70
## 26 70
## 27 70
## 28 70
## 29 70
## 31 70
## 32 70
## 33 70
## 34 70
## 35 70
## 36 70
## 37 70
##
## [[7]]
## city state
## 1 Chesapeake VA
## 2 Chesapeake VA
## 3 Chesapeake VA
## 4 Chesapeake VA
## 5 Chesapeake VA
## 6 Chesapeake VA
## 7 Chesapeake VA
## 8 Chesapeake VA
## 9 Chesapeake VA
## 10 Chesapeake VA
## 11 Chesapeake VA
## 12 Chesapeake VA
## 13 Chesapeake VA
## 14 Chesapeake VA
## 15 Chesapeake VA
## 16 Chesapeake VA
## 17 Chesapeake VA
## 18 Chesapeake VA
## 19 Chesapeake VA
## 20 Chesapeake VA
## 21 Chesapeake VA
## 22 Chesapeake VA
## 23 Chesapeake VA
## 24 Chesapeake VA
## 25 Chesapeake VA
## 26 Chesapeake VA
## 27 Chesapeake VA
## 28 Chesapeake VA
## 29 Chesapeake VA
## 30 Chesapeake VA
## 31 Chesapeake VA
## 32 Chesapeake VA
## 33 Chesapeake VA
## 34 Chesapeake VA
## 35 Chesapeake VA
## 36 Chesapeake VA
## 37 Chesapeake VA
## 38 Chesapeake VA
## 39 Chesapeake VA
## 40 Chesapeake VA
## 41 Chesapeake VA
## 42 Chesapeake VA
## 43 Chesapeake VA
## 44 Chesapeake VA
## 45 Chesapeake VA
## 46 Chesapeake VA
## 47 Chesapeake VA
## 48 Chesapeake VA
## 49 Chesapeake VA
## 50 Chesapeake VA
## 51 Chesapeake VA
## 52 Chesapeake VA
## 53 Chesapeake VA
## 54 Chesapeake VA
## 55 Chesapeake VA
## 56 Chesapeake VA
## 57 Chesapeake VA
## 58 Chesapeake VA
## 59 Chesapeake VA
## 60 Chesapeake VA
## 61 Chesapeake VA
## 62 Chesapeake VA
## 63 Chesapeake VA
## 64 Chesapeake VA
## 65 Chesapeake VA
## 66 Chesapeake VA
## 67 Chesapeake VA
## 68 Chesapeake VA
## 69 Chesapeake VA
## 70 Chesapeake VA
## 71 Chesapeake VA
## 72 Chesapeake VA
## 73 Chesapeake VA
## 74 Chesapeake VA
## 75 Chesapeake VA
## jobTitle
## 1 Massage Therapist
## 2 Medical office reopening after Covid seeking a Massage Thera...
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Newly Qualified Massage Therapist
## 7 Massage Therapist for NEW Location Opening Soon
## 8 Massage Therapist
## 9 Massage Therapist
## 10 Newly Qualified Massage Therapist
## 11 Massage Therapist
## 12 Senior Massage Therapist
## 13 Licensed Massage Therapist
## 14 Senior Massage Therapist
## 15 Mobile Massage Therapist
## 16 Mobile Massage Therapist
## 17 Massage Therapist
## 18 Massage Therapist
## 19 Massage Therapist
## 20 2020 LICENSED MASSAGE THERAPISTS!!
## 21 Licensed Massage Therapist
## 22 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 23 Senior Massage Therapist
## 24 Massage Therapist - Independent Contractor
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 29 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 30 Massage Therapist- Competitive pay plans! - Flexible schedul...
## 31 Mobile Massage Therapist
## 32 Massage Therapist
## 33 Massage Therapist
## 34 Massage Therapist
## 35 2020 LICENSED MASSAGE THERAPISTS!!
## 36 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 37 Licensed Massage Therapist
## 38 Senior Massage Therapist
## 39 Massage Therapist - Independent Contractor
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 44 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 45 Massage Therapist- Competitive pay plans! - Flexible schedul...
## 46 Licensed Massage Therapist
## 47 Massage Therapist - Independent Contractor
## 48 Senior Massage Therapist
## 49 Part Time Massage Therapist
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist
## 52 Licensed Massage Therapist
## 53 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 54 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 55 Massage Therapist- Competitive pay plans! - Flexible schedul...
## 56 Newly Qualified Massage Therapist
## 57 Licensed Massage Therapist
## 58 Massage Therapist
## 59 Medical office reopening after Covid seeking a Massage Thera...
## 60 Licensed Massage Therapist
## 61 Mobile Massage Therapist
## 62 Massage Therapist
## 63 Massage Therapist
## 64 Massage Therapist
## 65 2020 LICENSED MASSAGE THERAPISTS!!
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 68 Senior Massage Therapist
## 69 Massage Therapist - Independent Contractor
## 70 Licensed Massage Therapist
## 71 Licensed Massage Therapist
## 72 Licensed Massage Therapist
## 73 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 74 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 75 Massage Therapist- Competitive pay plans! - Flexible schedul...
## HiringAgency
## 1 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 2 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 3 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 4 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 5 Indo-Pak Massage TherapyNorfolk, VA•Remote work available
## 6 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 7 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 8 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 9 Holistic Family Practice2.8Virginia Beach, VA 23451 (Linkhorn Park area)
## 10 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 11 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 12 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 13 Hand and Stone Spa3.0Chesapeake, VA 23322
## 14 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 15 Indo-Pak Massage TherapyChesapeake, VA
## 16 Indo-Pak Massage TherapyChesapeake, VA
## 17 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 18 Massage Envy3.2Chesapeake, VA 23322+5 locations
## 19 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 20 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 21 Hand and Stone Spa3.0Chesapeake, VA 23322
## 22 Wellness Clinic4.0Virginia Beach, VA 23456
## 23 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 24 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 25 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 26 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 27 Mizani FitnessHampton, VA
## 28 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 29 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 30 Massage Envy3.2Chesapeake, VA 23322+1 location
## 31 Indo-Pak Massage TherapyChesapeake, VA
## 32 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 33 Massage Envy3.2Chesapeake, VA 23322+5 locations
## 34 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 35 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 36 Wellness Clinic4.0Virginia Beach, VA 23456
## 37 Hand and Stone Spa3.0Chesapeake, VA 23322
## 38 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 39 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 40 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 41 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 42 Mizani FitnessHampton, VA
## 43 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 44 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 45 Massage Envy3.2Chesapeake, VA 23322+1 location
## 46 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 47 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 48 Hand and Stone3.0Virginia Beach, VA 23456
## 49 Hand and Stone3.0Virginia Beach, VA 23456
## 50 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 51 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 52 Mizani FitnessHampton, VA
## 53 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 54 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 55 Massage Envy3.2Chesapeake, VA 23322+1 location
## 56 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 57 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 58 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 59 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 60 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 61 Indo-Pak Massage TherapyChesapeake, VA
## 62 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 63 Massage Envy3.2Chesapeake, VA 23322+5 locations
## 64 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 65 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 66 Hand and Stone Spa3.0Chesapeake, VA 23322
## 67 Wellness Clinic4.0Virginia Beach, VA 23456
## 68 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 69 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 70 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 71 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 72 Mizani FitnessHampton, VA
## 73 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 74 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 75 Massage Envy3.2Chesapeake, VA 23322+1 location
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 16 70 37977 45071
## 2 30 16 70 37977 45071
## 3 18 16 70 37977 45071
## 4 11 16 70 37977 45071
## 5 5 16 70 37977 45071
## 6 7 16 70 37977 45071
## 7 Today 16 70 37977 45071
## 8 Today 16 70 37977 45071
## 9 30 16 70 37977 45071
## 10 16 16 70 37977 45071
## 11 Today 16 70 37977 45071
## 12 16 16 70 37977 45071
## 13 7 16 70 37977 45071
## 14 7 16 70 37977 45071
## 15 30 16 70 37977 45071
## 16 30 16 70 37977 45071
## 17 30 16 70 37977 45071
## 18 30 16 70 37977 45071
## 19 30 16 70 37977 45071
## 20 4 16 70 37977 45071
## 21 7 16 70 37977 45071
## 22 29 16 70 37977 45071
## 23 7 16 70 37977 45071
## 24 14 16 70 37977 45071
## 25 20 16 70 37977 45071
## 26 30 16 70 37977 45071
## 27 30 16 70 37977 45071
## 28 30 16 70 37977 45071
## 29 30 16 70 37977 45071
## 30 30 16 70 37977 45071
## 31 30 16 70 37977 45071
## 32 30 16 70 37977 45071
## 33 30 16 70 37977 45071
## 34 30 16 70 37977 45071
## 35 4 16 70 37977 45071
## 36 29 16 70 37977 45071
## 37 7 16 70 37977 45071
## 38 7 16 70 37977 45071
## 39 14 16 70 37977 45071
## 40 20 16 70 37977 45071
## 41 30 16 70 37977 45071
## 42 30 16 70 37977 45071
## 43 30 16 70 37977 45071
## 44 30 16 70 37977 45071
## 45 30 16 70 37977 45071
## 46 30 16 70 37977 45071
## 47 14 16 70 37977 45071
## 48 30 16 70 37977 45071
## 49 30 16 70 37977 45071
## 50 20 16 70 37977 45071
## 51 30 16 70 37977 45071
## 52 30 16 70 37977 45071
## 53 30 16 70 37977 45071
## 54 30 16 70 37977 45071
## 55 30 16 70 37977 45071
## 56 7 16 70 37977 45071
## 57 11 16 70 37977 45071
## 58 30 16 70 37977 45071
## 59 30 16 70 37977 45071
## 60 18 16 70 37977 45071
## 61 30 16 70 37977 45071
## 62 30 16 70 37977 45071
## 63 30 16 70 37977 45071
## 64 30 16 70 37977 45071
## 65 4 16 70 37977 45071
## 66 7 16 70 37977 45071
## 67 29 16 70 37977 45071
## 68 7 16 70 37977 45071
## 69 14 16 70 37977 45071
## 70 20 16 70 37977 45071
## 71 30 16 70 37977 45071
## 72 30 16 70 37977 45071
## 73 30 16 70 37977 45071
## 74 30 16 70 37977 45071
## 75 30 16 70 37977 45071
getIndeedJobData5pages('massage therapist', 'Norfolk','VA')
## Warning in getIndeedJobData5pages("massage therapist", "Norfolk", "VA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Norfolk", "VA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Medical office reopening after Covid seeking a Massage Thera...
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Newly Qualified Massage Therapist
## 7 Massage Therapist for NEW Location Opening Soon
## 8 Massage Therapist
## 9 Senior Massage Therapist
## 10 Massage Therapist
## 11 Newly Qualified Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Senior Massage Therapist
## 16 Massage Therapist
## 17 Senior Massage Therapist
## 18 2020 LICENSED MASSAGE THERAPISTS!!
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Senior Massage Therapist
## 22 Mobile Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 29 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 30 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 31 Massage Therapist
## 32 Senior Massage Therapist
## 33 2020 LICENSED MASSAGE THERAPISTS!!
## 34 Massage Therapist
## 35 Massage Therapist
## 36 Senior Massage Therapist
## 37 Mobile Massage Therapist
## 38 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 44 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 45 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 46 Senior Massage Therapist
## 47 Massage Therapist - Independent Contractor
## 48 2020 LICENSED MASSAGE THERAPISTS!!
## 49 Massage Therapist
## 50 Massage Therapist
## 51 Senior Massage Therapist
## 52 Mobile Massage Therapist
## 53 Licensed Massage Therapist
## 54 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 59 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 60 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 61 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 62 Licensed Massage Therapist
## 63 Part Time Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 69 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 70 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 71 Massage Therapist for NEW Location Opening Soon
## 72 Newly Qualified Massage Therapist
## 73 Massage Therapist
## 74 Medical office reopening after Covid seeking a Massage Thera...
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$23 an hour $23 23.0 NA
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000
## 3 \n$15 an hour $15 15.0 NA
## 4 \n$20 - $30 an hour $20 - $30 20.0 30
## 5 \n$30 - $50 an hour $30 - $50 30.0 50
## 6 \n$30 - $50 an hour $30 - $50 30.0 50
## 7 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 8 \n$37,977 - $45,071 a year $37977 - $45071 37977.0 45071
## 9 \n$45 - $70 an hour $45 - $70 45.0 70
## 10 \n$18 - $35 an hour $18 - $35 18.0 35
## 11 \n$16 - $25 an hour $16 - $25 16.0 25
## 12 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 13 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 14 \n$30 - $50 an hour $30 - $50 30.0 50
## 15 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 16 \n$37,977 - $45,071 a year $37977 - $45071 37977.0 45071
## 17 \n$45 - $70 an hour $45 - $70 45.0 70
## 18 \n$18 - $35 an hour $18 - $35 18.0 35
## 19 \n$16 - $25 an hour $16 - $25 16.0 25
## 20 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 21 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 22 \n$30 - $50 an hour $30 - $50 30.0 50
## 23 \n$23 - $25 an hour $23 - $25 23.0 25
## 24 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 25 \n$37,977 - $45,071 a year $37977 - $45071 37977.0 45071
## 26 \n$45 - $70 an hour $45 - $70 45.0 70
## 27 \n$18 - $35 an hour $18 - $35 18.0 35
## 28 \n$16 - $25 an hour $16 - $25 16.0 25
## 29 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 30 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 31 \n$18 - $35 an hour $18 - $35 18.0 35
## 32 \n$16 - $25 an hour $16 - $25 16.0 25
## 33 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 34 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 35 \n$23 an hour $23 23.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22.5 30 3419.243 4000.47 15
## 2 22.5 30 3419.243 4000.47 15
## 3 22.5 30 3419.243 4000.47 15
## 4 22.5 30 3419.243 4000.47 15
## 5 22.5 30 3419.243 4000.47 15
## 6 22.5 30 3419.243 4000.47 15
## 7 22.5 30 3419.243 4000.47 15
## 8 22.5 30 3419.243 4000.47 15
## 9 22.5 30 3419.243 4000.47 15
## 10 22.5 30 3419.243 4000.47 15
## 11 22.5 30 3419.243 4000.47 15
## 12 22.5 30 3419.243 4000.47 15
## 13 22.5 30 3419.243 4000.47 15
## 14 22.5 30 3419.243 4000.47 15
## 15 22.5 30 3419.243 4000.47 15
## 16 22.5 30 3419.243 4000.47 15
## 17 22.5 30 3419.243 4000.47 15
## 18 22.5 30 3419.243 4000.47 15
## 19 22.5 30 3419.243 4000.47 15
## 20 22.5 30 3419.243 4000.47 15
## 21 22.5 30 3419.243 4000.47 15
## 22 22.5 30 3419.243 4000.47 15
## 23 22.5 30 3419.243 4000.47 15
## 24 22.5 30 3419.243 4000.47 15
## 25 22.5 30 3419.243 4000.47 15
## 26 22.5 30 3419.243 4000.47 15
## 27 22.5 30 3419.243 4000.47 15
## 28 22.5 30 3419.243 4000.47 15
## 29 22.5 30 3419.243 4000.47 15
## 30 22.5 30 3419.243 4000.47 15
## 31 22.5 30 3419.243 4000.47 15
## 32 22.5 30 3419.243 4000.47 15
## 33 22.5 30 3419.243 4000.47 15
## 34 22.5 30 3419.243 4000.47 15
## 35 22.5 30 3419.243 4000.47 15
## maximumMaxSalary
## 1 45071
## 2 45071
## 3 45071
## 4 45071
## 5 45071
## 6 45071
## 7 45071
## 8 45071
## 9 45071
## 10 45071
## 11 45071
## 12 45071
## 13 45071
## 14 45071
## 15 45071
## 16 45071
## 17 45071
## 18 45071
## 19 45071
## 20 45071
## 21 45071
## 22 45071
## 23 45071
## 24 45071
## 25 45071
## 26 45071
## 27 45071
## 28 45071
## 29 45071
## 30 45071
## 31 45071
## 32 45071
## 33 45071
## 34 45071
## 35 45071
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 18
## 4 11
## 5 5
## 6 7
## 7 Today
## 8 Today
## 9 7
## 10 30
## 11 16
## 12 30
## 13 Today
## 14 7
## 15 16
## 16 Today
## 17 16
## 18 4
## 19 30
## 20 30
## 21 7
## 22 30
## 23 7
## 24 29
## 25 20
## 26 30
## 27 30
## 28 30
## 29 30
## 30 30
## 31 Today
## 32 16
## 33 4
## 34 30
## 35 30
## 36 7
## 37 30
## 38 29
## 39 7
## 40 20
## 41 30
## 42 30
## 43 30
## 44 30
## 45 30
## 46 16
## 47 14
## 48 4
## 49 30
## 50 30
## 51 7
## 52 30
## 53 7
## 54 29
## 55 20
## 56 30
## 57 30
## 58 30
## 59 30
## 60 30
## 61 29
## 62 10
## 63 30
## 64 20
## 65 30
## 66 30
## 67 30
## 68 30
## 69 30
## 70 30
## 71 Today
## 72 7
## 73 30
## 74 30
## 75 18
## 76 11
##
## [[4]]
## HiringAgency
## 1 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 2 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 3 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 4 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 5 Indo-Pak Massage TherapyNorfolk, VA•Remote work available
## 6 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 7 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 8 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 9 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 10 Massage Envy3.2Norfolk, VA 23510 (Downtown area)+5 locations
## 11 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 12 Holistic Family Practice2.8Virginia Beach, VA 23451 (Linkhorn Park area)
## 13 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 14 Hand and Stone Spa3.0Chesapeake, VA 23322
## 15 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 16 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 17 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 18 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 19 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 20 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 21 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 22 Indo-Pak Massage TherapyChesapeake, VA
## 23 Hand and Stone Spa3.0Chesapeake, VA 23322
## 24 Wellness Clinic4.0Virginia Beach, VA 23456
## 25 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 26 Mizani FitnessHampton, VA
## 27 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 28 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 29 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 30 Massage Envy3.2Suffolk, VA 23435+1 location
## 31 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 32 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 33 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 34 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 35 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 36 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 37 Indo-Pak Massage TherapyChesapeake, VA
## 38 Wellness Clinic4.0Virginia Beach, VA 23456
## 39 Hand and Stone Spa3.0Chesapeake, VA 23322
## 40 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 41 Mizani FitnessHampton, VA
## 42 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 43 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 44 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 45 Massage Envy3.2Suffolk, VA 23435+1 location
## 46 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 47 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 48 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 49 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 50 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 51 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 52 Indo-Pak Massage TherapyChesapeake, VA
## 53 Hand and Stone Spa3.0Chesapeake, VA 23322
## 54 Wellness Clinic4.0Virginia Beach, VA 23456
## 55 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 56 Mizani FitnessHampton, VA
## 57 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 58 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 59 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 60 Massage Envy3.2Suffolk, VA 23435+1 location
## 61 Wellness Clinic4.0Virginia Beach, VA 23456
## 62 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 63 Hand and Stone3.0Virginia Beach, VA 23456
## 64 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 65 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 66 Mizani FitnessHampton, VA
## 67 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 68 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 69 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 70 Massage Envy3.2Suffolk, VA 23435+1 location
## 71 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 72 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 73 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 74 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 75 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 76 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
##
## [[5]]
## Salary salary minSalary maxSalary
## 8 \n$37,977 - $45,071 a year $37977 - $45071 37977 45071
## 16 \n$37,977 - $45,071 a year $37977 - $45071 37977 45071
## 25 \n$37,977 - $45,071 a year $37977 - $45071 37977 45071
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 8 37977 45071 37977 45071 37977
## 16 37977 45071 37977 45071 37977
## 25 37977 45071 37977 45071 37977
## maximumMaxSalary
## 8 45071
## 16 45071
## 25 45071
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$23 an hour $23 23.0 NA
## 3 \n$15 an hour $15 15.0 NA
## 4 \n$20 - $30 an hour $20 - $30 20.0 30
## 5 \n$30 - $50 an hour $30 - $50 30.0 50
## 6 \n$30 - $50 an hour $30 - $50 30.0 50
## 7 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 9 \n$45 - $70 an hour $45 - $70 45.0 70
## 10 \n$18 - $35 an hour $18 - $35 18.0 35
## 11 \n$16 - $25 an hour $16 - $25 16.0 25
## 12 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 13 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 14 \n$30 - $50 an hour $30 - $50 30.0 50
## 15 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 17 \n$45 - $70 an hour $45 - $70 45.0 70
## 18 \n$18 - $35 an hour $18 - $35 18.0 35
## 19 \n$16 - $25 an hour $16 - $25 16.0 25
## 20 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 21 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 22 \n$30 - $50 an hour $30 - $50 30.0 50
## 23 \n$23 - $25 an hour $23 - $25 23.0 25
## 24 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 26 \n$45 - $70 an hour $45 - $70 45.0 70
## 27 \n$18 - $35 an hour $18 - $35 18.0 35
## 28 \n$16 - $25 an hour $16 - $25 16.0 25
## 29 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 30 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 31 \n$18 - $35 an hour $18 - $35 18.0 35
## 32 \n$16 - $25 an hour $16 - $25 16.0 25
## 33 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 34 \n$22.50 - $40.00 an hour $22.50 - $40.00 22.5 40
## 35 \n$23 an hour $23 23.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 22.5 40 23.95161 40.89286 15
## 3 22.5 40 23.95161 40.89286 15
## 4 22.5 40 23.95161 40.89286 15
## 5 22.5 40 23.95161 40.89286 15
## 6 22.5 40 23.95161 40.89286 15
## 7 22.5 40 23.95161 40.89286 15
## 9 22.5 40 23.95161 40.89286 15
## 10 22.5 40 23.95161 40.89286 15
## 11 22.5 40 23.95161 40.89286 15
## 12 22.5 40 23.95161 40.89286 15
## 13 22.5 40 23.95161 40.89286 15
## 14 22.5 40 23.95161 40.89286 15
## 15 22.5 40 23.95161 40.89286 15
## 17 22.5 40 23.95161 40.89286 15
## 18 22.5 40 23.95161 40.89286 15
## 19 22.5 40 23.95161 40.89286 15
## 20 22.5 40 23.95161 40.89286 15
## 21 22.5 40 23.95161 40.89286 15
## 22 22.5 40 23.95161 40.89286 15
## 23 22.5 40 23.95161 40.89286 15
## 24 22.5 40 23.95161 40.89286 15
## 26 22.5 40 23.95161 40.89286 15
## 27 22.5 40 23.95161 40.89286 15
## 28 22.5 40 23.95161 40.89286 15
## 29 22.5 40 23.95161 40.89286 15
## 30 22.5 40 23.95161 40.89286 15
## 31 22.5 40 23.95161 40.89286 15
## 32 22.5 40 23.95161 40.89286 15
## 33 22.5 40 23.95161 40.89286 15
## 34 22.5 40 23.95161 40.89286 15
## 35 22.5 40 23.95161 40.89286 15
## maximumMaxSalary
## 1 70
## 3 70
## 4 70
## 5 70
## 6 70
## 7 70
## 9 70
## 10 70
## 11 70
## 12 70
## 13 70
## 14 70
## 15 70
## 17 70
## 18 70
## 19 70
## 20 70
## 21 70
## 22 70
## 23 70
## 24 70
## 26 70
## 27 70
## 28 70
## 29 70
## 30 70
## 31 70
## 32 70
## 33 70
## 34 70
## 35 70
##
## [[7]]
## city state
## 1 Norfolk VA
## 2 Norfolk VA
## 3 Norfolk VA
## 4 Norfolk VA
## 5 Norfolk VA
## 6 Norfolk VA
## 7 Norfolk VA
## 8 Norfolk VA
## 9 Norfolk VA
## 10 Norfolk VA
## 11 Norfolk VA
## 12 Norfolk VA
## 13 Norfolk VA
## 14 Norfolk VA
## 15 Norfolk VA
## 16 Norfolk VA
## 17 Norfolk VA
## 18 Norfolk VA
## 19 Norfolk VA
## 20 Norfolk VA
## 21 Norfolk VA
## 22 Norfolk VA
## 23 Norfolk VA
## 24 Norfolk VA
## 25 Norfolk VA
## 26 Norfolk VA
## 27 Norfolk VA
## 28 Norfolk VA
## 29 Norfolk VA
## 30 Norfolk VA
## 31 Norfolk VA
## 32 Norfolk VA
## 33 Norfolk VA
## 34 Norfolk VA
## 35 Norfolk VA
## 36 Norfolk VA
## 37 Norfolk VA
## 38 Norfolk VA
## 39 Norfolk VA
## 40 Norfolk VA
## 41 Norfolk VA
## 42 Norfolk VA
## 43 Norfolk VA
## 44 Norfolk VA
## 45 Norfolk VA
## 46 Norfolk VA
## 47 Norfolk VA
## 48 Norfolk VA
## 49 Norfolk VA
## 50 Norfolk VA
## 51 Norfolk VA
## 52 Norfolk VA
## 53 Norfolk VA
## 54 Norfolk VA
## 55 Norfolk VA
## 56 Norfolk VA
## 57 Norfolk VA
## 58 Norfolk VA
## 59 Norfolk VA
## 60 Norfolk VA
## 61 Norfolk VA
## 62 Norfolk VA
## 63 Norfolk VA
## 64 Norfolk VA
## 65 Norfolk VA
## 66 Norfolk VA
## 67 Norfolk VA
## 68 Norfolk VA
## 69 Norfolk VA
## 70 Norfolk VA
## 71 Norfolk VA
## 72 Norfolk VA
## 73 Norfolk VA
## 74 Norfolk VA
## 75 Norfolk VA
## 76 Norfolk VA
## jobTitle
## 1 Massage Therapist
## 2 Medical office reopening after Covid seeking a Massage Thera...
## 3 Licensed Massage Therapist
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Newly Qualified Massage Therapist
## 7 Massage Therapist for NEW Location Opening Soon
## 8 Massage Therapist
## 9 Senior Massage Therapist
## 10 Massage Therapist
## 11 Newly Qualified Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist
## 14 Licensed Massage Therapist
## 15 Senior Massage Therapist
## 16 Massage Therapist
## 17 Senior Massage Therapist
## 18 2020 LICENSED MASSAGE THERAPISTS!!
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Senior Massage Therapist
## 22 Mobile Massage Therapist
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 25 Licensed Massage Therapist
## 26 Licensed Massage Therapist
## 27 Licensed Massage Therapist
## 28 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 29 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 30 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 31 Massage Therapist
## 32 Senior Massage Therapist
## 33 2020 LICENSED MASSAGE THERAPISTS!!
## 34 Massage Therapist
## 35 Massage Therapist
## 36 Senior Massage Therapist
## 37 Mobile Massage Therapist
## 38 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 39 Licensed Massage Therapist
## 40 Licensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 44 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 45 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 46 Senior Massage Therapist
## 47 Massage Therapist - Independent Contractor
## 48 2020 LICENSED MASSAGE THERAPISTS!!
## 49 Massage Therapist
## 50 Massage Therapist
## 51 Senior Massage Therapist
## 52 Mobile Massage Therapist
## 53 Licensed Massage Therapist
## 54 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 55 Licensed Massage Therapist
## 56 Licensed Massage Therapist
## 57 Licensed Massage Therapist
## 58 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 59 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 60 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 61 Licensed Massage Therapist (LMT)-Lucrative Opportunity
## 62 Licensed Massage Therapist
## 63 Part Time Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist
## 68 LICENSED MASSAGE THERAPISTS - WE ARE OPEN!!
## 69 PHASE 2 COVID-19 / OPEN & HIRING LICENSED MASSAGE THERAPISTS...
## 70 Massage Therapist - Competitive pay plans! - Flexible schedu...
## 71 Massage Therapist for NEW Location Opening Soon
## 72 Newly Qualified Massage Therapist
## 73 Massage Therapist
## 74 Medical office reopening after Covid seeking a Massage Thera...
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
## HiringAgency
## 1 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 2 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 3 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 4 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## 5 Indo-Pak Massage TherapyNorfolk, VA•Remote work available
## 6 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 7 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 8 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 9 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 10 Massage Envy3.2Norfolk, VA 23510 (Downtown area)+5 locations
## 11 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 12 Holistic Family Practice2.8Virginia Beach, VA 23451 (Linkhorn Park area)
## 13 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 14 Hand and Stone Spa3.0Chesapeake, VA 23322
## 15 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 16 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 17 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 18 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 19 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 20 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 21 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 22 Indo-Pak Massage TherapyChesapeake, VA
## 23 Hand and Stone Spa3.0Chesapeake, VA 23322
## 24 Wellness Clinic4.0Virginia Beach, VA 23456
## 25 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 26 Mizani FitnessHampton, VA
## 27 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 28 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 29 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 30 Massage Envy3.2Suffolk, VA 23435+1 location
## 31 Hand & Stone Virgnia BeachVirginia Beach, VA 23451
## 32 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 33 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 34 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 35 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 36 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 37 Indo-Pak Massage TherapyChesapeake, VA
## 38 Wellness Clinic4.0Virginia Beach, VA 23456
## 39 Hand and Stone Spa3.0Chesapeake, VA 23322
## 40 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 41 Mizani FitnessHampton, VA
## 42 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 43 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 44 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 45 Massage Envy3.2Suffolk, VA 23435+1 location
## 46 Hand & Stone Virgnia BeachVirginia Beach, VA 23456
## 47 Bella DaVinci Beauty SpaNorfolk, VA 23502
## 48 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 49 Innovative Therapy and Wellness4.0Virginia Beach, VA 23454 (Great Neck area)
## 50 SeaHill Spa at The CavalierVirginia Beach, VA 23451 (The North End area)
## 51 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 52 Indo-Pak Massage TherapyChesapeake, VA
## 53 Hand and Stone Spa3.0Chesapeake, VA 23322
## 54 Wellness Clinic4.0Virginia Beach, VA 23456
## 55 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 56 Mizani FitnessHampton, VA
## 57 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 58 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 59 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 60 Massage Envy3.2Suffolk, VA 23435+1 location
## 61 Wellness Clinic4.0Virginia Beach, VA 23456
## 62 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 63 Hand and Stone3.0Virginia Beach, VA 23456
## 64 Massage Envy3.2Virginia Beach, VA 23456 (Princess Anne area)
## 65 Hand and Stone3.0Chesapeake, VA 23320 (Greenbrier West area)
## 66 Mizani FitnessHampton, VA
## 67 Strawbridge Family ChiropracticVirginia Beach, VA 23456 (Princess Anne area)
## 68 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 69 Wine & Unwind Day Spa / LoungeVirginia Beach, VA 23462 (Bayside area)
## 70 Massage Envy3.2Suffolk, VA 23435+1 location
## 71 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 72 Hand and Stone Spa3.0Virginia Beach, VA 23450
## 73 Chiropractic OfficeChesapeake, VA 23321 (Western Branch South area)
## 74 Chiropractic Office3.3Chesapeake, VA 23321 (Western Branch South area)
## 75 Hand & Stone of VirginiaChesapeake, VA 23320 (Greenbrier West area)
## 76 Kempsville ChiropracticVirginia Beach, VA 23464 (Mears Corner area)
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 15 70 37977 45071
## 2 30 15 70 37977 45071
## 3 18 15 70 37977 45071
## 4 11 15 70 37977 45071
## 5 5 15 70 37977 45071
## 6 7 15 70 37977 45071
## 7 Today 15 70 37977 45071
## 8 Today 15 70 37977 45071
## 9 7 15 70 37977 45071
## 10 30 15 70 37977 45071
## 11 16 15 70 37977 45071
## 12 30 15 70 37977 45071
## 13 Today 15 70 37977 45071
## 14 7 15 70 37977 45071
## 15 16 15 70 37977 45071
## 16 Today 15 70 37977 45071
## 17 16 15 70 37977 45071
## 18 4 15 70 37977 45071
## 19 30 15 70 37977 45071
## 20 30 15 70 37977 45071
## 21 7 15 70 37977 45071
## 22 30 15 70 37977 45071
## 23 7 15 70 37977 45071
## 24 29 15 70 37977 45071
## 25 20 15 70 37977 45071
## 26 30 15 70 37977 45071
## 27 30 15 70 37977 45071
## 28 30 15 70 37977 45071
## 29 30 15 70 37977 45071
## 30 30 15 70 37977 45071
## 31 Today 15 70 37977 45071
## 32 16 15 70 37977 45071
## 33 4 15 70 37977 45071
## 34 30 15 70 37977 45071
## 35 30 15 70 37977 45071
## 36 7 15 70 37977 45071
## 37 30 15 70 37977 45071
## 38 29 15 70 37977 45071
## 39 7 15 70 37977 45071
## 40 20 15 70 37977 45071
## 41 30 15 70 37977 45071
## 42 30 15 70 37977 45071
## 43 30 15 70 37977 45071
## 44 30 15 70 37977 45071
## 45 30 15 70 37977 45071
## 46 16 15 70 37977 45071
## 47 14 15 70 37977 45071
## 48 4 15 70 37977 45071
## 49 30 15 70 37977 45071
## 50 30 15 70 37977 45071
## 51 7 15 70 37977 45071
## 52 30 15 70 37977 45071
## 53 7 15 70 37977 45071
## 54 29 15 70 37977 45071
## 55 20 15 70 37977 45071
## 56 30 15 70 37977 45071
## 57 30 15 70 37977 45071
## 58 30 15 70 37977 45071
## 59 30 15 70 37977 45071
## 60 30 15 70 37977 45071
## 61 29 15 70 37977 45071
## 62 10 15 70 37977 45071
## 63 30 15 70 37977 45071
## 64 20 15 70 37977 45071
## 65 30 15 70 37977 45071
## 66 30 15 70 37977 45071
## 67 30 15 70 37977 45071
## 68 30 15 70 37977 45071
## 69 30 15 70 37977 45071
## 70 30 15 70 37977 45071
## 71 Today 15 70 37977 45071
## 72 7 15 70 37977 45071
## 73 30 15 70 37977 45071
## 74 30 15 70 37977 45071
## 75 18 15 70 37977 45071
## 76 11 15 70 37977 45071
Washington Seattle, Spokane, Tacoma
getIndeedJobData5pages('massage therapist', 'Seattle','WA')
## Warning in getIndeedJobData5pages("massage therapist", "Seattle", "WA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Seattle", "WA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist (LMT)
## 4 Lead Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Licensed Massage Therapist
## 9 Looking for Massage Therapist who love their profession!!
## 10 Licensed Massage Therapist (LMT) - Full Time
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist, LMT
## 15 Massage Therapist - Independent Contractor
## 16 Massage Therapist needed for Chiropractic Office
## 17 Massage Therapist - Hiring Bonus
## 18 Massage Therapist Starting st $33-$35/Hour DOE
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Spa Massage Therapist
## 22 Massage Therapist (Dreamclinic Seattle and Redmond)
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapist (LMT)
## 27 Massage Therapist - Full-time or Part-time (Bellevue)
## 28 Licensed Massage Therapist - Seattle, WA
## 29 Full Time Licensed Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Lead Massage Therapist
## 36 Massage Therapist, LMT
## 37 Licensed Massage Therapist
## 38 Massage Therapist in Woodinville Wine Country (30% commissio...
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist needed for Chiropractic Office
## 44 Massage Therapist
## 45 Licensed Massage Therapist (LMT) - Full Time
## 46 Looking for Massage Therapist who love their profession!!
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist (LMT)
## 49 Licensed Massage Therapist
## 50 Mobile Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Rockstar Massage Therapist (LMT) Wanted - Great Company Cult...
## 54 Licensed Massage Therapist - POST COVID-19 - YOUR SAFETY IS...
## 55 Licensed Massage Therapist PT or FT Redmond Washington
## 56 Massage Therapist (Full-Time)
## 57 Seeking Massage Therapy Student
## 58 Massage Therapist - Full Time - University Village
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist, Independent Contractor
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapists
## 67 Part-time Massage Therapist
## 68 Licensed Massage Therapist
## 69 Sunday Massage Therapist
## 70 Massage Therapist
## 71 Licensed Massage Therapist (LMT)
## 72 Personal Trainer, Group Fitness Instructor, and Massage Ther...
## 73 Massage Therapist - Independent Contractor
## 74 FT/PT Licensed Massage Therapist Needed
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
## 77 LICENSED MASSAGE PRACTITIONER
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$35 an hour $35 35.00 NA
## 2 \n$34 - $37 an hour $34 - $37 34.00 37.00
## 3 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 4 \n$37 - $40 an hour $37 - $40 37.00 40.00
## 5 \n$30 - $38 an hour $30 - $38 30.00 38.00
## 6 \n$33 - $40 an hour $33 - $40 33.00 40.00
## 7 \n$17 - $40 an hour $17 - $40 17.00 40.00
## 8 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 9 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 10 \n$35 - $55 an hour $35 - $55 35.00 55.00
## 11 \n$32.50 - $42.50 an hour $32.50 - $42.50 32.50 42.50
## 12 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000.00
## 13 \n$28 - $40 an hour $28 - $40 28.00 40.00
## 14 \n$20 - $30 an hour $20 - $30 20.00 30.00
## 15 \n$33 - $35 an hour $33 - $35 33.00 35.00
## 16 \n$32 - $41 an hour $32 - $41 32.00 41.00
## 17 \n$34 - $40 an hour $34 - $40 34.00 40.00
## 18 \n$45 - $65 an hour $45 - $65 45.00 65.00
## 19 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 20 \n$60 - $65 an hour $60 - $65 60.00 65.00
## 21 \n$50 an hour $50 50.00 NA
## 22 \n$35 - $60 an hour $35 - $60 35.00 60.00
## 23 \n$35 an hour $35 35.00 NA
## 24 \n$30 - $38 an hour $30 - $38 30.00 38.00
## 25 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 26 \n$37 - $40 an hour $37 - $40 37.00 40.00
## 27 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 28 \n$32.50 - $42.50 an hour $32.50 - $42.50 32.50 42.50
## 29 \n$33 - $50 an hour $33 - $50 33.00 50.00
## 30 \n$30.50 - $40.50 an hour $30.50 - $40.50 30.50 40.50
## 31 \n$32 - $42 an hour $32 - $42 32.00 42.00
## 32 \n$59 - $70 an hour $59 - $70 59.00 70.00
## 33 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 34 \n$28 - $40 an hour $28 - $40 28.00 40.00
## 35 \n$35 - $42 an hour $35 - $42 35.00 42.00
## 36 \n$30 - $50 an hour $30 - $50 30.00 50.00
## 37 \n$28 - $31 an hour $28 - $31 28.00 31.00
## 38 \n$45 - $70 an hour $45 - $70 45.00 70.00
## 39 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 40 \n$35 - $42 an hour $35 - $42 35.00 42.00
## 41 \n$34 - $45 an hour ++ $34 - $45 34.00 45.00
## 42 \n$36 - $50 an hour $36 - $50 36.00 50.00
## 43 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 44 \n$40 - $55 an hour $40 - $55 40.00 55.00
## 45 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 46 \n$30 - $43 per session $30 - $43 per session 30.00 NA
## 47 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 48 \n$27 - $35 an hour $27 - $35 27.00 35.00
## 49 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 50 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 51 \n$25 - $32 an hour $25 - $32 25.00 32.00
## 52 \n$31 - $40 an hour $31 - $40 31.00 40.00
## 53 \n$25.66 - $39.27 an hour $25.66 - $39.27 25.66 39.27
## 54 \n$30 an hour $30 30.00 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 32.25 35 125.003 202.0673 17
## 2 32.25 35 125.003 202.0673 17
## 3 32.25 35 125.003 202.0673 17
## 4 32.25 35 125.003 202.0673 17
## 5 32.25 35 125.003 202.0673 17
## 6 32.25 35 125.003 202.0673 17
## 7 32.25 35 125.003 202.0673 17
## 8 32.25 35 125.003 202.0673 17
## 9 32.25 35 125.003 202.0673 17
## 10 32.25 35 125.003 202.0673 17
## 11 32.25 35 125.003 202.0673 17
## 12 32.25 35 125.003 202.0673 17
## 13 32.25 35 125.003 202.0673 17
## 14 32.25 35 125.003 202.0673 17
## 15 32.25 35 125.003 202.0673 17
## 16 32.25 35 125.003 202.0673 17
## 17 32.25 35 125.003 202.0673 17
## 18 32.25 35 125.003 202.0673 17
## 19 32.25 35 125.003 202.0673 17
## 20 32.25 35 125.003 202.0673 17
## 21 32.25 35 125.003 202.0673 17
## 22 32.25 35 125.003 202.0673 17
## 23 32.25 35 125.003 202.0673 17
## 24 32.25 35 125.003 202.0673 17
## 25 32.25 35 125.003 202.0673 17
## 26 32.25 35 125.003 202.0673 17
## 27 32.25 35 125.003 202.0673 17
## 28 32.25 35 125.003 202.0673 17
## 29 32.25 35 125.003 202.0673 17
## 30 32.25 35 125.003 202.0673 17
## 31 32.25 35 125.003 202.0673 17
## 32 32.25 35 125.003 202.0673 17
## 33 32.25 35 125.003 202.0673 17
## 34 32.25 35 125.003 202.0673 17
## 35 32.25 35 125.003 202.0673 17
## 36 32.25 35 125.003 202.0673 17
## 37 32.25 35 125.003 202.0673 17
## 38 32.25 35 125.003 202.0673 17
## 39 32.25 35 125.003 202.0673 17
## 40 32.25 35 125.003 202.0673 17
## 41 32.25 35 125.003 202.0673 17
## 42 32.25 35 125.003 202.0673 17
## 43 32.25 35 125.003 202.0673 17
## 44 32.25 35 125.003 202.0673 17
## 45 32.25 35 125.003 202.0673 17
## 46 32.25 35 125.003 202.0673 17
## 47 32.25 35 125.003 202.0673 17
## 48 32.25 35 125.003 202.0673 17
## 49 32.25 35 125.003 202.0673 17
## 50 32.25 35 125.003 202.0673 17
## 51 32.25 35 125.003 202.0673 17
## 52 32.25 35 125.003 202.0673 17
## 53 32.25 35 125.003 202.0673 17
## 54 32.25 35 125.003 202.0673 17
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
## 34 12000
## 35 12000
## 36 12000
## 37 12000
## 38 12000
## 39 12000
## 40 12000
## 41 12000
## 42 12000
## 43 12000
## 44 12000
## 45 12000
## 46 12000
## 47 12000
## 48 12000
## 49 12000
## 50 12000
## 51 12000
## 52 12000
## 53 12000
## 54 12000
##
## [[3]]
## date_daysAgo
## 1 1
## 2 30
## 3 Just posted
## 4 13
## 5 7
## 6 30
## 7 Today
## 8 13
## 9 30
## 10 25
## 11 7
## 12 6
## 13 Today
## 14 30
## 15 5
## 16 11
## 17 30
## 18 29
## 19 7
## 20 30
## 21 6
## 22 30
## 23 20
## 24 30
## 25 28
## 26 30
## 27 Today
## 28 30
## 29 Today
## 30 16
## 31 1
## 32 30
## 33 6
## 34 7
## 35 13
## 36 30
## 37 26
## 38 18
## 39 14
## 40 30
## 41 8
## 42 15
## 43 11
## 44 30
## 45 25
## 46 30
## 47 30
## 48 30
## 49 20
## 50 30
## 51 12
## 52 30
## 53 24
## 54 30
## 55 30
## 56 5
## 57 4
## 58 30
## 59 22
## 60 30
## 61 28
## 62 Today
## 63 30
## 64 22
## 65 26
## 66 27
## 67 21
## 68 30
## 69 30
## 70 30
## 71 27
## 72 30
## 73 18
## 74 30
## 75 22
## 76 21
## 77 30
##
## [[4]]
## HiringAgency
## 1 ReCru Hands LLCSeattle, WA
## 2 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 3 Unravel TherapeuticsSeattle, WA 98199 (Magnolia area)
## 4 Hand & Stone Massage and Facial Spa -3.0Kent, WA 98032
## 5 Issaquah Family ChiropracticIssaquah, WA 98027 (Issaquah Valley area)
## 6 Recoop SpaBellevue, WA 98004 (Downtown area)
## 7 Virk Chiropractic3.0Tukwila, WA 98188
## 8 InSpa Corporation3.5Seattle, WA 98109 (South Lake Union area)
## 9 Massage Envy3.2Bellevue, WA 98006 (Eastgate area)
## 10 Olympic Sports and Spine4.5Auburn, WA 98002
## 11 Hanson Chiropractic and InjuryEverett, WA 98204 (Holly area)
## 12 Fairwood Chiropractic ClinicRenton, WA 98058
## 13 Habitude Salons and Spa3.0Seattle, WA 98107 (Ballard area)
## 14 Seattle Wellness GroupSeattle, WA 98103 (Fremont area)
## 15 Indo-Pak Massage TherapySeattle, WA+1 location•Remote work available
## 16 Life Chiropractic & MassageFederal Way, WA 98003 (Kitts Corner area)
## 17 Experience MomentumSeattle, WA 98103 (Fremont area)
## 18 Intuitive Bodywork, PLLCSeattle, WA 98122 (Capitol Hill area)
## 19 Massage Envy - Manch HoldingsIssaquah, WA 98027 (Issaquah Valley area)
## 20 Massage Envy3.2Bellevue, WA 98007 (Overlake area)
## 21 Alderbrook Resort & Spa3.7Bremerton, WA
## 22 DreamclinicSeattle, WA
## 23 MD Injury CareRenton, WA 98057
## 24 916 NE 65th StreetSeattle, WA 98115 (Roosevelt area)
## 25 Olympus Spa2.8Lynnwood, WA 98036
## 26 City Sweats BellevueBellevue, WA 98004 (Downtown area)
## 27 Corazon Partners LLCBellevue, WA 98007 (Lake Hills area)+1 location
## 28 Flamingo4.2Seattle, WA 98109 (Westlake area)
## 29 Pro Fitness3.3Burien, WA 98166 (Evansville area)
## 30 Yuan SpaBellevue, WA 98004 (Downtown area)
## 31 ReCru Hands LLCSeattle, WA
## 32 Recoop SpaBellevue, WA 98004 (Downtown area)
## 33 Fairwood Chiropractic ClinicRenton, WA 98058
## 34 Issaquah Family ChiropracticIssaquah, WA 98027 (Issaquah Valley area)
## 35 Hand & Stone Massage and Facial Spa -3.0Kent, WA 98032
## 36 Seattle Wellness GroupSeattle, WA 98103 (Fremont area)
## 37 Corbin Chiropractic ClinicRenton, WA 98059
## 38 Benchmark Hospitality3.8Woodinville, WA 98072 (Tourist District area)
## 39 City Sweats4.5Seattle, WA 98103 (Wallingford area)
## 40 Elements3.6Kent, WA 98030+5 locations
## 41 NW Myotherapy AssociatesAuburn, WA 98002
## 42 CORNERSTONE CHIROPRACTICEverett, WA
## 43 Life Chiropractic & MassageFederal Way, WA 98003 (Kitts Corner area)
## 44 Madaley, LLCSeattle, WA 98119 (West Queen Anne area)
## 45 Olympic Sports and Spine4.5Auburn, WA 98002
## 46 Massage Envy3.2Bellevue, WA 98006 (Eastgate area)
## 47 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 48 Kent East ChiropracticKent, WA 98030
## 49 Smith Chiropractic & Sports RehabGig Harbor, WA+4 locations
## 50 Indo-Pak Massage TherapySeattle, WA+2 locations
## 51 Woodmark Hotel & Still Spa3.7Kirkland, WA 98033 (Lake View area)
## 52 PS Lifestyle3.0Redmond, WA+2 locations
## 53 LaVida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 54 Massage Envy - Manch HoldingsSeattle, WA 98119 (West Queen Anne area)+1 location
## 55 Hand and Stone3.0Redmond, WA 98052
## 56 Massage Envy3.2Woodinville, WA 98072 (Town Center area)
## 57 Massage Envy3.2Lynnwood, WA 98037
## 58 Gene Juarez Salon & Spa3.4Seattle, WA 98105 (Ravenna area)+2 locations
## 59 The Health and Wellness Clinic, PLLCEdmonds, WA 98026
## 60 Evergreen Massage & WellnessMountlake Terrace, WA
## 61 Lynnwood Family ChiropracticLynnwood, WA 98087
## 62 Lavida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 63 Hand and Stone3.0Shoreline, WA 98133+2 locations
## 64 Chiropractic Wellness CentersNewcastle, WA 98059
## 65 Pinnacle Health ChiropracticKirkland, WA 98034 (South Juanita area)
## 66 The Garage Massage TherapyIssaquah, WA
## 67 Alternative Back Care Physical TherapyGig Harbor, WA 98335 (Westside area)
## 68 Spavia Day Spa3.3Seattle, WA 98115 (Wedgwood area)
## 69 Hand and Stone3.0Shoreline, WA 98133
## 70 Una Bella Vita, LLCCovington, WA 98042
## 71 The Chiropractors Clinic & Massage Therapy CenterSilverdale, WA 98383
## 72 Basecamp Sports Performance Club3.3Kirkland, WA
## 73 Holistic Health Center of RentonRenton, WA 98057 (North Renton area)
## 74 Hand and Stone3.0Shoreline, WA 98133
## 75 Snohomish Natural HealthSnohomish, WA 98290
## 76 NW Therapeutic MassageSilverdale, WA 98383
## 77 Maya Whole Health StudioRenton, WA 98056
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$35 an hour $35 35.00 NA
## 2 \n$34 - $37 an hour $34 - $37 34.00 37.00
## 3 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 4 \n$37 - $40 an hour $37 - $40 37.00 40.00
## 5 \n$30 - $38 an hour $30 - $38 30.00 38.00
## 6 \n$33 - $40 an hour $33 - $40 33.00 40.00
## 7 \n$17 - $40 an hour $17 - $40 17.00 40.00
## 8 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 9 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 10 \n$35 - $55 an hour $35 - $55 35.00 55.00
## 11 \n$32.50 - $42.50 an hour $32.50 - $42.50 32.50 42.50
## 13 \n$28 - $40 an hour $28 - $40 28.00 40.00
## 14 \n$20 - $30 an hour $20 - $30 20.00 30.00
## 15 \n$33 - $35 an hour $33 - $35 33.00 35.00
## 16 \n$32 - $41 an hour $32 - $41 32.00 41.00
## 17 \n$34 - $40 an hour $34 - $40 34.00 40.00
## 18 \n$45 - $65 an hour $45 - $65 45.00 65.00
## 19 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 20 \n$60 - $65 an hour $60 - $65 60.00 65.00
## 21 \n$50 an hour $50 50.00 NA
## 22 \n$35 - $60 an hour $35 - $60 35.00 60.00
## 23 \n$35 an hour $35 35.00 NA
## 24 \n$30 - $38 an hour $30 - $38 30.00 38.00
## 25 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 26 \n$37 - $40 an hour $37 - $40 37.00 40.00
## 27 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 28 \n$32.50 - $42.50 an hour $32.50 - $42.50 32.50 42.50
## 29 \n$33 - $50 an hour $33 - $50 33.00 50.00
## 30 \n$30.50 - $40.50 an hour $30.50 - $40.50 30.50 40.50
## 31 \n$32 - $42 an hour $32 - $42 32.00 42.00
## 32 \n$59 - $70 an hour $59 - $70 59.00 70.00
## 33 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 34 \n$28 - $40 an hour $28 - $40 28.00 40.00
## 35 \n$35 - $42 an hour $35 - $42 35.00 42.00
## 36 \n$30 - $50 an hour $30 - $50 30.00 50.00
## 37 \n$28 - $31 an hour $28 - $31 28.00 31.00
## 38 \n$45 - $70 an hour $45 - $70 45.00 70.00
## 39 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 40 \n$35 - $42 an hour $35 - $42 35.00 42.00
## 41 \n$34 - $45 an hour ++ $34 - $45 34.00 45.00
## 42 \n$36 - $50 an hour $36 - $50 36.00 50.00
## 43 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 44 \n$40 - $55 an hour $40 - $55 40.00 55.00
## 45 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 47 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 48 \n$27 - $35 an hour $27 - $35 27.00 35.00
## 49 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 50 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 51 \n$25 - $32 an hour $25 - $32 25.00 32.00
## 52 \n$31 - $40 an hour $31 - $40 31.00 40.00
## 53 \n$25.66 - $39.27 an hour $25.66 - $39.27 25.66 39.27
## 54 \n$30 an hour $30 30.00 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 32.25 40 33.08 42.97438 17
## 2 32.25 40 33.08 42.97438 17
## 3 32.25 40 33.08 42.97438 17
## 4 32.25 40 33.08 42.97438 17
## 5 32.25 40 33.08 42.97438 17
## 6 32.25 40 33.08 42.97438 17
## 7 32.25 40 33.08 42.97438 17
## 8 32.25 40 33.08 42.97438 17
## 9 32.25 40 33.08 42.97438 17
## 10 32.25 40 33.08 42.97438 17
## 11 32.25 40 33.08 42.97438 17
## 13 32.25 40 33.08 42.97438 17
## 14 32.25 40 33.08 42.97438 17
## 15 32.25 40 33.08 42.97438 17
## 16 32.25 40 33.08 42.97438 17
## 17 32.25 40 33.08 42.97438 17
## 18 32.25 40 33.08 42.97438 17
## 19 32.25 40 33.08 42.97438 17
## 20 32.25 40 33.08 42.97438 17
## 21 32.25 40 33.08 42.97438 17
## 22 32.25 40 33.08 42.97438 17
## 23 32.25 40 33.08 42.97438 17
## 24 32.25 40 33.08 42.97438 17
## 25 32.25 40 33.08 42.97438 17
## 26 32.25 40 33.08 42.97438 17
## 27 32.25 40 33.08 42.97438 17
## 28 32.25 40 33.08 42.97438 17
## 29 32.25 40 33.08 42.97438 17
## 30 32.25 40 33.08 42.97438 17
## 31 32.25 40 33.08 42.97438 17
## 32 32.25 40 33.08 42.97438 17
## 33 32.25 40 33.08 42.97438 17
## 34 32.25 40 33.08 42.97438 17
## 35 32.25 40 33.08 42.97438 17
## 36 32.25 40 33.08 42.97438 17
## 37 32.25 40 33.08 42.97438 17
## 38 32.25 40 33.08 42.97438 17
## 39 32.25 40 33.08 42.97438 17
## 40 32.25 40 33.08 42.97438 17
## 41 32.25 40 33.08 42.97438 17
## 42 32.25 40 33.08 42.97438 17
## 43 32.25 40 33.08 42.97438 17
## 44 32.25 40 33.08 42.97438 17
## 45 32.25 40 33.08 42.97438 17
## 47 32.25 40 33.08 42.97438 17
## 48 32.25 40 33.08 42.97438 17
## 49 32.25 40 33.08 42.97438 17
## 50 32.25 40 33.08 42.97438 17
## 51 32.25 40 33.08 42.97438 17
## 52 32.25 40 33.08 42.97438 17
## 53 32.25 40 33.08 42.97438 17
## 54 32.25 40 33.08 42.97438 17
## maximumMaxSalary
## 1 70
## 2 70
## 3 70
## 4 70
## 5 70
## 6 70
## 7 70
## 8 70
## 9 70
## 10 70
## 11 70
## 13 70
## 14 70
## 15 70
## 16 70
## 17 70
## 18 70
## 19 70
## 20 70
## 21 70
## 22 70
## 23 70
## 24 70
## 25 70
## 26 70
## 27 70
## 28 70
## 29 70
## 30 70
## 31 70
## 32 70
## 33 70
## 34 70
## 35 70
## 36 70
## 37 70
## 38 70
## 39 70
## 40 70
## 41 70
## 42 70
## 43 70
## 44 70
## 45 70
## 47 70
## 48 70
## 49 70
## 50 70
## 51 70
## 52 70
## 53 70
## 54 70
##
## [[7]]
## city state
## 1 Seattle WA
## 2 Seattle WA
## 3 Seattle WA
## 4 Seattle WA
## 5 Seattle WA
## 6 Seattle WA
## 7 Seattle WA
## 8 Seattle WA
## 9 Seattle WA
## 10 Seattle WA
## 11 Seattle WA
## 12 Seattle WA
## 13 Seattle WA
## 14 Seattle WA
## 15 Seattle WA
## 16 Seattle WA
## 17 Seattle WA
## 18 Seattle WA
## 19 Seattle WA
## 20 Seattle WA
## 21 Seattle WA
## 22 Seattle WA
## 23 Seattle WA
## 24 Seattle WA
## 25 Seattle WA
## 26 Seattle WA
## 27 Seattle WA
## 28 Seattle WA
## 29 Seattle WA
## 30 Seattle WA
## 31 Seattle WA
## 32 Seattle WA
## 33 Seattle WA
## 34 Seattle WA
## 35 Seattle WA
## 36 Seattle WA
## 37 Seattle WA
## 38 Seattle WA
## 39 Seattle WA
## 40 Seattle WA
## 41 Seattle WA
## 42 Seattle WA
## 43 Seattle WA
## 44 Seattle WA
## 45 Seattle WA
## 46 Seattle WA
## 47 Seattle WA
## 48 Seattle WA
## 49 Seattle WA
## 50 Seattle WA
## 51 Seattle WA
## 52 Seattle WA
## 53 Seattle WA
## 54 Seattle WA
## 55 Seattle WA
## 56 Seattle WA
## 57 Seattle WA
## 58 Seattle WA
## 59 Seattle WA
## 60 Seattle WA
## 61 Seattle WA
## 62 Seattle WA
## 63 Seattle WA
## 64 Seattle WA
## 65 Seattle WA
## 66 Seattle WA
## 67 Seattle WA
## 68 Seattle WA
## 69 Seattle WA
## 70 Seattle WA
## 71 Seattle WA
## 72 Seattle WA
## 73 Seattle WA
## 74 Seattle WA
## 75 Seattle WA
## 76 Seattle WA
## 77 Seattle WA
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist (LMT)
## 4 Lead Massage Therapist
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist
## 8 Licensed Massage Therapist
## 9 Looking for Massage Therapist who love their profession!!
## 10 Licensed Massage Therapist (LMT) - Full Time
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist, LMT
## 15 Massage Therapist - Independent Contractor
## 16 Massage Therapist needed for Chiropractic Office
## 17 Massage Therapist - Hiring Bonus
## 18 Massage Therapist Starting st $33-$35/Hour DOE
## 19 Massage Therapist
## 20 Massage Therapist
## 21 Spa Massage Therapist
## 22 Massage Therapist (Dreamclinic Seattle and Redmond)
## 23 Licensed Massage Therapist
## 24 Licensed Massage Therapist
## 25 Massage Therapist
## 26 Licensed Massage Therapist (LMT)
## 27 Massage Therapist - Full-time or Part-time (Bellevue)
## 28 Licensed Massage Therapist - Seattle, WA
## 29 Full Time Licensed Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## 31 Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Lead Massage Therapist
## 36 Massage Therapist, LMT
## 37 Licensed Massage Therapist
## 38 Massage Therapist in Woodinville Wine Country (30% commissio...
## 39 Licensed Massage Therapist
## 40 Massage Therapist
## 41 Licensed Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist needed for Chiropractic Office
## 44 Massage Therapist
## 45 Licensed Massage Therapist (LMT) - Full Time
## 46 Looking for Massage Therapist who love their profession!!
## 47 Licensed Massage Therapist
## 48 Licensed Massage Therapist (LMT)
## 49 Licensed Massage Therapist
## 50 Mobile Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Rockstar Massage Therapist (LMT) Wanted - Great Company Cult...
## 54 Licensed Massage Therapist - POST COVID-19 - YOUR SAFETY IS...
## 55 Licensed Massage Therapist PT or FT Redmond Washington
## 56 Massage Therapist (Full-Time)
## 57 Seeking Massage Therapy Student
## 58 Massage Therapist - Full Time - University Village
## 59 Licensed Massage Therapist
## 60 Licensed Massage Therapist, Independent Contractor
## 61 Licensed Massage Therapist
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapists
## 67 Part-time Massage Therapist
## 68 Licensed Massage Therapist
## 69 Sunday Massage Therapist
## 70 Massage Therapist
## 71 Licensed Massage Therapist (LMT)
## 72 Personal Trainer, Group Fitness Instructor, and Massage Ther...
## 73 Massage Therapist - Independent Contractor
## 74 FT/PT Licensed Massage Therapist Needed
## 75 Licensed Massage Therapist
## 76 Licensed Massage Therapist
## 77 LICENSED MASSAGE PRACTITIONER
## HiringAgency
## 1 ReCru Hands LLCSeattle, WA
## 2 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 3 Unravel TherapeuticsSeattle, WA 98199 (Magnolia area)
## 4 Hand & Stone Massage and Facial Spa -3.0Kent, WA 98032
## 5 Issaquah Family ChiropracticIssaquah, WA 98027 (Issaquah Valley area)
## 6 Recoop SpaBellevue, WA 98004 (Downtown area)
## 7 Virk Chiropractic3.0Tukwila, WA 98188
## 8 InSpa Corporation3.5Seattle, WA 98109 (South Lake Union area)
## 9 Massage Envy3.2Bellevue, WA 98006 (Eastgate area)
## 10 Olympic Sports and Spine4.5Auburn, WA 98002
## 11 Hanson Chiropractic and InjuryEverett, WA 98204 (Holly area)
## 12 Fairwood Chiropractic ClinicRenton, WA 98058
## 13 Habitude Salons and Spa3.0Seattle, WA 98107 (Ballard area)
## 14 Seattle Wellness GroupSeattle, WA 98103 (Fremont area)
## 15 Indo-Pak Massage TherapySeattle, WA+1 location•Remote work available
## 16 Life Chiropractic & MassageFederal Way, WA 98003 (Kitts Corner area)
## 17 Experience MomentumSeattle, WA 98103 (Fremont area)
## 18 Intuitive Bodywork, PLLCSeattle, WA 98122 (Capitol Hill area)
## 19 Massage Envy - Manch HoldingsIssaquah, WA 98027 (Issaquah Valley area)
## 20 Massage Envy3.2Bellevue, WA 98007 (Overlake area)
## 21 Alderbrook Resort & Spa3.7Bremerton, WA
## 22 DreamclinicSeattle, WA
## 23 MD Injury CareRenton, WA 98057
## 24 916 NE 65th StreetSeattle, WA 98115 (Roosevelt area)
## 25 Olympus Spa2.8Lynnwood, WA 98036
## 26 City Sweats BellevueBellevue, WA 98004 (Downtown area)
## 27 Corazon Partners LLCBellevue, WA 98007 (Lake Hills area)+1 location
## 28 Flamingo4.2Seattle, WA 98109 (Westlake area)
## 29 Pro Fitness3.3Burien, WA 98166 (Evansville area)
## 30 Yuan SpaBellevue, WA 98004 (Downtown area)
## 31 ReCru Hands LLCSeattle, WA
## 32 Recoop SpaBellevue, WA 98004 (Downtown area)
## 33 Fairwood Chiropractic ClinicRenton, WA 98058
## 34 Issaquah Family ChiropracticIssaquah, WA 98027 (Issaquah Valley area)
## 35 Hand & Stone Massage and Facial Spa -3.0Kent, WA 98032
## 36 Seattle Wellness GroupSeattle, WA 98103 (Fremont area)
## 37 Corbin Chiropractic ClinicRenton, WA 98059
## 38 Benchmark Hospitality3.8Woodinville, WA 98072 (Tourist District area)
## 39 City Sweats4.5Seattle, WA 98103 (Wallingford area)
## 40 Elements3.6Kent, WA 98030+5 locations
## 41 NW Myotherapy AssociatesAuburn, WA 98002
## 42 CORNERSTONE CHIROPRACTICEverett, WA
## 43 Life Chiropractic & MassageFederal Way, WA 98003 (Kitts Corner area)
## 44 Madaley, LLCSeattle, WA 98119 (West Queen Anne area)
## 45 Olympic Sports and Spine4.5Auburn, WA 98002
## 46 Massage Envy3.2Bellevue, WA 98006 (Eastgate area)
## 47 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 48 Kent East ChiropracticKent, WA 98030
## 49 Smith Chiropractic & Sports RehabGig Harbor, WA+4 locations
## 50 Indo-Pak Massage TherapySeattle, WA+2 locations
## 51 Woodmark Hotel & Still Spa3.7Kirkland, WA 98033 (Lake View area)
## 52 PS Lifestyle3.0Redmond, WA+2 locations
## 53 LaVida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 54 Massage Envy - Manch HoldingsSeattle, WA 98119 (West Queen Anne area)+1 location
## 55 Hand and Stone3.0Redmond, WA 98052
## 56 Massage Envy3.2Woodinville, WA 98072 (Town Center area)
## 57 Massage Envy3.2Lynnwood, WA 98037
## 58 Gene Juarez Salon & Spa3.4Seattle, WA 98105 (Ravenna area)+2 locations
## 59 The Health and Wellness Clinic, PLLCEdmonds, WA 98026
## 60 Evergreen Massage & WellnessMountlake Terrace, WA
## 61 Lynnwood Family ChiropracticLynnwood, WA 98087
## 62 Lavida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 63 Hand and Stone3.0Shoreline, WA 98133+2 locations
## 64 Chiropractic Wellness CentersNewcastle, WA 98059
## 65 Pinnacle Health ChiropracticKirkland, WA 98034 (South Juanita area)
## 66 The Garage Massage TherapyIssaquah, WA
## 67 Alternative Back Care Physical TherapyGig Harbor, WA 98335 (Westside area)
## 68 Spavia Day Spa3.3Seattle, WA 98115 (Wedgwood area)
## 69 Hand and Stone3.0Shoreline, WA 98133
## 70 Una Bella Vita, LLCCovington, WA 98042
## 71 The Chiropractors Clinic & Massage Therapy CenterSilverdale, WA 98383
## 72 Basecamp Sports Performance Club3.3Kirkland, WA
## 73 Holistic Health Center of RentonRenton, WA 98057 (North Renton area)
## 74 Hand and Stone3.0Shoreline, WA 98133
## 75 Snohomish Natural HealthSnohomish, WA 98290
## 76 NW Therapeutic MassageSilverdale, WA 98383
## 77 Maya Whole Health StudioRenton, WA 98056
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 1 17 70 NA NA
## 2 30 17 70 NA NA
## 3 Just posted 17 70 NA NA
## 4 13 17 70 NA NA
## 5 7 17 70 NA NA
## 6 30 17 70 NA NA
## 7 Today 17 70 NA NA
## 8 13 17 70 NA NA
## 9 30 17 70 NA NA
## 10 25 17 70 NA NA
## 11 7 17 70 NA NA
## 12 6 17 70 NA NA
## 13 Today 17 70 NA NA
## 14 30 17 70 NA NA
## 15 5 17 70 NA NA
## 16 11 17 70 NA NA
## 17 30 17 70 NA NA
## 18 29 17 70 NA NA
## 19 7 17 70 NA NA
## 20 30 17 70 NA NA
## 21 6 17 70 NA NA
## 22 30 17 70 NA NA
## 23 20 17 70 NA NA
## 24 30 17 70 NA NA
## 25 28 17 70 NA NA
## 26 30 17 70 NA NA
## 27 Today 17 70 NA NA
## 28 30 17 70 NA NA
## 29 Today 17 70 NA NA
## 30 16 17 70 NA NA
## 31 1 17 70 NA NA
## 32 30 17 70 NA NA
## 33 6 17 70 NA NA
## 34 7 17 70 NA NA
## 35 13 17 70 NA NA
## 36 30 17 70 NA NA
## 37 26 17 70 NA NA
## 38 18 17 70 NA NA
## 39 14 17 70 NA NA
## 40 30 17 70 NA NA
## 41 8 17 70 NA NA
## 42 15 17 70 NA NA
## 43 11 17 70 NA NA
## 44 30 17 70 NA NA
## 45 25 17 70 NA NA
## 46 30 17 70 NA NA
## 47 30 17 70 NA NA
## 48 30 17 70 NA NA
## 49 20 17 70 NA NA
## 50 30 17 70 NA NA
## 51 12 17 70 NA NA
## 52 30 17 70 NA NA
## 53 24 17 70 NA NA
## 54 30 17 70 NA NA
## 55 30 17 70 NA NA
## 56 5 17 70 NA NA
## 57 4 17 70 NA NA
## 58 30 17 70 NA NA
## 59 22 17 70 NA NA
## 60 30 17 70 NA NA
## 61 28 17 70 NA NA
## 62 Today 17 70 NA NA
## 63 30 17 70 NA NA
## 64 22 17 70 NA NA
## 65 26 17 70 NA NA
## 66 27 17 70 NA NA
## 67 21 17 70 NA NA
## 68 30 17 70 NA NA
## 69 30 17 70 NA NA
## 70 30 17 70 NA NA
## 71 27 17 70 NA NA
## 72 30 17 70 NA NA
## 73 18 17 70 NA NA
## 74 30 17 70 NA NA
## 75 22 17 70 NA NA
## 76 21 17 70 NA NA
## 77 30 17 70 NA NA
getIndeedJobData5pages('massage therapist', 'Spokane','WA')
## Warning in getIndeedJobData5pages("massage therapist", "Spokane", "WA"): NAs
## introduced by coercion
## Warning in max(annual$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Spokane", "WA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Spokane", "WA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist (LMT)
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist
## 7 Massage Therapist
## 8 "BACK-UP" LICENSED MASSAGE THERAPIST
## 9 Massage Therapist-On Call
## 10 Licensed Massage Therapist
## 11 Massage Therapist
## 12 Licensed Massage Therapist
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist
## 15 Massage Therapist - Independent Contractor
## 16 Massage Therapist
## 17 Massage Therapist
## 18 "BACK-UP" LICENSED MASSAGE THERAPIST
## 19 Massage Therapist-On Call
## 20 Licensed Massage Therapist
## 21 Licensed Massage Therapist
## 22 Massage Therapist
## 23 Massage Therapist
## 24 Massage Therapist
## 25 Now Hiring Licensed Massage Therapist (LMP/LMT)
## 26 Massage Therapist
## 27 PART-TIME LICENSED MASSAGE THERAPIST
## 28 Licensed Massage Therapist (LMT)
## 29 Massage Therapist
## 30 Massage Therapist - Independent Contractor
## 31 Massage Therapist
## 32 Massage Therapist
## 33 "BACK-UP" LICENSED MASSAGE THERAPIST
## 34 Massage Therapist-On Call
## 35 Licensed Massage Therapist
## 36 Licensed Massage Therapist
## 37 Massage Therapist
## 38 Massage Therapist
## 39 Massage Therapist
## 40 Now Hiring Licensed Massage Therapist (LMP/LMT)
## 41 Massage Therapist
## 42 PART-TIME LICENSED MASSAGE THERAPIST
## 43 Licensed Massage Therapist (LMT)
## 44 Massage Therapist
## 45 Massage Therapist - Independent Contractor
## 46 Massage Therapist
## 47 Massage Therapist
## 48 "BACK-UP" LICENSED MASSAGE THERAPIST
## 49 Massage Therapist-On Call
## 50 Licensed Massage Therapist
## 51 Massage Therapist
## 52 Licensed Massage Therapist
## 53 Massage Therapist
## 54 Massage Therapist
## 55 Now Hiring Licensed Massage Therapist (LMP/LMT)
## 56 Massage Therapist
## 57 PART-TIME LICENSED MASSAGE THERAPIST
## 58 Licensed Massage Therapist (LMT)
## 59 Massage Therapist
## 60 "BACK-UP" LICENSED MASSAGE THERAPIST
## 61 Massage Therapist-On Call
## 62 Licensed Massage Therapist
## 63 Licensed Massage Therapist
## 64 Massage Therapist
## 65 Massage Therapist
## 66 Now Hiring Licensed Massage Therapist (LMP/LMT)
## 67 Massage Therapist
## 68 PART-TIME LICENSED MASSAGE THERAPIST
## 69 Licensed Massage Therapist
## 70 Massage Therapist
## 71 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$20 - $27 an hour $20 - $27 20 27
## 2 \n$30 - $40 an hour $30 - $40 30 40
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \n$40 an hour $40 40 NA
## 5 \n$50,000 a year $50000 50000 NA
## 6 \n$25 - $30 an hour $25 - $30 25 30
## 7 \n$28 - $32 an hour $28 - $32 28 32
## 8 \n$20 - $27 an hour $20 - $27 20 27
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \n$40 an hour $40 40 NA
## 11 \n$50,000 a year $50000 50000 NA
## 12 \n$29 an hour $29 29 NA
## 13 \n$25 - $30 an hour $25 - $30 25 30
## 14 \n$30 - $40 an hour $30 - $40 30 40
## 15 \n$20 - $30 an hour $20 - $30 20 30
## 16 \n$25 - $30 an hour $25 - $30 25 30
## 17 \n$20 - $27 an hour $20 - $27 20 27
## 18 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 19 \n$40 an hour $40 40 NA
## 20 \n$50,000 a year $50000 50000 NA
## 21 \n$29 an hour $29 29 NA
## 22 \n$25 - $30 an hour $25 - $30 25 30
## 23 \n$30 - $40 an hour $30 - $40 30 40
## 24 \n$20 - $30 an hour $20 - $30 20 30
## 25 \n$25 - $30 an hour $25 - $30 25 30
## 26 \n$20 - $27 an hour $20 - $27 20 27
## 27 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 28 \n$40 an hour $40 40 NA
## 29 \n$50,000 a year $50000 50000 NA
## 30 \n$25 - $30 an hour $25 - $30 25 30
## 31 \n$29 an hour $29 29 NA
## 32 \n$30 - $40 an hour $30 - $40 30 40
## 33 \n$20 - $30 an hour $20 - $30 20 30
## 34 \n$25 - $30 an hour $25 - $30 25 30
## 35 \n$20 - $27 an hour $20 - $27 20 27
## 36 \n$50,000 a year $50000 50000 NA
## 37 \n$29 an hour $29 29 NA
## 38 \n$25 - $30 an hour $25 - $30 25 30
## 39 \n$20 - $30 an hour $20 - $30 20 30
## 40 \n$25 - $30 an hour $25 - $30 25 30
## 41 \n$30 - $40 an hour $30 - $40 30 40
## 42 \n$28 - $32 an hour $28 - $32 28 32
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 29 30 6449.69 4502.479 20
## 2 29 30 6449.69 4502.479 20
## 3 29 30 6449.69 4502.479 20
## 4 29 30 6449.69 4502.479 20
## 5 29 30 6449.69 4502.479 20
## 6 29 30 6449.69 4502.479 20
## 7 29 30 6449.69 4502.479 20
## 8 29 30 6449.69 4502.479 20
## 9 29 30 6449.69 4502.479 20
## 10 29 30 6449.69 4502.479 20
## 11 29 30 6449.69 4502.479 20
## 12 29 30 6449.69 4502.479 20
## 13 29 30 6449.69 4502.479 20
## 14 29 30 6449.69 4502.479 20
## 15 29 30 6449.69 4502.479 20
## 16 29 30 6449.69 4502.479 20
## 17 29 30 6449.69 4502.479 20
## 18 29 30 6449.69 4502.479 20
## 19 29 30 6449.69 4502.479 20
## 20 29 30 6449.69 4502.479 20
## 21 29 30 6449.69 4502.479 20
## 22 29 30 6449.69 4502.479 20
## 23 29 30 6449.69 4502.479 20
## 24 29 30 6449.69 4502.479 20
## 25 29 30 6449.69 4502.479 20
## 26 29 30 6449.69 4502.479 20
## 27 29 30 6449.69 4502.479 20
## 28 29 30 6449.69 4502.479 20
## 29 29 30 6449.69 4502.479 20
## 30 29 30 6449.69 4502.479 20
## 31 29 30 6449.69 4502.479 20
## 32 29 30 6449.69 4502.479 20
## 33 29 30 6449.69 4502.479 20
## 34 29 30 6449.69 4502.479 20
## 35 29 30 6449.69 4502.479 20
## 36 29 30 6449.69 4502.479 20
## 37 29 30 6449.69 4502.479 20
## 38 29 30 6449.69 4502.479 20
## 39 29 30 6449.69 4502.479 20
## 40 29 30 6449.69 4502.479 20
## 41 29 30 6449.69 4502.479 20
## 42 29 30 6449.69 4502.479 20
## maximumMaxSalary
## 1 50000
## 2 50000
## 3 50000
## 4 50000
## 5 50000
## 6 50000
## 7 50000
## 8 50000
## 9 50000
## 10 50000
## 11 50000
## 12 50000
## 13 50000
## 14 50000
## 15 50000
## 16 50000
## 17 50000
## 18 50000
## 19 50000
## 20 50000
## 21 50000
## 22 50000
## 23 50000
## 24 50000
## 25 50000
## 26 50000
## 27 50000
## 28 50000
## 29 50000
## 30 50000
## 31 50000
## 32 50000
## 33 50000
## 34 50000
## 35 50000
## 36 50000
## 37 50000
## 38 50000
## 39 50000
## 40 50000
## 41 50000
## 42 50000
##
## [[3]]
## date_daysAgo
## 1 5
## 2 18
## 3 30
## 4 14
## 5 5
## 6 6
## 7 28
## 8 30
## 9 7
## 10 13
## 11 25
## 12 30
## 13 18
## 14 14
## 15 5
## 16 6
## 17 28
## 18 30
## 19 7
## 20 13
## 21 12
## 22 25
## 23 30
## 24 11
## 25 30
## 26 30
## 27 30
## 28 18
## 29 14
## 30 5
## 31 6
## 32 28
## 33 30
## 34 7
## 35 13
## 36 12
## 37 25
## 38 30
## 39 11
## 40 30
## 41 30
## 42 30
## 43 18
## 44 14
## 45 5
## 46 6
## 47 28
## 48 30
## 49 7
## 50 13
## 51 25
## 52 12
## 53 30
## 54 11
## 55 30
## 56 30
## 57 30
## 58 18
## 59 28
## 60 30
## 61 7
## 62 13
## 63 12
## 64 25
## 65 11
## 66 30
## 67 30
## 68 30
## 69 5
## 70 30
## 71 30
##
## [[4]]
## HiringAgency
## 1 Bond Family ChiropracticSpokane Valley, WA 99206
## 2 AHASpokane, WA 99202 (Rockwood area)
## 3 Elements Massage3.6Spokane Valley, WA 99037
## 4 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 5 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 6 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 7 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 8 BrickHouse3.8Spokane Valley, WA 99216
## 9 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 10 PS Lifestyle3.0Spokane, WA
## 11 Signature MassageSpokane, WA 99218
## 12 Spinal & Sports Care Clinic PSSpokane Valley, WA
## 13 AHASpokane, WA 99202 (Rockwood area)
## 14 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 15 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 16 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 17 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 18 BrickHouse3.8Spokane Valley, WA 99216
## 19 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 20 PS Lifestyle3.0Spokane, WA
## 21 Valente Chiropractic PLLCSpokane, WA 99208
## 22 Signature MassageSpokane, WA 99218
## 23 Elements Massage3.6Spokane Valley, WA 99037
## 24 Spokane Spine and DiscLiberty Lake, WA 99019
## 25 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 26 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 27 BrickHouse3.8Spokane Valley, WA 99216
## 28 AHASpokane, WA 99202 (Rockwood area)
## 29 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 30 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 31 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 32 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 33 BrickHouse3.8Spokane Valley, WA 99216
## 34 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 35 PS Lifestyle3.0Spokane, WA
## 36 Valente Chiropractic PLLCSpokane, WA 99208
## 37 Signature MassageSpokane, WA 99218
## 38 Elements Massage3.6Spokane Valley, WA 99037
## 39 Spokane Spine and DiscLiberty Lake, WA 99019
## 40 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 41 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 42 BrickHouse3.8Spokane Valley, WA 99216
## 43 AHASpokane, WA 99202 (Rockwood area)
## 44 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 45 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 46 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 47 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 48 BrickHouse3.8Spokane Valley, WA 99216
## 49 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 50 PS Lifestyle3.0Spokane, WA
## 51 Signature MassageSpokane, WA 99218
## 52 Valente Chiropractic PLLCSpokane, WA 99208
## 53 Elements Massage3.6Spokane Valley, WA 99037
## 54 Spokane Spine and DiscLiberty Lake, WA 99019
## 55 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 56 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 57 BrickHouse3.8Spokane Valley, WA 99216
## 58 AHASpokane, WA 99202 (Rockwood area)
## 59 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 60 BrickHouse3.8Spokane Valley, WA 99216
## 61 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 62 PS Lifestyle3.0Spokane, WA
## 63 Valente Chiropractic PLLCSpokane, WA 99208
## 64 Signature MassageSpokane, WA 99218
## 65 Spokane Spine and DiscLiberty Lake, WA 99019
## 66 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 67 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 68 BrickHouse3.8Spokane Valley, WA 99216
## 69 Bond Family ChiropracticSpokane Valley, WA 99206
## 70 Elements Massage3.6Spokane Valley, WA 99037
## 71 Spinal & Sports Care Clinic PSSpokane Valley, WA
##
## [[5]]
## Salary salary minSalary maxSalary medianMinSalary medianMaxSalary
## 5 \n$50,000 a year $50000 50000 NA 50000 NA
## 11 \n$50,000 a year $50000 50000 NA 50000 NA
## 20 \n$50,000 a year $50000 50000 NA 50000 NA
## 29 \n$50,000 a year $50000 50000 NA 50000 NA
## 36 \n$50,000 a year $50000 50000 NA 50000 NA
## avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 5 50000 NaN 50000 -Inf
## 11 50000 NaN 50000 -Inf
## 20 50000 NaN 50000 -Inf
## 29 50000 NaN 50000 -Inf
## 36 50000 NaN 50000 -Inf
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$20 - $27 an hour $20 - $27 20 27 25
## 2 \n$30 - $40 an hour $30 - $40 30 40 25
## 4 \n$40 an hour $40 40 NA 25
## 6 \n$25 - $30 an hour $25 - $30 25 30 25
## 7 \n$28 - $32 an hour $28 - $32 28 32 25
## 8 \n$20 - $27 an hour $20 - $27 20 27 25
## 10 \n$40 an hour $40 40 NA 25
## 12 \n$29 an hour $29 29 NA 25
## 13 \n$25 - $30 an hour $25 - $30 25 30 25
## 14 \n$30 - $40 an hour $30 - $40 30 40 25
## 15 \n$20 - $30 an hour $20 - $30 20 30 25
## 16 \n$25 - $30 an hour $25 - $30 25 30 25
## 17 \n$20 - $27 an hour $20 - $27 20 27 25
## 19 \n$40 an hour $40 40 NA 25
## 21 \n$29 an hour $29 29 NA 25
## 22 \n$25 - $30 an hour $25 - $30 25 30 25
## 23 \n$30 - $40 an hour $30 - $40 30 40 25
## 24 \n$20 - $30 an hour $20 - $30 20 30 25
## 25 \n$25 - $30 an hour $25 - $30 25 30 25
## 26 \n$20 - $27 an hour $20 - $27 20 27 25
## 28 \n$40 an hour $40 40 NA 25
## 30 \n$25 - $30 an hour $25 - $30 25 30 25
## 31 \n$29 an hour $29 29 NA 25
## 32 \n$30 - $40 an hour $30 - $40 30 40 25
## 33 \n$20 - $30 an hour $20 - $30 20 30 25
## 34 \n$25 - $30 an hour $25 - $30 25 30 25
## 35 \n$20 - $27 an hour $20 - $27 20 27 25
## 37 \n$29 an hour $29 29 NA 25
## 38 \n$25 - $30 an hour $25 - $30 25 30 25
## 39 \n$20 - $30 an hour $20 - $30 20 30 25
## 40 \n$25 - $30 an hour $25 - $30 25 30 25
## 41 \n$30 - $40 an hour $30 - $40 30 40 25
## 42 \n$28 - $32 an hour $28 - $32 28 32 25
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 30 26.87879 31.56 20 40
## 2 30 26.87879 31.56 20 40
## 4 30 26.87879 31.56 20 40
## 6 30 26.87879 31.56 20 40
## 7 30 26.87879 31.56 20 40
## 8 30 26.87879 31.56 20 40
## 10 30 26.87879 31.56 20 40
## 12 30 26.87879 31.56 20 40
## 13 30 26.87879 31.56 20 40
## 14 30 26.87879 31.56 20 40
## 15 30 26.87879 31.56 20 40
## 16 30 26.87879 31.56 20 40
## 17 30 26.87879 31.56 20 40
## 19 30 26.87879 31.56 20 40
## 21 30 26.87879 31.56 20 40
## 22 30 26.87879 31.56 20 40
## 23 30 26.87879 31.56 20 40
## 24 30 26.87879 31.56 20 40
## 25 30 26.87879 31.56 20 40
## 26 30 26.87879 31.56 20 40
## 28 30 26.87879 31.56 20 40
## 30 30 26.87879 31.56 20 40
## 31 30 26.87879 31.56 20 40
## 32 30 26.87879 31.56 20 40
## 33 30 26.87879 31.56 20 40
## 34 30 26.87879 31.56 20 40
## 35 30 26.87879 31.56 20 40
## 37 30 26.87879 31.56 20 40
## 38 30 26.87879 31.56 20 40
## 39 30 26.87879 31.56 20 40
## 40 30 26.87879 31.56 20 40
## 41 30 26.87879 31.56 20 40
## 42 30 26.87879 31.56 20 40
##
## [[7]]
## city state jobTitle
## 1 Spokane WA Licensed Massage Therapist
## 2 Spokane WA Licensed Massage Therapist (LMT)
## 3 Spokane WA Massage Therapist
## 4 Spokane WA Massage Therapist
## 5 Spokane WA Massage Therapist - Independent Contractor
## 6 Spokane WA Massage Therapist
## 7 Spokane WA Massage Therapist
## 8 Spokane WA "BACK-UP" LICENSED MASSAGE THERAPIST
## 9 Spokane WA Massage Therapist-On Call
## 10 Spokane WA Licensed Massage Therapist
## 11 Spokane WA Massage Therapist
## 12 Spokane WA Licensed Massage Therapist
## 13 Spokane WA Licensed Massage Therapist (LMT)
## 14 Spokane WA Massage Therapist
## 15 Spokane WA Massage Therapist - Independent Contractor
## 16 Spokane WA Massage Therapist
## 17 Spokane WA Massage Therapist
## 18 Spokane WA "BACK-UP" LICENSED MASSAGE THERAPIST
## 19 Spokane WA Massage Therapist-On Call
## 20 Spokane WA Licensed Massage Therapist
## 21 Spokane WA Licensed Massage Therapist
## 22 Spokane WA Massage Therapist
## 23 Spokane WA Massage Therapist
## 24 Spokane WA Massage Therapist
## 25 Spokane WA Now Hiring Licensed Massage Therapist (LMP/LMT)
## 26 Spokane WA Massage Therapist
## 27 Spokane WA PART-TIME LICENSED MASSAGE THERAPIST
## 28 Spokane WA Licensed Massage Therapist (LMT)
## 29 Spokane WA Massage Therapist
## 30 Spokane WA Massage Therapist - Independent Contractor
## 31 Spokane WA Massage Therapist
## 32 Spokane WA Massage Therapist
## 33 Spokane WA "BACK-UP" LICENSED MASSAGE THERAPIST
## 34 Spokane WA Massage Therapist-On Call
## 35 Spokane WA Licensed Massage Therapist
## 36 Spokane WA Licensed Massage Therapist
## 37 Spokane WA Massage Therapist
## 38 Spokane WA Massage Therapist
## 39 Spokane WA Massage Therapist
## 40 Spokane WA Now Hiring Licensed Massage Therapist (LMP/LMT)
## 41 Spokane WA Massage Therapist
## 42 Spokane WA PART-TIME LICENSED MASSAGE THERAPIST
## 43 Spokane WA Licensed Massage Therapist (LMT)
## 44 Spokane WA Massage Therapist
## 45 Spokane WA Massage Therapist - Independent Contractor
## 46 Spokane WA Massage Therapist
## 47 Spokane WA Massage Therapist
## 48 Spokane WA "BACK-UP" LICENSED MASSAGE THERAPIST
## 49 Spokane WA Massage Therapist-On Call
## 50 Spokane WA Licensed Massage Therapist
## 51 Spokane WA Massage Therapist
## 52 Spokane WA Licensed Massage Therapist
## 53 Spokane WA Massage Therapist
## 54 Spokane WA Massage Therapist
## 55 Spokane WA Now Hiring Licensed Massage Therapist (LMP/LMT)
## 56 Spokane WA Massage Therapist
## 57 Spokane WA PART-TIME LICENSED MASSAGE THERAPIST
## 58 Spokane WA Licensed Massage Therapist (LMT)
## 59 Spokane WA Massage Therapist
## 60 Spokane WA "BACK-UP" LICENSED MASSAGE THERAPIST
## 61 Spokane WA Massage Therapist-On Call
## 62 Spokane WA Licensed Massage Therapist
## 63 Spokane WA Licensed Massage Therapist
## 64 Spokane WA Massage Therapist
## 65 Spokane WA Massage Therapist
## 66 Spokane WA Now Hiring Licensed Massage Therapist (LMP/LMT)
## 67 Spokane WA Massage Therapist
## 68 Spokane WA PART-TIME LICENSED MASSAGE THERAPIST
## 69 Spokane WA Licensed Massage Therapist
## 70 Spokane WA Massage Therapist
## 71 Spokane WA Licensed Massage Therapist
## HiringAgency
## 1 Bond Family ChiropracticSpokane Valley, WA 99206
## 2 AHASpokane, WA 99202 (Rockwood area)
## 3 Elements Massage3.6Spokane Valley, WA 99037
## 4 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 5 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 6 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 7 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 8 BrickHouse3.8Spokane Valley, WA 99216
## 9 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 10 PS Lifestyle3.0Spokane, WA
## 11 Signature MassageSpokane, WA 99218
## 12 Spinal & Sports Care Clinic PSSpokane Valley, WA
## 13 AHASpokane, WA 99202 (Rockwood area)
## 14 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 15 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 16 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 17 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 18 BrickHouse3.8Spokane Valley, WA 99216
## 19 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 20 PS Lifestyle3.0Spokane, WA
## 21 Valente Chiropractic PLLCSpokane, WA 99208
## 22 Signature MassageSpokane, WA 99218
## 23 Elements Massage3.6Spokane Valley, WA 99037
## 24 Spokane Spine and DiscLiberty Lake, WA 99019
## 25 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 26 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 27 BrickHouse3.8Spokane Valley, WA 99216
## 28 AHASpokane, WA 99202 (Rockwood area)
## 29 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 30 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 31 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 32 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 33 BrickHouse3.8Spokane Valley, WA 99216
## 34 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 35 PS Lifestyle3.0Spokane, WA
## 36 Valente Chiropractic PLLCSpokane, WA 99208
## 37 Signature MassageSpokane, WA 99218
## 38 Elements Massage3.6Spokane Valley, WA 99037
## 39 Spokane Spine and DiscLiberty Lake, WA 99019
## 40 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 41 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 42 BrickHouse3.8Spokane Valley, WA 99216
## 43 AHASpokane, WA 99202 (Rockwood area)
## 44 INHS/St. Luke's RehabilitationSpokane, WA 99202 (East Central area)
## 45 Indo-Pak Massage TherapySpokane, WA•Remote work available
## 46 Northern Quest Resort and Casino3.8Airway Heights, WA 99001
## 47 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 48 BrickHouse3.8Spokane Valley, WA 99216
## 49 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 50 PS Lifestyle3.0Spokane, WA
## 51 Signature MassageSpokane, WA 99218
## 52 Valente Chiropractic PLLCSpokane, WA 99208
## 53 Elements Massage3.6Spokane Valley, WA 99037
## 54 Spokane Spine and DiscLiberty Lake, WA 99019
## 55 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 56 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 57 BrickHouse3.8Spokane Valley, WA 99216
## 58 AHASpokane, WA 99202 (Rockwood area)
## 59 Elements3.6Spokane, WA 99223 (Moran Prairie area)+1 location
## 60 BrickHouse3.8Spokane Valley, WA 99216
## 61 Northern Quest Resort & Casino3.8Airway Heights, WA 99001
## 62 PS Lifestyle3.0Spokane, WA
## 63 Valente Chiropractic PLLCSpokane, WA 99208
## 64 Signature MassageSpokane, WA 99218
## 65 Spokane Spine and DiscLiberty Lake, WA 99019
## 66 Pearson & Weary ChiropracticSpokane Valley, WA 99216
## 67 Massage Envy3.2Spokane, WA 99203 (Rockwood area)
## 68 BrickHouse3.8Spokane Valley, WA 99216
## 69 Bond Family ChiropracticSpokane Valley, WA 99206
## 70 Elements Massage3.6Spokane Valley, WA 99037
## 71 Spinal & Sports Care Clinic PSSpokane Valley, WA
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 5 20 40 50000 50000
## 2 18 20 40 50000 50000
## 3 30 20 40 50000 50000
## 4 14 20 40 50000 50000
## 5 5 20 40 50000 50000
## 6 6 20 40 50000 50000
## 7 28 20 40 50000 50000
## 8 30 20 40 50000 50000
## 9 7 20 40 50000 50000
## 10 13 20 40 50000 50000
## 11 25 20 40 50000 50000
## 12 30 20 40 50000 50000
## 13 18 20 40 50000 50000
## 14 14 20 40 50000 50000
## 15 5 20 40 50000 50000
## 16 6 20 40 50000 50000
## 17 28 20 40 50000 50000
## 18 30 20 40 50000 50000
## 19 7 20 40 50000 50000
## 20 13 20 40 50000 50000
## 21 12 20 40 50000 50000
## 22 25 20 40 50000 50000
## 23 30 20 40 50000 50000
## 24 11 20 40 50000 50000
## 25 30 20 40 50000 50000
## 26 30 20 40 50000 50000
## 27 30 20 40 50000 50000
## 28 18 20 40 50000 50000
## 29 14 20 40 50000 50000
## 30 5 20 40 50000 50000
## 31 6 20 40 50000 50000
## 32 28 20 40 50000 50000
## 33 30 20 40 50000 50000
## 34 7 20 40 50000 50000
## 35 13 20 40 50000 50000
## 36 12 20 40 50000 50000
## 37 25 20 40 50000 50000
## 38 30 20 40 50000 50000
## 39 11 20 40 50000 50000
## 40 30 20 40 50000 50000
## 41 30 20 40 50000 50000
## 42 30 20 40 50000 50000
## 43 18 20 40 50000 50000
## 44 14 20 40 50000 50000
## 45 5 20 40 50000 50000
## 46 6 20 40 50000 50000
## 47 28 20 40 50000 50000
## 48 30 20 40 50000 50000
## 49 7 20 40 50000 50000
## 50 13 20 40 50000 50000
## 51 25 20 40 50000 50000
## 52 12 20 40 50000 50000
## 53 30 20 40 50000 50000
## 54 11 20 40 50000 50000
## 55 30 20 40 50000 50000
## 56 30 20 40 50000 50000
## 57 30 20 40 50000 50000
## 58 18 20 40 50000 50000
## 59 28 20 40 50000 50000
## 60 30 20 40 50000 50000
## 61 7 20 40 50000 50000
## 62 13 20 40 50000 50000
## 63 12 20 40 50000 50000
## 64 25 20 40 50000 50000
## 65 11 20 40 50000 50000
## 66 30 20 40 50000 50000
## 67 30 20 40 50000 50000
## 68 30 20 40 50000 50000
## 69 5 20 40 50000 50000
## 70 30 20 40 50000 50000
## 71 30 20 40 50000 50000
getIndeedJobData5pages('massage therapist', 'Tacoma','WA')
## Warning in getIndeedJobData5pages("massage therapist", "Tacoma", "WA"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Tacoma", "WA"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist
## 2 Licensed Massage Therapist
## 3 Licensed Massage Therapist (LMT) - Full Time
## 4 Licensed Massage Therapist
## 5 Liscensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Full Time Licensed Massage Therapist Tacoma
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Massage Therapist
## 13 Licensed Massage Therapist
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist
## 17 Licensed Massage Therapist
## 18 Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Part-time Massage Therapist
## 22 Massage Therapist
## 23 Massage Therapist
## 24 Massage Therapist
## 25 Massage Therapist - Independent Contractor
## 26 Licensed Massage Therapist (LMT)
## 27 Massage Therapist - Tacoma
## 28 Licensed Massage Therapist
## 29 Massage Therapist
## 30 Massage Therapist
## 31 Licensed Massage Therapist
## 32 Massage Therapist
## 33 Licensed Massage Therapist
## 34 Massage Therapist
## 35 Licensed Massage Therapist (LMT) - Full Time
## 36 Licensed Massage Therapist
## 37 Licensed Massage Therapist
## 38 Licensed Massage Therapist
## 39 Massage Therapist
## 40 Liscensed Massage Therapist
## 41 Licensed Massage Therapist
## 42 Massage Therapist
## 43 Massage Therapist
## 44 Massage Therapist
## 45 Licensed Massage Therapist
## 46 Licensed Massage Therapist
## 47 Massage Therapist
## 48 Rockstar Massage Therapist (LMT) Wanted - Great Company Cult...
## 49 Medical Massage Therapist
## 50 Licensed Massage Therapist
## 51 Full Time Licensed Massage Therapist Tacoma
## 52 Licensed Massage Therapist
## 53 Licensed Massage Therapist
## 54 Licensed Massage Therapist- POST COVID-19 - YOUR SAFETY IS O...
## 55 Massage Therapist - Independent Contractor
## 56 Massage Therapist (Dreamclinic Seattle and Redmond)
## 57 Mobile Massage Therapist - Independent Contractor
## 58 Licensed Massage Therapist
## 59 LICENSED MASSAGE PRACTITIONER
## 60 Massage Therapist
## 61 Mobile Massage Therapist
## 62 Dual Licensed Acupuncturist & Massage Therapist, Seattle
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist (FT)
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 Licensed Massage Therapist (LMT), part time / full time
## 68 Licensed Massage Therapist
## 69 Licensed Massage Therapist- POST COVID-19 - YOUR SAFETY IS O...
## 70 Massage Therapist - Independent Contractor
## 71 Massage Therapist (Dreamclinic Seattle and Redmond)
## 72 Mobile Massage Therapist - Independent Contractor
## 73 Licensed Massage Therapist
## 74 LICENSED MASSAGE PRACTITIONER
## 75 Massage Therapist
## 76 Mobile Massage Therapist
## 77 Dual Licensed Acupuncturist & Massage Therapist, Seattle
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30 - $41 an hour $30 - $41 30.00 41.00
## 2 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 3 \nUp to $34 an hour $34 34.00 NA
## 4 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 5 \n$30 - $37 an hour $30 - $37 30.00 37.00
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000.00 12000.00
## 7 \n$22 - $35 an hour $22 - $35 22.00 35.00
## 8 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 9 \n$35 an hour $35 35.00 NA
## 10 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 11 \n$27 - $38 an hour $27 - $38 27.00 38.00
## 12 \n$33 - $40 an hour $33 - $40 33.00 40.00
## 13 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 14 \n$50 an hour $50 50.00 NA
## 15 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 16 \n$22 - $32 an hour $22 - $32 22.00 32.00
## 17 \n$59 - $70 an hour $59 - $70 59.00 70.00
## 18 \nFrom $30 an hour $30 30.00 NA
## 19 \n$31 - $40 an hour $31 - $40 31.00 40.00
## 20 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 21 \n$32 - $42 an hour $32 - $42 32.00 42.00
## 22 \n$30 - $43 per session $30 - $43 per session 30.00 NA
## 23 \n$21 - $35 an hour $21 - $35 21.00 35.00
## 24 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 25 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 26 \n$30 - $41 an hour $30 - $41 30.00 41.00
## 27 \nUp to $34 an hour $34 34.00 NA
## 28 \n$59 - $70 an hour $59 - $70 59.00 70.00
## 29 \nFrom $30 an hour $30 30.00 NA
## 30 \n$31 - $40 an hour $31 - $40 31.00 40.00
## 31 \n$32 - $42 an hour $32 - $42 32.00 42.00
## 32 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 33 \n$30 - $43 per session $30 - $43 per session 30.00 NA
## 34 \n$21 - $35 an hour $21 - $35 21.00 35.00
## 35 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 36 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 37 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 38 \n$30 - $37 an hour $30 - $37 30.00 37.00
## 39 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 40 \n$31 - $41 an hour $31 - $41 31.00 41.00
## 41 \n$25.66 - $39.27 an hour $25.66 - $39.27 25.66 39.27
## 42 \n$35 - $50 an hour $35 - $50 35.00 50.00
## 43 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 44 \n$45 - $70 an hour $45 - $70 45.00 70.00
## 45 \nFrom $34 an hour $34 34.00 NA
## 46 \n$36.75 - $46.75 an hour $36.75 - $46.75 36.75 46.75
## 47 \n$32 - $45 an hour $32 - $45 32.00 45.00
## 48 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 49 \n$31 - $41 an hour $31 - $41 31.00 41.00
## 50 \n$25.66 - $39.27 an hour $25.66 - $39.27 25.66 39.27
## 51 \n$35 - $50 an hour $35 - $50 35.00 50.00
## 52 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 53 \n$45 - $70 an hour $45 - $70 45.00 70.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 35 125.19 210.2305 20
## 2 30 35 125.19 210.2305 20
## 3 30 35 125.19 210.2305 20
## 4 30 35 125.19 210.2305 20
## 5 30 35 125.19 210.2305 20
## 6 30 35 125.19 210.2305 20
## 7 30 35 125.19 210.2305 20
## 8 30 35 125.19 210.2305 20
## 9 30 35 125.19 210.2305 20
## 10 30 35 125.19 210.2305 20
## 11 30 35 125.19 210.2305 20
## 12 30 35 125.19 210.2305 20
## 13 30 35 125.19 210.2305 20
## 14 30 35 125.19 210.2305 20
## 15 30 35 125.19 210.2305 20
## 16 30 35 125.19 210.2305 20
## 17 30 35 125.19 210.2305 20
## 18 30 35 125.19 210.2305 20
## 19 30 35 125.19 210.2305 20
## 20 30 35 125.19 210.2305 20
## 21 30 35 125.19 210.2305 20
## 22 30 35 125.19 210.2305 20
## 23 30 35 125.19 210.2305 20
## 24 30 35 125.19 210.2305 20
## 25 30 35 125.19 210.2305 20
## 26 30 35 125.19 210.2305 20
## 27 30 35 125.19 210.2305 20
## 28 30 35 125.19 210.2305 20
## 29 30 35 125.19 210.2305 20
## 30 30 35 125.19 210.2305 20
## 31 30 35 125.19 210.2305 20
## 32 30 35 125.19 210.2305 20
## 33 30 35 125.19 210.2305 20
## 34 30 35 125.19 210.2305 20
## 35 30 35 125.19 210.2305 20
## 36 30 35 125.19 210.2305 20
## 37 30 35 125.19 210.2305 20
## 38 30 35 125.19 210.2305 20
## 39 30 35 125.19 210.2305 20
## 40 30 35 125.19 210.2305 20
## 41 30 35 125.19 210.2305 20
## 42 30 35 125.19 210.2305 20
## 43 30 35 125.19 210.2305 20
## 44 30 35 125.19 210.2305 20
## 45 30 35 125.19 210.2305 20
## 46 30 35 125.19 210.2305 20
## 47 30 35 125.19 210.2305 20
## 48 30 35 125.19 210.2305 20
## 49 30 35 125.19 210.2305 20
## 50 30 35 125.19 210.2305 20
## 51 30 35 125.19 210.2305 20
## 52 30 35 125.19 210.2305 20
## 53 30 35 125.19 210.2305 20
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
## 16 12000
## 17 12000
## 18 12000
## 19 12000
## 20 12000
## 21 12000
## 22 12000
## 23 12000
## 24 12000
## 25 12000
## 26 12000
## 27 12000
## 28 12000
## 29 12000
## 30 12000
## 31 12000
## 32 12000
## 33 12000
## 34 12000
## 35 12000
## 36 12000
## 37 12000
## 38 12000
## 39 12000
## 40 12000
## 41 12000
## 42 12000
## 43 12000
## 44 12000
## 45 12000
## 46 12000
## 47 12000
## 48 12000
## 49 12000
## 50 12000
## 51 12000
## 52 12000
## 53 12000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 30
## 3 25
## 4 6
## 5 15
## 6 28
## 7 14
## 8 Just posted
## 9 5
## 10 5
## 11 4
## 12 19
## 13 13
## 14 13
## 15 Just posted
## 16 Today
## 17 4
## 18 30
## 19 30
## 20 Just posted
## 21 21
## 22 30
## 23 20
## 24 13
## 25 15
## 26 30
## 27 30
## 28 8
## 29 7
## 30 30
## 31 25
## 32 30
## 33 Today
## 34 15
## 35 25
## 36 28
## 37 30
## 38 30
## 39 30
## 40 15
## 41 8
## 42 7
## 43 30
## 44 30
## 45 25
## 46 Today
## 47 15
## 48 24
## 49 30
## 50 6
## 51 14
## 52 30
## 53 22
## 54 30
## 55 18
## 56 30
## 57 30
## 58 24
## 59 30
## 60 6
## 61 30
## 62 30
## 63 30
## 64 5
## 65 Today
## 66 27
## 67 13
## 68 22
## 69 30
## 70 18
## 71 30
## 72 30
## 73 24
## 74 30
## 75 6
## 76 30
## 77 30
##
## [[4]]
## HiringAgency
## 1 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 2 Rody Chiropractic, Massage, and HealthPuyallup, WA 98373
## 3 Olympic Sports and Spine4.5Auburn, WA 98002
## 4 Fairwood Chiropractic ClinicRenton, WA 98058
## 5 Vision Quest MassagePuyallup, WA 98373
## 6 Petersen Chiropractic4.5Belfair, WA 98528
## 7 Premier Chiropractic of TacomaTacoma, WA 98444 (South End area)
## 8 Mountain View Chiropractic and Wellness CenterBonney Lake, WA 98391
## 9 Indo-Pak Massage TherapyTacoma, WA+1 location•Remote work available
## 10 The Health ConnectionTacoma, WA 98405 (Central area)
## 11 Marconi Chiropractic and WellnessTacoma, WA 98405 (New Tacoma area)
## 12 ReCru Hands LLCTacoma, WA+1 location
## 13 Alternative Back Care Physical TherapyTacoma, WA 98403 (North End area)
## 14 Bella Terra SpaPuyallup, WA 98371
## 15 Hand & Stone Massage and Facial Spa - University P...3.0University Place, WA 98466+2 locations
## 16 Virk Chiropractic3.0Tukwila, WA 98188
## 17 Olympic Sports and Spine4.5University Place, WA 98466
## 18 Massage Envy3.2Gig Harbor, WA 98335
## 19 Torres Chiropractic, PSLakewood, WA 98499 (Tyee Park area)
## 20 DORN4.5Lacey, WA 98516
## 21 Alternative Back Care Physical TherapyGig Harbor, WA 98335 (Westside area)
## 22 Ms Beautiful MeLakewood, WA 98499 (Dower area)
## 23 Ideal Motion ChiropracticBonney Lake, WA 98391
## 24 All Ways ChiropracticOlympia, WA 98501
## 25 Ideal Motion ChiropracticBonney Lake, WA 98391
## 26 Natural Life MedicinePuyallup, WA 98372 (Southhill area)
## 27 Gene Juarez Salon & Spa3.4Tacoma, WA 98409 (South Tacoma area)
## 28 NW Myotherapy AssociatesAuburn, WA 98002
## 29 Hand & Stone - OR & WA3.0Puyallup, WA 98374+3 locations
## 30 Massage Envy - Manch HoldingsPuyallup, WA 98373 (Southhill area)
## 31 T&P Foot massage and aromatherapyPuyallup, WA 98373
## 32 Elements3.6Kent, WA 98030+1 location
## 33 Lavida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 34 Penrose & Associates Physical Therapy4.8Lacey, WA 98516
## 35 Olympic Sports and Spine4.5Auburn, WA 98002
## 36 Petersen Chiropractic4.5Belfair, WA 98528
## 37 Torres Chiropractic, PSLakewood, WA 98499 (Tyee Park area)
## 38 Rody Chiropractic, Massage, and HealthPuyallup, WA 98373
## 39 Massage Envy3.2Gig Harbor, WA 98335
## 40 Vision Quest MassagePuyallup, WA 98373
## 41 NW Myotherapy AssociatesAuburn, WA 98002
## 42 Hand & Stone - OR & WA3.0Puyallup, WA 98374+3 locations
## 43 Massage Envy - Manch HoldingsPuyallup, WA 98373 (Southhill area)
## 44 Elements3.6Kent, WA 98030+1 location
## 45 T&P Foot massage and aromatherapyPuyallup, WA 98373
## 46 Lavida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 47 Penrose & Associates Physical Therapy4.8Lacey, WA 98516
## 48 LaVida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 49 Living Well ChiropracticYelm, WA 98597
## 50 Fairwood Chiropractic ClinicRenton, WA 98058
## 51 Premier Chiropractic of TacomaTacoma, WA 98444 (South End area)
## 52 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 53 Chiropractic Wellness CentersNewcastle, WA 98059
## 54 Massage Envy - Manch HoldingsCovington, WA 98042
## 55 Holistic Health Center of RentonRenton, WA 98057 (North Renton area)
## 56 DreamclinicSeattle, WA
## 57 Layin on of HandsRenton, WA
## 58 Soothe3.7Seattle, WA
## 59 Maya Whole Health StudioRenton, WA 98056
## 60 Balance Chiropractic CenterSeattle, WA 98118 (Dunlap area)
## 61 Indo-Pak Massage TherapySeattle, WA
## 62 DreamclinicSeattle, WA
## 63 Bonney Lake Physical Therapy and Hand RehabBonney Lake, WA 98391
## 64 DreamclinicSeattle, WA
## 65 DreamclinicSeattle, WA
## 66 ZOOM+Care2.8Seattle, WA
## 67 City Sweats West SeattleSeattle, WA 98116 (Admiral area)
## 68 Chiropractic Wellness CentersNewcastle, WA 98059
## 69 Massage Envy - Manch HoldingsCovington, WA 98042
## 70 Holistic Health Center of RentonRenton, WA 98057 (North Renton area)
## 71 DreamclinicSeattle, WA
## 72 Layin on of HandsRenton, WA
## 73 Soothe3.7Seattle, WA
## 74 Maya Whole Health StudioRenton, WA 98056
## 75 Balance Chiropractic CenterSeattle, WA 98118 (Dunlap area)
## 76 Indo-Pak Massage TherapySeattle, WA
## 77 DreamclinicSeattle, WA
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary
## 1 \n$30 - $41 an hour $30 - $41 30.00 41.00
## 2 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 3 \nUp to $34 an hour $34 34.00 NA
## 4 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 5 \n$30 - $37 an hour $30 - $37 30.00 37.00
## 7 \n$22 - $35 an hour $22 - $35 22.00 35.00
## 8 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 9 \n$35 an hour $35 35.00 NA
## 10 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 11 \n$27 - $38 an hour $27 - $38 27.00 38.00
## 12 \n$33 - $40 an hour $33 - $40 33.00 40.00
## 13 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 14 \n$50 an hour $50 50.00 NA
## 15 \n$28 - $35 an hour $28 - $35 28.00 35.00
## 16 \n$22 - $32 an hour $22 - $32 22.00 32.00
## 17 \n$59 - $70 an hour $59 - $70 59.00 70.00
## 18 \nFrom $30 an hour $30 30.00 NA
## 19 \n$31 - $40 an hour $31 - $40 31.00 40.00
## 20 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 21 \n$32 - $42 an hour $32 - $42 32.00 42.00
## 23 \n$21 - $35 an hour $21 - $35 21.00 35.00
## 24 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 25 \n$25 - $30 an hour $25 - $30 25.00 30.00
## 26 \n$30 - $41 an hour $30 - $41 30.00 41.00
## 27 \nUp to $34 an hour $34 34.00 NA
## 28 \n$59 - $70 an hour $59 - $70 59.00 70.00
## 29 \nFrom $30 an hour $30 30.00 NA
## 30 \n$31 - $40 an hour $31 - $40 31.00 40.00
## 31 \n$32 - $42 an hour $32 - $42 32.00 42.00
## 32 \n$20 - $25 an hour $20 - $25 20.00 25.00
## 34 \n$21 - $35 an hour $21 - $35 21.00 35.00
## 35 \n$30 - $45 an hour $30 - $45 30.00 45.00
## 36 \n$30 - $40 an hour $30 - $40 30.00 40.00
## 37 \n$35 - $40 an hour $35 - $40 35.00 40.00
## 38 \n$30 - $37 an hour $30 - $37 30.00 37.00
## 39 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 40 \n$31 - $41 an hour $31 - $41 31.00 41.00
## 41 \n$25.66 - $39.27 an hour $25.66 - $39.27 25.66 39.27
## 42 \n$35 - $50 an hour $35 - $50 35.00 50.00
## 43 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 44 \n$45 - $70 an hour $45 - $70 45.00 70.00
## 45 \nFrom $34 an hour $34 34.00 NA
## 46 \n$36.75 - $46.75 an hour $36.75 - $46.75 36.75 46.75
## 47 \n$32 - $45 an hour $32 - $45 32.00 45.00
## 48 \n$25 - $35 an hour $25 - $35 25.00 35.00
## 49 \n$31 - $41 an hour $31 - $41 31.00 41.00
## 50 \n$25.66 - $39.27 an hour $25.66 - $39.27 25.66 39.27
## 51 \n$35 - $50 an hour $35 - $50 35.00 50.00
## 52 \n$30 - $35 an hour $30 - $35 30.00 35.00
## 53 \n$45 - $70 an hour $45 - $70 45.00 70.00
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 30 39.27 31.5014 40.86721 20
## 2 30 39.27 31.5014 40.86721 20
## 3 30 39.27 31.5014 40.86721 20
## 4 30 39.27 31.5014 40.86721 20
## 5 30 39.27 31.5014 40.86721 20
## 7 30 39.27 31.5014 40.86721 20
## 8 30 39.27 31.5014 40.86721 20
## 9 30 39.27 31.5014 40.86721 20
## 10 30 39.27 31.5014 40.86721 20
## 11 30 39.27 31.5014 40.86721 20
## 12 30 39.27 31.5014 40.86721 20
## 13 30 39.27 31.5014 40.86721 20
## 14 30 39.27 31.5014 40.86721 20
## 15 30 39.27 31.5014 40.86721 20
## 16 30 39.27 31.5014 40.86721 20
## 17 30 39.27 31.5014 40.86721 20
## 18 30 39.27 31.5014 40.86721 20
## 19 30 39.27 31.5014 40.86721 20
## 20 30 39.27 31.5014 40.86721 20
## 21 30 39.27 31.5014 40.86721 20
## 23 30 39.27 31.5014 40.86721 20
## 24 30 39.27 31.5014 40.86721 20
## 25 30 39.27 31.5014 40.86721 20
## 26 30 39.27 31.5014 40.86721 20
## 27 30 39.27 31.5014 40.86721 20
## 28 30 39.27 31.5014 40.86721 20
## 29 30 39.27 31.5014 40.86721 20
## 30 30 39.27 31.5014 40.86721 20
## 31 30 39.27 31.5014 40.86721 20
## 32 30 39.27 31.5014 40.86721 20
## 34 30 39.27 31.5014 40.86721 20
## 35 30 39.27 31.5014 40.86721 20
## 36 30 39.27 31.5014 40.86721 20
## 37 30 39.27 31.5014 40.86721 20
## 38 30 39.27 31.5014 40.86721 20
## 39 30 39.27 31.5014 40.86721 20
## 40 30 39.27 31.5014 40.86721 20
## 41 30 39.27 31.5014 40.86721 20
## 42 30 39.27 31.5014 40.86721 20
## 43 30 39.27 31.5014 40.86721 20
## 44 30 39.27 31.5014 40.86721 20
## 45 30 39.27 31.5014 40.86721 20
## 46 30 39.27 31.5014 40.86721 20
## 47 30 39.27 31.5014 40.86721 20
## 48 30 39.27 31.5014 40.86721 20
## 49 30 39.27 31.5014 40.86721 20
## 50 30 39.27 31.5014 40.86721 20
## 51 30 39.27 31.5014 40.86721 20
## 52 30 39.27 31.5014 40.86721 20
## 53 30 39.27 31.5014 40.86721 20
## maximumMaxSalary
## 1 70
## 2 70
## 3 70
## 4 70
## 5 70
## 7 70
## 8 70
## 9 70
## 10 70
## 11 70
## 12 70
## 13 70
## 14 70
## 15 70
## 16 70
## 17 70
## 18 70
## 19 70
## 20 70
## 21 70
## 23 70
## 24 70
## 25 70
## 26 70
## 27 70
## 28 70
## 29 70
## 30 70
## 31 70
## 32 70
## 34 70
## 35 70
## 36 70
## 37 70
## 38 70
## 39 70
## 40 70
## 41 70
## 42 70
## 43 70
## 44 70
## 45 70
## 46 70
## 47 70
## 48 70
## 49 70
## 50 70
## 51 70
## 52 70
## 53 70
##
## [[7]]
## city state jobTitle
## 1 Tacoma WA Licensed Massage Therapist
## 2 Tacoma WA Licensed Massage Therapist
## 3 Tacoma WA Licensed Massage Therapist (LMT) - Full Time
## 4 Tacoma WA Licensed Massage Therapist
## 5 Tacoma WA Liscensed Massage Therapist
## 6 Tacoma WA Licensed Massage Therapist
## 7 Tacoma WA Full Time Licensed Massage Therapist Tacoma
## 8 Tacoma WA Massage Therapist
## 9 Tacoma WA Massage Therapist - Independent Contractor
## 10 Tacoma WA Massage Therapist
## 11 Tacoma WA Licensed Massage Therapist
## 12 Tacoma WA Massage Therapist
## 13 Tacoma WA Licensed Massage Therapist
## 14 Tacoma WA Licensed Massage Therapist
## 15 Tacoma WA Licensed Massage Therapist
## 16 Tacoma WA Massage Therapist
## 17 Tacoma WA Licensed Massage Therapist
## 18 Tacoma WA Massage Therapist
## 19 Tacoma WA Licensed Massage Therapist
## 20 Tacoma WA Licensed Massage Therapist
## 21 Tacoma WA Part-time Massage Therapist
## 22 Tacoma WA Massage Therapist
## 23 Tacoma WA Massage Therapist
## 24 Tacoma WA Massage Therapist
## 25 Tacoma WA Massage Therapist - Independent Contractor
## 26 Tacoma WA Licensed Massage Therapist (LMT)
## 27 Tacoma WA Massage Therapist - Tacoma
## 28 Tacoma WA Licensed Massage Therapist
## 29 Tacoma WA Massage Therapist
## 30 Tacoma WA Massage Therapist
## 31 Tacoma WA Licensed Massage Therapist
## 32 Tacoma WA Massage Therapist
## 33 Tacoma WA Licensed Massage Therapist
## 34 Tacoma WA Massage Therapist
## 35 Tacoma WA Licensed Massage Therapist (LMT) - Full Time
## 36 Tacoma WA Licensed Massage Therapist
## 37 Tacoma WA Licensed Massage Therapist
## 38 Tacoma WA Licensed Massage Therapist
## 39 Tacoma WA Massage Therapist
## 40 Tacoma WA Liscensed Massage Therapist
## 41 Tacoma WA Licensed Massage Therapist
## 42 Tacoma WA Massage Therapist
## 43 Tacoma WA Massage Therapist
## 44 Tacoma WA Massage Therapist
## 45 Tacoma WA Licensed Massage Therapist
## 46 Tacoma WA Licensed Massage Therapist
## 47 Tacoma WA Massage Therapist
## 48 Tacoma WA Rockstar Massage Therapist (LMT) Wanted - Great Company Cult...
## 49 Tacoma WA Medical Massage Therapist
## 50 Tacoma WA Licensed Massage Therapist
## 51 Tacoma WA Full Time Licensed Massage Therapist Tacoma
## 52 Tacoma WA Licensed Massage Therapist
## 53 Tacoma WA Licensed Massage Therapist
## 54 Tacoma WA Licensed Massage Therapist- POST COVID-19 - YOUR SAFETY IS O...
## 55 Tacoma WA Massage Therapist - Independent Contractor
## 56 Tacoma WA Massage Therapist (Dreamclinic Seattle and Redmond)
## 57 Tacoma WA Mobile Massage Therapist - Independent Contractor
## 58 Tacoma WA Licensed Massage Therapist
## 59 Tacoma WA LICENSED MASSAGE PRACTITIONER
## 60 Tacoma WA Massage Therapist
## 61 Tacoma WA Mobile Massage Therapist
## 62 Tacoma WA Dual Licensed Acupuncturist & Massage Therapist, Seattle
## 63 Tacoma WA Licensed Massage Therapist
## 64 Tacoma WA Licensed Massage Therapist (FT)
## 65 Tacoma WA Licensed Massage Therapist
## 66 Tacoma WA Licensed Massage Therapist
## 67 Tacoma WA Licensed Massage Therapist (LMT), part time / full time
## 68 Tacoma WA Licensed Massage Therapist
## 69 Tacoma WA Licensed Massage Therapist- POST COVID-19 - YOUR SAFETY IS O...
## 70 Tacoma WA Massage Therapist - Independent Contractor
## 71 Tacoma WA Massage Therapist (Dreamclinic Seattle and Redmond)
## 72 Tacoma WA Mobile Massage Therapist - Independent Contractor
## 73 Tacoma WA Licensed Massage Therapist
## 74 Tacoma WA LICENSED MASSAGE PRACTITIONER
## 75 Tacoma WA Massage Therapist
## 76 Tacoma WA Mobile Massage Therapist
## 77 Tacoma WA Dual Licensed Acupuncturist & Massage Therapist, Seattle
## HiringAgency
## 1 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 2 Rody Chiropractic, Massage, and HealthPuyallup, WA 98373
## 3 Olympic Sports and Spine4.5Auburn, WA 98002
## 4 Fairwood Chiropractic ClinicRenton, WA 98058
## 5 Vision Quest MassagePuyallup, WA 98373
## 6 Petersen Chiropractic4.5Belfair, WA 98528
## 7 Premier Chiropractic of TacomaTacoma, WA 98444 (South End area)
## 8 Mountain View Chiropractic and Wellness CenterBonney Lake, WA 98391
## 9 Indo-Pak Massage TherapyTacoma, WA+1 location•Remote work available
## 10 The Health ConnectionTacoma, WA 98405 (Central area)
## 11 Marconi Chiropractic and WellnessTacoma, WA 98405 (New Tacoma area)
## 12 ReCru Hands LLCTacoma, WA+1 location
## 13 Alternative Back Care Physical TherapyTacoma, WA 98403 (North End area)
## 14 Bella Terra SpaPuyallup, WA 98371
## 15 Hand & Stone Massage and Facial Spa - University P...3.0University Place, WA 98466+2 locations
## 16 Virk Chiropractic3.0Tukwila, WA 98188
## 17 Olympic Sports and Spine4.5University Place, WA 98466
## 18 Massage Envy3.2Gig Harbor, WA 98335
## 19 Torres Chiropractic, PSLakewood, WA 98499 (Tyee Park area)
## 20 DORN4.5Lacey, WA 98516
## 21 Alternative Back Care Physical TherapyGig Harbor, WA 98335 (Westside area)
## 22 Ms Beautiful MeLakewood, WA 98499 (Dower area)
## 23 Ideal Motion ChiropracticBonney Lake, WA 98391
## 24 All Ways ChiropracticOlympia, WA 98501
## 25 Ideal Motion ChiropracticBonney Lake, WA 98391
## 26 Natural Life MedicinePuyallup, WA 98372 (Southhill area)
## 27 Gene Juarez Salon & Spa3.4Tacoma, WA 98409 (South Tacoma area)
## 28 NW Myotherapy AssociatesAuburn, WA 98002
## 29 Hand & Stone - OR & WA3.0Puyallup, WA 98374+3 locations
## 30 Massage Envy - Manch HoldingsPuyallup, WA 98373 (Southhill area)
## 31 T&P Foot massage and aromatherapyPuyallup, WA 98373
## 32 Elements3.6Kent, WA 98030+1 location
## 33 Lavida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 34 Penrose & Associates Physical Therapy4.8Lacey, WA 98516
## 35 Olympic Sports and Spine4.5Auburn, WA 98002
## 36 Petersen Chiropractic4.5Belfair, WA 98528
## 37 Torres Chiropractic, PSLakewood, WA 98499 (Tyee Park area)
## 38 Rody Chiropractic, Massage, and HealthPuyallup, WA 98373
## 39 Massage Envy3.2Gig Harbor, WA 98335
## 40 Vision Quest MassagePuyallup, WA 98373
## 41 NW Myotherapy AssociatesAuburn, WA 98002
## 42 Hand & Stone - OR & WA3.0Puyallup, WA 98374+3 locations
## 43 Massage Envy - Manch HoldingsPuyallup, WA 98373 (Southhill area)
## 44 Elements3.6Kent, WA 98030+1 location
## 45 T&P Foot massage and aromatherapyPuyallup, WA 98373
## 46 Lavida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 47 Penrose & Associates Physical Therapy4.8Lacey, WA 98516
## 48 LaVida Massage of Federal WayFederal Way, WA 98003 (West Campus area)
## 49 Living Well ChiropracticYelm, WA 98597
## 50 Fairwood Chiropractic ClinicRenton, WA 98058
## 51 Premier Chiropractic of TacomaTacoma, WA 98444 (South End area)
## 52 Highline Physical Therapy3.6Federal Way, WA 98003 (West Campus area)
## 53 Chiropractic Wellness CentersNewcastle, WA 98059
## 54 Massage Envy - Manch HoldingsCovington, WA 98042
## 55 Holistic Health Center of RentonRenton, WA 98057 (North Renton area)
## 56 DreamclinicSeattle, WA
## 57 Layin on of HandsRenton, WA
## 58 Soothe3.7Seattle, WA
## 59 Maya Whole Health StudioRenton, WA 98056
## 60 Balance Chiropractic CenterSeattle, WA 98118 (Dunlap area)
## 61 Indo-Pak Massage TherapySeattle, WA
## 62 DreamclinicSeattle, WA
## 63 Bonney Lake Physical Therapy and Hand RehabBonney Lake, WA 98391
## 64 DreamclinicSeattle, WA
## 65 DreamclinicSeattle, WA
## 66 ZOOM+Care2.8Seattle, WA
## 67 City Sweats West SeattleSeattle, WA 98116 (Admiral area)
## 68 Chiropractic Wellness CentersNewcastle, WA 98059
## 69 Massage Envy - Manch HoldingsCovington, WA 98042
## 70 Holistic Health Center of RentonRenton, WA 98057 (North Renton area)
## 71 DreamclinicSeattle, WA
## 72 Layin on of HandsRenton, WA
## 73 Soothe3.7Seattle, WA
## 74 Maya Whole Health StudioRenton, WA 98056
## 75 Balance Chiropractic CenterSeattle, WA 98118 (Dunlap area)
## 76 Indo-Pak Massage TherapySeattle, WA
## 77 DreamclinicSeattle, WA
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 30 20 70 NA NA
## 2 30 20 70 NA NA
## 3 25 20 70 NA NA
## 4 6 20 70 NA NA
## 5 15 20 70 NA NA
## 6 28 20 70 NA NA
## 7 14 20 70 NA NA
## 8 Just posted 20 70 NA NA
## 9 5 20 70 NA NA
## 10 5 20 70 NA NA
## 11 4 20 70 NA NA
## 12 19 20 70 NA NA
## 13 13 20 70 NA NA
## 14 13 20 70 NA NA
## 15 Just posted 20 70 NA NA
## 16 Today 20 70 NA NA
## 17 4 20 70 NA NA
## 18 30 20 70 NA NA
## 19 30 20 70 NA NA
## 20 Just posted 20 70 NA NA
## 21 21 20 70 NA NA
## 22 30 20 70 NA NA
## 23 20 20 70 NA NA
## 24 13 20 70 NA NA
## 25 15 20 70 NA NA
## 26 30 20 70 NA NA
## 27 30 20 70 NA NA
## 28 8 20 70 NA NA
## 29 7 20 70 NA NA
## 30 30 20 70 NA NA
## 31 25 20 70 NA NA
## 32 30 20 70 NA NA
## 33 Today 20 70 NA NA
## 34 15 20 70 NA NA
## 35 25 20 70 NA NA
## 36 28 20 70 NA NA
## 37 30 20 70 NA NA
## 38 30 20 70 NA NA
## 39 30 20 70 NA NA
## 40 15 20 70 NA NA
## 41 8 20 70 NA NA
## 42 7 20 70 NA NA
## 43 30 20 70 NA NA
## 44 30 20 70 NA NA
## 45 25 20 70 NA NA
## 46 Today 20 70 NA NA
## 47 15 20 70 NA NA
## 48 24 20 70 NA NA
## 49 30 20 70 NA NA
## 50 6 20 70 NA NA
## 51 14 20 70 NA NA
## 52 30 20 70 NA NA
## 53 22 20 70 NA NA
## 54 30 20 70 NA NA
## 55 18 20 70 NA NA
## 56 30 20 70 NA NA
## 57 30 20 70 NA NA
## 58 24 20 70 NA NA
## 59 30 20 70 NA NA
## 60 6 20 70 NA NA
## 61 30 20 70 NA NA
## 62 30 20 70 NA NA
## 63 30 20 70 NA NA
## 64 5 20 70 NA NA
## 65 Today 20 70 NA NA
## 66 27 20 70 NA NA
## 67 13 20 70 NA NA
## 68 22 20 70 NA NA
## 69 30 20 70 NA NA
## 70 18 20 70 NA NA
## 71 30 20 70 NA NA
## 72 30 20 70 NA NA
## 73 24 20 70 NA NA
## 74 30 20 70 NA NA
## 75 6 20 70 NA NA
## 76 30 20 70 NA NA
## 77 30 20 70 NA NA
West Virginia Charleston, Huntington, Morgantown
getIndeedJobData5pages('massage therapist', 'Charleston','WV')
## Warning in getIndeedJobData5pages("massage therapist", "Charleston", "WV"): NAs
## introduced by coercion
## Warning in max(hourly$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Charleston", "WV"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Massage Therapist
## 3 Massage Therapist - Full Time
## 4 Licensed Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist
## 7 Massage Therapist - Full Time
## 8 Licensed Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist
## 11 Massage Therapist - Full Time
## 12 Licensed Massage Therapist
## 13 Massage Therapist - Independent Contractor
## 14 Massage Therapist
## 15 Massage Therapist - Full Time
## 16 Licensed Massage Therapist
## 17 Massage Therapist - Independent Contractor
## 18 Massage Therapist
## 19 Massage Therapist - Full Time
## 20 Licensed Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \nFrom $16 an hour $16 16 NA
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \nFrom $16 an hour $16 16 NA
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \nFrom $16 an hour $16 16 NA
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \nFrom $16 an hour $16 16 NA
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \nFrom $16 an hour $16 16 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 2508 5000 2508 5672 16
## 2 2508 5000 2508 5672 16
## 3 2508 5000 2508 5672 16
## 4 2508 5000 2508 5672 16
## 5 2508 5000 2508 5672 16
## 6 2508 5000 2508 5672 16
## 7 2508 5000 2508 5672 16
## 8 2508 5000 2508 5672 16
## 9 2508 5000 2508 5672 16
## 10 2508 5000 2508 5672 16
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
##
## [[3]]
## date_daysAgo
## 1 5
## 2 23
## 3 25
## 4 23
## 5 5
## 6 23
## 7 25
## 8 23
## 9 5
## 10 23
## 11 25
## 12 23
## 13 5
## 14 23
## 15 25
## 16 23
## 17 5
## 18 23
## 19 25
## 20 23
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyCharleston, WV•Remote work available
## 2 Michaels Hair Salon5.0Charleston, WV 25301
## 3 Massage Envy3.2Charleston, WV 25304 (Kanawha City area)
## 4 Spa GraceScott Depot, WV 25560
## 5 Indo-Pak Massage TherapyCharleston, WV•Remote work available
## 6 Michaels Hair Salon5.0Charleston, WV 25301
## 7 Massage Envy3.2Charleston, WV 25304 (Kanawha City area)
## 8 Spa GraceScott Depot, WV 25560
## 9 Indo-Pak Massage TherapyCharleston, WV•Remote work available
## 10 Michaels Hair Salon5.0Charleston, WV 25301
## 11 Massage Envy3.2Charleston, WV 25304 (Kanawha City area)
## 12 Spa GraceScott Depot, WV 25560
## 13 Indo-Pak Massage TherapyCharleston, WV•Remote work available
## 14 Michaels Hair Salon5.0Charleston, WV 25301
## 15 Massage Envy3.2Charleston, WV 25304 (Kanawha City area)
## 16 Spa GraceScott Depot, WV 25560
## 17 Indo-Pak Massage TherapyCharleston, WV•Remote work available
## 18 Michaels Hair Salon5.0Charleston, WV 25301
## 19 Massage Envy3.2Charleston, WV 25304 (Kanawha City area)
## 20 Spa GraceScott Depot, WV 25560
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \nFrom $16 an hour $16 16 NA 16
## 4 \nFrom $16 an hour $16 16 NA 16
## 6 \nFrom $16 an hour $16 16 NA 16
## 8 \nFrom $16 an hour $16 16 NA 16
## 10 \nFrom $16 an hour $16 16 NA 16
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 NA 16 NaN 16 -Inf
## 4 NA 16 NaN 16 -Inf
## 6 NA 16 NaN 16 -Inf
## 8 NA 16 NaN 16 -Inf
## 10 NA 16 NaN 16 -Inf
##
## [[7]]
## city state jobTitle
## 1 Charleston WV Massage Therapist - Independent Contractor
## 2 Charleston WV Massage Therapist
## 3 Charleston WV Massage Therapist - Full Time
## 4 Charleston WV Licensed Massage Therapist
## 5 Charleston WV Massage Therapist - Independent Contractor
## 6 Charleston WV Massage Therapist
## 7 Charleston WV Massage Therapist - Full Time
## 8 Charleston WV Licensed Massage Therapist
## 9 Charleston WV Massage Therapist - Independent Contractor
## 10 Charleston WV Massage Therapist
## 11 Charleston WV Massage Therapist - Full Time
## 12 Charleston WV Licensed Massage Therapist
## 13 Charleston WV Massage Therapist - Independent Contractor
## 14 Charleston WV Massage Therapist
## 15 Charleston WV Massage Therapist - Full Time
## 16 Charleston WV Licensed Massage Therapist
## 17 Charleston WV Massage Therapist - Independent Contractor
## 18 Charleston WV Massage Therapist
## 19 Charleston WV Massage Therapist - Full Time
## 20 Charleston WV Licensed Massage Therapist
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyCharleston, WV•Remote work available 5
## 2 Michaels Hair Salon5.0Charleston, WV 25301 23
## 3 Massage Envy3.2Charleston, WV 25304 (Kanawha City area) 25
## 4 Spa GraceScott Depot, WV 25560 23
## 5 Indo-Pak Massage TherapyCharleston, WV•Remote work available 5
## 6 Michaels Hair Salon5.0Charleston, WV 25301 23
## 7 Massage Envy3.2Charleston, WV 25304 (Kanawha City area) 25
## 8 Spa GraceScott Depot, WV 25560 23
## 9 Indo-Pak Massage TherapyCharleston, WV•Remote work available 5
## 10 Michaels Hair Salon5.0Charleston, WV 25301 23
## 11 Massage Envy3.2Charleston, WV 25304 (Kanawha City area) 25
## 12 Spa GraceScott Depot, WV 25560 23
## 13 Indo-Pak Massage TherapyCharleston, WV•Remote work available 5
## 14 Michaels Hair Salon5.0Charleston, WV 25301 23
## 15 Massage Envy3.2Charleston, WV 25304 (Kanawha City area) 25
## 16 Spa GraceScott Depot, WV 25560 23
## 17 Indo-Pak Massage TherapyCharleston, WV•Remote work available 5
## 18 Michaels Hair Salon5.0Charleston, WV 25301 23
## 19 Massage Envy3.2Charleston, WV 25304 (Kanawha City area) 25
## 20 Spa GraceScott Depot, WV 25560 23
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 16 16 NA NA
## 2 16 16 NA NA
## 3 16 16 NA NA
## 4 16 16 NA NA
## 5 16 16 NA NA
## 6 16 16 NA NA
## 7 16 16 NA NA
## 8 16 16 NA NA
## 9 16 16 NA NA
## 10 16 16 NA NA
## 11 16 16 NA NA
## 12 16 16 NA NA
## 13 16 16 NA NA
## 14 16 16 NA NA
## 15 16 16 NA NA
## 16 16 16 NA NA
## 17 16 16 NA NA
## 18 16 16 NA NA
## 19 16 16 NA NA
## 20 16 16 NA NA
getIndeedJobData5pages('massage therapist', 'Huntington','WV')
## Warning in getIndeedJobData5pages("massage therapist", "Huntington", "WV"): NAs
## introduced by coercion
## Warning in max(hourly$maxSalary, na.rm = TRUE): no non-missing arguments to max;
## returning -Inf
## Warning in getIndeedJobData5pages("massage therapist", "Huntington", "WV"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist - Independent Contractor
## 2 Massage Therapist
## 3 Massage Therapist - Independent Contractor
## 4 Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \nFrom $16 an hour $16 16 NA
## 3 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 4 \nFrom $16 an hour $16 16 NA
## 5 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 6 \nFrom $16 an hour $16 16 NA
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \nFrom $16 an hour $16 16 NA
## 9 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 10 \nFrom $16 an hour $16 16 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 2508 5000 2508 5672 16
## 2 2508 5000 2508 5672 16
## 3 2508 5000 2508 5672 16
## 4 2508 5000 2508 5672 16
## 5 2508 5000 2508 5672 16
## 6 2508 5000 2508 5672 16
## 7 2508 5000 2508 5672 16
## 8 2508 5000 2508 5672 16
## 9 2508 5000 2508 5672 16
## 10 2508 5000 2508 5672 16
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
##
## [[3]]
## date_daysAgo
## 1 17
## 2 27
## 3 17
## 4 27
## 5 17
## 6 27
## 7 17
## 8 27
## 9 17
## 10 27
##
## [[4]]
## HiringAgency
## 1 Indo-Pak Massage TherapyHuntington, WV•Remote work available
## 2 Massage Envy3.2Barboursville, WV 25702
## 3 Indo-Pak Massage TherapyHuntington, WV•Remote work available
## 4 Massage Envy3.2Barboursville, WV 25702
## 5 Indo-Pak Massage TherapyHuntington, WV•Remote work available
## 6 Massage Envy3.2Barboursville, WV 25702
## 7 Indo-Pak Massage TherapyHuntington, WV•Remote work available
## 8 Massage Envy3.2Barboursville, WV 25702
## 9 Indo-Pak Massage TherapyHuntington, WV•Remote work available
## 10 Massage Envy3.2Barboursville, WV 25702
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \nFrom $16 an hour $16 16 NA 16
## 4 \nFrom $16 an hour $16 16 NA 16
## 6 \nFrom $16 an hour $16 16 NA 16
## 8 \nFrom $16 an hour $16 16 NA 16
## 10 \nFrom $16 an hour $16 16 NA 16
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 NA 16 NaN 16 -Inf
## 4 NA 16 NaN 16 -Inf
## 6 NA 16 NaN 16 -Inf
## 8 NA 16 NaN 16 -Inf
## 10 NA 16 NaN 16 -Inf
##
## [[7]]
## city state jobTitle
## 1 Huntington WV Massage Therapist - Independent Contractor
## 2 Huntington WV Massage Therapist
## 3 Huntington WV Massage Therapist - Independent Contractor
## 4 Huntington WV Massage Therapist
## 5 Huntington WV Massage Therapist - Independent Contractor
## 6 Huntington WV Massage Therapist
## 7 Huntington WV Massage Therapist - Independent Contractor
## 8 Huntington WV Massage Therapist
## 9 Huntington WV Massage Therapist - Independent Contractor
## 10 Huntington WV Massage Therapist
## HiringAgency date_daysAgo
## 1 Indo-Pak Massage TherapyHuntington, WV•Remote work available 17
## 2 Massage Envy3.2Barboursville, WV 25702 27
## 3 Indo-Pak Massage TherapyHuntington, WV•Remote work available 17
## 4 Massage Envy3.2Barboursville, WV 25702 27
## 5 Indo-Pak Massage TherapyHuntington, WV•Remote work available 17
## 6 Massage Envy3.2Barboursville, WV 25702 27
## 7 Indo-Pak Massage TherapyHuntington, WV•Remote work available 17
## 8 Massage Envy3.2Barboursville, WV 25702 27
## 9 Indo-Pak Massage TherapyHuntington, WV•Remote work available 17
## 10 Massage Envy3.2Barboursville, WV 25702 27
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 16 16 NA NA
## 2 16 16 NA NA
## 3 16 16 NA NA
## 4 16 16 NA NA
## 5 16 16 NA NA
## 6 16 16 NA NA
## 7 16 16 NA NA
## 8 16 16 NA NA
## 9 16 16 NA NA
## 10 16 16 NA NA
getIndeedJobData5pages('massage therapist', 'Morgantown','WV')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Massage Therapist
## 3 Massage Therapist - SIGN-ON BONUS!
## 4 Licensed Massage Therapists
## 5 Massage Therapist
## 6 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 7 Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Massage Therapist - SIGN-ON BONUS!
## 10 Licensed Massage Therapists
## 11 Massage Therapist
## 12 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 13 Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist - SIGN-ON BONUS!
## 16 Licensed Massage Therapists
## 17 Massage Therapist
## 18 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 19 Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist - SIGN-ON BONUS!
## 22 Licensed Massage Therapists
## 23 Massage Therapist
## 24 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 25 Massage Therapist - SIGN-ON BONUS!
## 26 Licensed Massage Therapists
## 27 Massage Therapist
## 28 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 29 Massage Therapist
## 30 Licensed Massage Therapist (LMT)
##
## [[2]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 2 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 3 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 4 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 5 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 6 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 7 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 8 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 9 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 10 \n$30 - $40 an hour $30 - $40 30 40 23.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 26.5 23.5 27.5 17 40
## 2 26.5 23.5 27.5 17 40
## 3 26.5 23.5 27.5 17 40
## 4 26.5 23.5 27.5 17 40
## 5 26.5 23.5 27.5 17 40
## 6 26.5 23.5 27.5 17 40
## 7 26.5 23.5 27.5 17 40
## 8 26.5 23.5 27.5 17 40
## 9 26.5 23.5 27.5 17 40
## 10 26.5 23.5 27.5 17 40
##
## [[3]]
## date_daysAgo
## 1 30
## 2 5
## 3 30
## 4 30
## 5 30
## 6 11
## 7 5
## 8 30
## 9 30
## 10 30
## 11 30
## 12 11
## 13 5
## 14 30
## 15 30
## 16 30
## 17 30
## 18 11
## 19 5
## 20 30
## 21 30
## 22 30
## 23 30
## 24 11
## 25 30
## 26 30
## 27 30
## 28 11
## 29 5
## 30 30
##
## [[4]]
## HiringAgency
## 1 Massage Envy Morgantown, WV3.2Morgantown, WV 26505
## 2 Skinsational MedspaMorgantown, WV 26508
## 3 Tuscan Sun Spa & Salon2.7Morgantown, WV
## 4 Priority Care Wellness CenterMorgantown, WV 26505
## 5 Massage Envy3.2Morgantown, WV 26505
## 6 Nemacolin Woodlands Resort3.8Farmington, PA
## 7 Skinsational MedspaMorgantown, WV 26508
## 8 Massage Envy Morgantown, WV3.2Morgantown, WV 26505
## 9 Tuscan Sun Spa & Salon2.7Morgantown, WV
## 10 Priority Care Wellness CenterMorgantown, WV 26505
## 11 Massage Envy3.2Morgantown, WV 26505
## 12 Nemacolin Woodlands Resort3.8Farmington, PA
## 13 Skinsational MedspaMorgantown, WV 26508
## 14 Massage Envy Morgantown, WV3.2Morgantown, WV 26505
## 15 Tuscan Sun Spa & Salon2.7Morgantown, WV
## 16 Priority Care Wellness CenterMorgantown, WV 26505
## 17 Massage Envy3.2Morgantown, WV 26505
## 18 Nemacolin Woodlands Resort3.8Farmington, PA
## 19 Skinsational MedspaMorgantown, WV 26508
## 20 Massage Envy Morgantown, WV3.2Morgantown, WV 26505
## 21 Tuscan Sun Spa & Salon2.7Morgantown, WV
## 22 Priority Care Wellness CenterMorgantown, WV 26505
## 23 Massage Envy3.2Morgantown, WV 26505
## 24 Nemacolin Woodlands Resort3.8Farmington, PA
## 25 Tuscan Sun Spa & Salon2.7Morgantown, WV
## 26 Priority Care Wellness CenterMorgantown, WV 26505
## 27 Massage Envy3.2Morgantown, WV 26505
## 28 Nemacolin Woodlands Resort3.8Farmington, PA
## 29 Skinsational MedspaMorgantown, WV 26508
## 30 Massage Envy Morgantown, WV3.2Morgantown, WV 26505
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 2 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 3 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 4 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 5 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 6 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 7 \n$30 - $40 an hour $30 - $40 30 40 23.5
## 8 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 9 \n$17 - $23 an hour $17 - $23 17 23 23.5
## 10 \n$30 - $40 an hour $30 - $40 30 40 23.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 31.5 23.5 31.5 17 40
## 2 31.5 23.5 31.5 17 40
## 3 31.5 23.5 31.5 17 40
## 4 31.5 23.5 31.5 17 40
## 5 31.5 23.5 31.5 17 40
## 6 31.5 23.5 31.5 17 40
## 7 31.5 23.5 31.5 17 40
## 8 31.5 23.5 31.5 17 40
## 9 31.5 23.5 31.5 17 40
## 10 31.5 23.5 31.5 17 40
##
## [[7]]
## city state
## 1 Morgantown WV
## 2 Morgantown WV
## 3 Morgantown WV
## 4 Morgantown WV
## 5 Morgantown WV
## 6 Morgantown WV
## 7 Morgantown WV
## 8 Morgantown WV
## 9 Morgantown WV
## 10 Morgantown WV
## 11 Morgantown WV
## 12 Morgantown WV
## 13 Morgantown WV
## 14 Morgantown WV
## 15 Morgantown WV
## 16 Morgantown WV
## 17 Morgantown WV
## 18 Morgantown WV
## 19 Morgantown WV
## 20 Morgantown WV
## 21 Morgantown WV
## 22 Morgantown WV
## 23 Morgantown WV
## 24 Morgantown WV
## 25 Morgantown WV
## 26 Morgantown WV
## 27 Morgantown WV
## 28 Morgantown WV
## 29 Morgantown WV
## 30 Morgantown WV
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Massage Therapist
## 3 Massage Therapist - SIGN-ON BONUS!
## 4 Licensed Massage Therapists
## 5 Massage Therapist
## 6 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 7 Massage Therapist
## 8 Licensed Massage Therapist (LMT)
## 9 Massage Therapist - SIGN-ON BONUS!
## 10 Licensed Massage Therapists
## 11 Massage Therapist
## 12 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 13 Massage Therapist
## 14 Licensed Massage Therapist (LMT)
## 15 Massage Therapist - SIGN-ON BONUS!
## 16 Licensed Massage Therapists
## 17 Massage Therapist
## 18 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 19 Massage Therapist
## 20 Licensed Massage Therapist (LMT)
## 21 Massage Therapist - SIGN-ON BONUS!
## 22 Licensed Massage Therapists
## 23 Massage Therapist
## 24 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 25 Massage Therapist - SIGN-ON BONUS!
## 26 Licensed Massage Therapists
## 27 Massage Therapist
## 28 Spa-Massage Therapist - Part Time (Hourly wage plus industry...
## 29 Massage Therapist
## 30 Licensed Massage Therapist (LMT)
## HiringAgency date_daysAgo
## 1 Massage Envy Morgantown, WV3.2Morgantown, WV 26505 30
## 2 Skinsational MedspaMorgantown, WV 26508 5
## 3 Tuscan Sun Spa & Salon2.7Morgantown, WV 30
## 4 Priority Care Wellness CenterMorgantown, WV 26505 30
## 5 Massage Envy3.2Morgantown, WV 26505 30
## 6 Nemacolin Woodlands Resort3.8Farmington, PA 11
## 7 Skinsational MedspaMorgantown, WV 26508 5
## 8 Massage Envy Morgantown, WV3.2Morgantown, WV 26505 30
## 9 Tuscan Sun Spa & Salon2.7Morgantown, WV 30
## 10 Priority Care Wellness CenterMorgantown, WV 26505 30
## 11 Massage Envy3.2Morgantown, WV 26505 30
## 12 Nemacolin Woodlands Resort3.8Farmington, PA 11
## 13 Skinsational MedspaMorgantown, WV 26508 5
## 14 Massage Envy Morgantown, WV3.2Morgantown, WV 26505 30
## 15 Tuscan Sun Spa & Salon2.7Morgantown, WV 30
## 16 Priority Care Wellness CenterMorgantown, WV 26505 30
## 17 Massage Envy3.2Morgantown, WV 26505 30
## 18 Nemacolin Woodlands Resort3.8Farmington, PA 11
## 19 Skinsational MedspaMorgantown, WV 26508 5
## 20 Massage Envy Morgantown, WV3.2Morgantown, WV 26505 30
## 21 Tuscan Sun Spa & Salon2.7Morgantown, WV 30
## 22 Priority Care Wellness CenterMorgantown, WV 26505 30
## 23 Massage Envy3.2Morgantown, WV 26505 30
## 24 Nemacolin Woodlands Resort3.8Farmington, PA 11
## 25 Tuscan Sun Spa & Salon2.7Morgantown, WV 30
## 26 Priority Care Wellness CenterMorgantown, WV 26505 30
## 27 Massage Envy3.2Morgantown, WV 26505 30
## 28 Nemacolin Woodlands Resort3.8Farmington, PA 11
## 29 Skinsational MedspaMorgantown, WV 26508 5
## 30 Massage Envy Morgantown, WV3.2Morgantown, WV 26505 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 17 40 NA NA
## 2 17 40 NA NA
## 3 17 40 NA NA
## 4 17 40 NA NA
## 5 17 40 NA NA
## 6 17 40 NA NA
## 7 17 40 NA NA
## 8 17 40 NA NA
## 9 17 40 NA NA
## 10 17 40 NA NA
## 11 17 40 NA NA
## 12 17 40 NA NA
## 13 17 40 NA NA
## 14 17 40 NA NA
## 15 17 40 NA NA
## 16 17 40 NA NA
## 17 17 40 NA NA
## 18 17 40 NA NA
## 19 17 40 NA NA
## 20 17 40 NA NA
## 21 17 40 NA NA
## 22 17 40 NA NA
## 23 17 40 NA NA
## 24 17 40 NA NA
## 25 17 40 NA NA
## 26 17 40 NA NA
## 27 17 40 NA NA
## 28 17 40 NA NA
## 29 17 40 NA NA
## 30 17 40 NA NA
Wisconsin Milwaukee, Madison, Green Bay
getIndeedJobData5pages('massage therapist', 'Milwaukee','WI')
## Warning in getIndeedJobData5pages("massage therapist", "Milwaukee", "WI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Milwaukee", "WI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Milwaukee", "WI"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 4 Licensed Massage Therapist Signing Bonus Offered
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor / Start Today- We...
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist- full and part time
## 13 Licensed Massage Therapist / Body Work / CST / SOT / LET / R...
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist Signing Bonus Offered
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 21 Massage Therapist
## 22 Massage Therapist Full or Part Time
## 23 Massage Therapist
## 24 Lead Massage Therapist
## 25 Licensed Massage Therapist- full and part time
## 26 Licensed Massage Therapist / Body Work / CST / SOT / LET / R...
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist ** Post Covid Job Opening**
## 31 Muscle/Massage therapist
## 32 Mobile Massage Therapist
## 33 Licensed Massage Therapist
## 34 Lead Massage Therapist
## 35 Massage Therapist
## 36 Full or Part Time Therapeutic Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist
## 39 Massage Therapist Full or Part Time
## 40 Muscle/Massage therapist
## 41 Mobile Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist
## 44 Licensed Massage Therapist
## 45 Lead Massage Therapist
## 46 Full or Part Time Therapeutic Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapist
## 49 Massage Therapist Full or Part Time
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist Signing Bonus Offered
## 52 Massage Therapist
## 53 Licensed Massage Therapist
## 54 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 55 Licensed Massage Therapist- full and part time
## 56 Licensed Massage Therapist / Body Work / CST / SOT / LET / R...
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist ** Post Covid Job Opening**
## 60 Licensed Massage Therapist
## 61 Muscle/Massage therapist
## 62 Mobile Massage Therapist
## 63 Licensed Massage Therapist
## 64 Lead Massage Therapist
## 65 Massage Therapist
## 66 Full or Part Time Therapeutic Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Massage Therapist Full or Part Time
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$34 - $44 an hour $34 - $44 34 44
## 2 \n$30 - $40 an hour $30 - $40 30 40
## 3 \n$30,000 - $90,000 a year $30000 - $90000 30000 90000
## 4 \n$42,552 - $46,885 a year $42552 - $46885 42552 46885
## 5 \n$40 - $60 an hour $40 - $60 40 60
## 6 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 7 \n$62,000 a year $62000 62000 NA
## 8 \n$26 - $43 an hour $26 - $43 26 43
## 9 \n$21 - $45 an hour $21 - $45 21 45
## 10 \n$18 - $25 an hour $18 - $25 18 25
## 11 \n$42,552 - $46,885 a year $42552 - $46885 42552 46885
## 12 \n$30 - $40 an hour $30 - $40 30 40
## 13 \n$30,000 - $90,000 a year $30000 - $90000 30000 90000
## 14 \n$34 - $44 an hour $34 - $44 34 44
## 15 \n$21 - $45 an hour $21 - $45 21 45
## 16 \n$18 - $25 an hour $18 - $25 18 25
## 17 \n$62,000 a year $62000 62000 NA
## 18 \n$28 an hour $28 28 NA
## 19 \n$45 - $70 an hour $45 - $70 45 70
## 20 \n$52 an hour $52 52 NA
## 21 \n$8 - $23 an hour $8 - $23 8 23
## 22 \n$28 an hour $28 28 NA
## 23 \n$45 - $70 an hour $45 - $70 45 70
## 24 \n$52 an hour $52 52 NA
## 25 \n$8 - $23 an hour $8 - $23 8 23
## 26 \n$42,552 - $46,885 a year $42552 - $46885 42552 46885
## 27 \n$34 - $44 an hour $34 - $44 34 44
## 28 \n$30 - $40 an hour $30 - $40 30 40
## 29 \n$30,000 - $90,000 a year $30000 - $90000 30000 90000
## 30 \n$21 - $45 an hour $21 - $45 21 45
## 31 \n$18 - $25 an hour $18 - $25 18 25
## 32 \n$62,000 a year $62000 62000 NA
## 33 \n$28 an hour $28 28 NA
## 34 \n$45 - $70 an hour $45 - $70 45 70
## 35 \n$52 an hour $52 52 NA
## 36 \n$8 - $23 an hour $8 - $23 8 23
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 34 44 11373.06 13221.1 8
## 2 34 44 11373.06 13221.1 8
## 3 34 44 11373.06 13221.1 8
## 4 34 44 11373.06 13221.1 8
## 5 34 44 11373.06 13221.1 8
## 6 34 44 11373.06 13221.1 8
## 7 34 44 11373.06 13221.1 8
## 8 34 44 11373.06 13221.1 8
## 9 34 44 11373.06 13221.1 8
## 10 34 44 11373.06 13221.1 8
## 11 34 44 11373.06 13221.1 8
## 12 34 44 11373.06 13221.1 8
## 13 34 44 11373.06 13221.1 8
## 14 34 44 11373.06 13221.1 8
## 15 34 44 11373.06 13221.1 8
## 16 34 44 11373.06 13221.1 8
## 17 34 44 11373.06 13221.1 8
## 18 34 44 11373.06 13221.1 8
## 19 34 44 11373.06 13221.1 8
## 20 34 44 11373.06 13221.1 8
## 21 34 44 11373.06 13221.1 8
## 22 34 44 11373.06 13221.1 8
## 23 34 44 11373.06 13221.1 8
## 24 34 44 11373.06 13221.1 8
## 25 34 44 11373.06 13221.1 8
## 26 34 44 11373.06 13221.1 8
## 27 34 44 11373.06 13221.1 8
## 28 34 44 11373.06 13221.1 8
## 29 34 44 11373.06 13221.1 8
## 30 34 44 11373.06 13221.1 8
## 31 34 44 11373.06 13221.1 8
## 32 34 44 11373.06 13221.1 8
## 33 34 44 11373.06 13221.1 8
## 34 34 44 11373.06 13221.1 8
## 35 34 44 11373.06 13221.1 8
## 36 34 44 11373.06 13221.1 8
## maximumMaxSalary
## 1 90000
## 2 90000
## 3 90000
## 4 90000
## 5 90000
## 6 90000
## 7 90000
## 8 90000
## 9 90000
## 10 90000
## 11 90000
## 12 90000
## 13 90000
## 14 90000
## 15 90000
## 16 90000
## 17 90000
## 18 90000
## 19 90000
## 20 90000
## 21 90000
## 22 90000
## 23 90000
## 24 90000
## 25 90000
## 26 90000
## 27 90000
## 28 90000
## 29 90000
## 30 90000
## 31 90000
## 32 90000
## 33 90000
## 34 90000
## 35 90000
## 36 90000
##
## [[3]]
## date_daysAgo
## 1 26
## 2 30
## 3 18
## 4 7
## 5 30
## 6 Today
## 7 30
## 8 5
## 9 7
## 10 30
## 11 20
## 12 8
## 13 14
## 14 17
## 15 6
## 16 7
## 17 30
## 18 7
## 19 30
## 20 18
## 21 30
## 22 30
## 23 26
## 24 7
## 25 8
## 26 14
## 27 17
## 28 6
## 29 7
## 30 30
## 31 29
## 32 30
## 33 30
## 34 7
## 35 30
## 36 27
## 37 26
## 38 30
## 39 30
## 40 29
## 41 30
## 42 30
## 43 30
## 44 9
## 45 30
## 46 27
## 47 26
## 48 30
## 49 30
## 50 30
## 51 7
## 52 26
## 53 30
## 54 18
## 55 8
## 56 14
## 57 17
## 58 6
## 59 30
## 60 7
## 61 29
## 62 30
## 63 30
## 64 7
## 65 30
## 66 27
## 67 26
## 68 30
## 69 30
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Whitefish Bay, WI 53217
## 2 Elements Massage3.6Milwaukee, WI
## 3 Salon & Spa RecruitingMilwaukee, WI 53205 (Triangle area)
## 4 Hand & Stone3.0Milwaukee, WI
## 5 Healthcare Recruitment CounselorsBrookfield, WI
## 6 Neroli Salon & Spa3.6Milwaukee, WI 53202
## 7 Invivo WellnessMilwaukee, WI 53212 (Riverwest area)
## 8 Indo-Pak Massage TherapyMilwaukee, WI•Remote work available
## 9 Hand and Stone Spa3.0Greenfield, WI
## 10 Elements3.6Whitefish Bay, WI 53217+2 locations
## 11 Deep Roots MassageMilwaukee, WI 53207 (Bay View area)
## 12 EAST TOWN SPA2.5Milwaukee, WI 53202 (Juneau Town area)
## 13 Serenity Health Care CenterWaukesha, WI 53186
## 14 Knick Salon & SpaMilwaukee, WI (Yankee Hill area)
## 15 South Shore Family ChiropracticMilwaukee, WI
## 16 Hand & Stone3.0Milwaukee, WI
## 17 Healthcare Recruitment CounselorsBrookfield, WI
## 18 Hand and Stone Spa3.0Greenfield, WI
## 19 Elements Massage3.6Milwaukee, WI
## 20 Salon & Spa RecruitingMilwaukee, WI 53205 (Triangle area)
## 21 Massage Envy3.2Wauwatosa, WI 53226+4 locations
## 22 Massage Envy3.2Brookfield, WI 53045
## 23 Elements Massage3.6Whitefish Bay, WI 53217
## 24 Hand and Stone Spa3.0Waukesha, WI 53188
## 25 EAST TOWN SPA2.5Milwaukee, WI 53202 (Juneau Town area)
## 26 Serenity Health Care CenterWaukesha, WI 53186
## 27 Knick Salon & SpaMilwaukee, WI (Yankee Hill area)
## 28 South Shore Family ChiropracticMilwaukee, WI
## 29 Hand and Stone Spa3.0Greenfield, WI
## 30 Elements3.6Mequon, WI 53092
## 31 Balance Chiropractic CenterMequon, WI 53092
## 32 Indo-Pak Massage TherapyMilwaukee, WI+2 locations
## 33 Massage Envy-Mequon, Bluemound Rd & GreenfieldMilwaukee, WI
## 34 Hand and Stone Spa3.0Waukesha, WI 53188
## 35 Life Time3.6Brookfield, WI 53005
## 36 Healing Hands Therapeutic MassageCedarburg, WI 53012
## 37 Heaven and Earth AcupunctureBrookfield, WI 53005
## 38 Massage Envy3.2Wauwatosa, WI 53226+4 locations
## 39 Massage Envy3.2Brookfield, WI 53045
## 40 Balance Chiropractic CenterMequon, WI 53092
## 41 Indo-Pak Massage TherapyMilwaukee, WI+2 locations
## 42 Massage Envy-Mequon, Bluemound Rd & GreenfieldMilwaukee, WI
## 43 Life Time3.6Brookfield, WI 53005
## 44 Hand & Stone - Greenfield3.0Greenfield, WI 53228+1 location
## 45 Hand and Stone3.0Waukesha, WI 53189
## 46 Healing Hands Therapeutic MassageCedarburg, WI 53012
## 47 Heaven and Earth AcupunctureBrookfield, WI 53005
## 48 Massage Envy3.2Wauwatosa, WI 53226+4 locations
## 49 Massage Envy3.2Brookfield, WI 53045
## 50 Healthcare Recruitment CounselorsBrookfield, WI
## 51 Hand & Stone3.0Milwaukee, WI
## 52 Elements Massage3.6Whitefish Bay, WI 53217
## 53 Elements Massage3.6Milwaukee, WI
## 54 Salon & Spa RecruitingMilwaukee, WI 53205 (Triangle area)
## 55 EAST TOWN SPA2.5Milwaukee, WI 53202 (Juneau Town area)
## 56 Serenity Health Care CenterWaukesha, WI 53186
## 57 Knick Salon & SpaMilwaukee, WI (Yankee Hill area)
## 58 South Shore Family ChiropracticMilwaukee, WI
## 59 Elements3.6Mequon, WI 53092
## 60 Hand and Stone Spa3.0Greenfield, WI
## 61 Balance Chiropractic CenterMequon, WI 53092
## 62 Indo-Pak Massage TherapyMilwaukee, WI+2 locations
## 63 Massage Envy-Mequon, Bluemound Rd & GreenfieldMilwaukee, WI
## 64 Hand and Stone Spa3.0Waukesha, WI 53188
## 65 Life Time3.6Brookfield, WI 53005
## 66 Healing Hands Therapeutic MassageCedarburg, WI 53012
## 67 Heaven and Earth AcupunctureBrookfield, WI 53005
## 68 Massage Envy3.2Wauwatosa, WI 53226+4 locations
## 69 Massage Envy3.2Brookfield, WI 53045
##
## [[5]]
## Salary salary minSalary maxSalary
## 3 \n$30,000 - $90,000 a year $30000 - $90000 30000 90000
## 4 \n$42,552 - $46,885 a year $42552 - $46885 42552 46885
## 7 \n$62,000 a year $62000 62000 NA
## 11 \n$42,552 - $46,885 a year $42552 - $46885 42552 46885
## 13 \n$30,000 - $90,000 a year $30000 - $90000 30000 90000
## 17 \n$62,000 a year $62000 62000 NA
## 26 \n$42,552 - $46,885 a year $42552 - $46885 42552 46885
## 29 \n$30,000 - $90,000 a year $30000 - $90000 30000 90000
## 32 \n$62,000 a year $62000 62000 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 3 42552 68442.5 44850.67 68442.5 30000
## 4 42552 68442.5 44850.67 68442.5 30000
## 7 42552 68442.5 44850.67 68442.5 30000
## 11 42552 68442.5 44850.67 68442.5 30000
## 13 42552 68442.5 44850.67 68442.5 30000
## 17 42552 68442.5 44850.67 68442.5 30000
## 26 42552 68442.5 44850.67 68442.5 30000
## 29 42552 68442.5 44850.67 68442.5 30000
## 32 42552 68442.5 44850.67 68442.5 30000
## maximumMaxSalary
## 3 90000
## 4 90000
## 7 90000
## 11 90000
## 13 90000
## 17 90000
## 26 90000
## 29 90000
## 32 90000
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 1 \n$34 - $44 an hour $34 - $44 34 44 29
## 2 \n$30 - $40 an hour $30 - $40 30 40 29
## 5 \n$40 - $60 an hour $40 - $60 40 60 29
## 8 \n$26 - $43 an hour $26 - $43 26 43 29
## 9 \n$21 - $45 an hour $21 - $45 21 45 29
## 10 \n$18 - $25 an hour $18 - $25 18 25 29
## 12 \n$30 - $40 an hour $30 - $40 30 40 29
## 14 \n$34 - $44 an hour $34 - $44 34 44 29
## 15 \n$21 - $45 an hour $21 - $45 21 45 29
## 16 \n$18 - $25 an hour $18 - $25 18 25 29
## 18 \n$28 an hour $28 28 NA 29
## 19 \n$45 - $70 an hour $45 - $70 45 70 29
## 20 \n$52 an hour $52 52 NA 29
## 21 \n$8 - $23 an hour $8 - $23 8 23 29
## 22 \n$28 an hour $28 28 NA 29
## 23 \n$45 - $70 an hour $45 - $70 45 70 29
## 24 \n$52 an hour $52 52 NA 29
## 25 \n$8 - $23 an hour $8 - $23 8 23 29
## 27 \n$34 - $44 an hour $34 - $44 34 44 29
## 28 \n$30 - $40 an hour $30 - $40 30 40 29
## 30 \n$21 - $45 an hour $21 - $45 21 45 29
## 31 \n$18 - $25 an hour $18 - $25 18 25 29
## 33 \n$28 an hour $28 28 NA 29
## 34 \n$45 - $70 an hour $45 - $70 45 70 29
## 35 \n$52 an hour $52 52 NA 29
## 36 \n$8 - $23 an hour $8 - $23 8 23 29
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 1 43.5 29.76923 42.2 8 70
## 2 43.5 29.76923 42.2 8 70
## 5 43.5 29.76923 42.2 8 70
## 8 43.5 29.76923 42.2 8 70
## 9 43.5 29.76923 42.2 8 70
## 10 43.5 29.76923 42.2 8 70
## 12 43.5 29.76923 42.2 8 70
## 14 43.5 29.76923 42.2 8 70
## 15 43.5 29.76923 42.2 8 70
## 16 43.5 29.76923 42.2 8 70
## 18 43.5 29.76923 42.2 8 70
## 19 43.5 29.76923 42.2 8 70
## 20 43.5 29.76923 42.2 8 70
## 21 43.5 29.76923 42.2 8 70
## 22 43.5 29.76923 42.2 8 70
## 23 43.5 29.76923 42.2 8 70
## 24 43.5 29.76923 42.2 8 70
## 25 43.5 29.76923 42.2 8 70
## 27 43.5 29.76923 42.2 8 70
## 28 43.5 29.76923 42.2 8 70
## 30 43.5 29.76923 42.2 8 70
## 31 43.5 29.76923 42.2 8 70
## 33 43.5 29.76923 42.2 8 70
## 34 43.5 29.76923 42.2 8 70
## 35 43.5 29.76923 42.2 8 70
## 36 43.5 29.76923 42.2 8 70
##
## [[7]]
## city state
## 1 Milwaukee WI
## 2 Milwaukee WI
## 3 Milwaukee WI
## 4 Milwaukee WI
## 5 Milwaukee WI
## 6 Milwaukee WI
## 7 Milwaukee WI
## 8 Milwaukee WI
## 9 Milwaukee WI
## 10 Milwaukee WI
## 11 Milwaukee WI
## 12 Milwaukee WI
## 13 Milwaukee WI
## 14 Milwaukee WI
## 15 Milwaukee WI
## 16 Milwaukee WI
## 17 Milwaukee WI
## 18 Milwaukee WI
## 19 Milwaukee WI
## 20 Milwaukee WI
## 21 Milwaukee WI
## 22 Milwaukee WI
## 23 Milwaukee WI
## 24 Milwaukee WI
## 25 Milwaukee WI
## 26 Milwaukee WI
## 27 Milwaukee WI
## 28 Milwaukee WI
## 29 Milwaukee WI
## 30 Milwaukee WI
## 31 Milwaukee WI
## 32 Milwaukee WI
## 33 Milwaukee WI
## 34 Milwaukee WI
## 35 Milwaukee WI
## 36 Milwaukee WI
## 37 Milwaukee WI
## 38 Milwaukee WI
## 39 Milwaukee WI
## 40 Milwaukee WI
## 41 Milwaukee WI
## 42 Milwaukee WI
## 43 Milwaukee WI
## 44 Milwaukee WI
## 45 Milwaukee WI
## 46 Milwaukee WI
## 47 Milwaukee WI
## 48 Milwaukee WI
## 49 Milwaukee WI
## 50 Milwaukee WI
## 51 Milwaukee WI
## 52 Milwaukee WI
## 53 Milwaukee WI
## 54 Milwaukee WI
## 55 Milwaukee WI
## 56 Milwaukee WI
## 57 Milwaukee WI
## 58 Milwaukee WI
## 59 Milwaukee WI
## 60 Milwaukee WI
## 61 Milwaukee WI
## 62 Milwaukee WI
## 63 Milwaukee WI
## 64 Milwaukee WI
## 65 Milwaukee WI
## 66 Milwaukee WI
## 67 Milwaukee WI
## 68 Milwaukee WI
## 69 Milwaukee WI
## jobTitle
## 1 Massage Therapist
## 2 Licensed Massage Therapist
## 3 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 4 Licensed Massage Therapist Signing Bonus Offered
## 5 Licensed Massage Therapist
## 6 Massage Therapist
## 7 Massage Therapist - Independent Contractor / Start Today- We...
## 8 Massage Therapist - Independent Contractor
## 9 Licensed Massage Therapist
## 10 Massage Therapist
## 11 Licensed Massage Therapist
## 12 Licensed Massage Therapist- full and part time
## 13 Licensed Massage Therapist / Body Work / CST / SOT / LET / R...
## 14 Licensed Massage Therapist
## 15 Licensed Massage Therapist
## 16 Licensed Massage Therapist Signing Bonus Offered
## 17 Licensed Massage Therapist
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 21 Massage Therapist
## 22 Massage Therapist Full or Part Time
## 23 Massage Therapist
## 24 Lead Massage Therapist
## 25 Licensed Massage Therapist- full and part time
## 26 Licensed Massage Therapist / Body Work / CST / SOT / LET / R...
## 27 Licensed Massage Therapist
## 28 Licensed Massage Therapist
## 29 Licensed Massage Therapist
## 30 Massage Therapist ** Post Covid Job Opening**
## 31 Muscle/Massage therapist
## 32 Mobile Massage Therapist
## 33 Licensed Massage Therapist
## 34 Lead Massage Therapist
## 35 Massage Therapist
## 36 Full or Part Time Therapeutic Massage Therapist
## 37 Licensed Massage Therapist
## 38 Massage Therapist
## 39 Massage Therapist Full or Part Time
## 40 Muscle/Massage therapist
## 41 Mobile Massage Therapist
## 42 Licensed Massage Therapist
## 43 Massage Therapist
## 44 Licensed Massage Therapist
## 45 Lead Massage Therapist
## 46 Full or Part Time Therapeutic Massage Therapist
## 47 Licensed Massage Therapist
## 48 Massage Therapist
## 49 Massage Therapist Full or Part Time
## 50 Licensed Massage Therapist
## 51 Licensed Massage Therapist Signing Bonus Offered
## 52 Massage Therapist
## 53 Licensed Massage Therapist
## 54 Massage Therapist,Estheticians,Stylists,Colorists,Guest Serv...
## 55 Licensed Massage Therapist- full and part time
## 56 Licensed Massage Therapist / Body Work / CST / SOT / LET / R...
## 57 Licensed Massage Therapist
## 58 Licensed Massage Therapist
## 59 Massage Therapist ** Post Covid Job Opening**
## 60 Licensed Massage Therapist
## 61 Muscle/Massage therapist
## 62 Mobile Massage Therapist
## 63 Licensed Massage Therapist
## 64 Lead Massage Therapist
## 65 Massage Therapist
## 66 Full or Part Time Therapeutic Massage Therapist
## 67 Licensed Massage Therapist
## 68 Massage Therapist
## 69 Massage Therapist Full or Part Time
## HiringAgency date_daysAgo
## 1 Elements Massage3.6Whitefish Bay, WI 53217 26
## 2 Elements Massage3.6Milwaukee, WI 30
## 3 Salon & Spa RecruitingMilwaukee, WI 53205 (Triangle area) 18
## 4 Hand & Stone3.0Milwaukee, WI 7
## 5 Healthcare Recruitment CounselorsBrookfield, WI 30
## 6 Neroli Salon & Spa3.6Milwaukee, WI 53202 Today
## 7 Invivo WellnessMilwaukee, WI 53212 (Riverwest area) 30
## 8 Indo-Pak Massage TherapyMilwaukee, WI•Remote work available 5
## 9 Hand and Stone Spa3.0Greenfield, WI 7
## 10 Elements3.6Whitefish Bay, WI 53217+2 locations 30
## 11 Deep Roots MassageMilwaukee, WI 53207 (Bay View area) 20
## 12 EAST TOWN SPA2.5Milwaukee, WI 53202 (Juneau Town area) 8
## 13 Serenity Health Care CenterWaukesha, WI 53186 14
## 14 Knick Salon & SpaMilwaukee, WI (Yankee Hill area) 17
## 15 South Shore Family ChiropracticMilwaukee, WI 6
## 16 Hand & Stone3.0Milwaukee, WI 7
## 17 Healthcare Recruitment CounselorsBrookfield, WI 30
## 18 Hand and Stone Spa3.0Greenfield, WI 7
## 19 Elements Massage3.6Milwaukee, WI 30
## 20 Salon & Spa RecruitingMilwaukee, WI 53205 (Triangle area) 18
## 21 Massage Envy3.2Wauwatosa, WI 53226+4 locations 30
## 22 Massage Envy3.2Brookfield, WI 53045 30
## 23 Elements Massage3.6Whitefish Bay, WI 53217 26
## 24 Hand and Stone Spa3.0Waukesha, WI 53188 7
## 25 EAST TOWN SPA2.5Milwaukee, WI 53202 (Juneau Town area) 8
## 26 Serenity Health Care CenterWaukesha, WI 53186 14
## 27 Knick Salon & SpaMilwaukee, WI (Yankee Hill area) 17
## 28 South Shore Family ChiropracticMilwaukee, WI 6
## 29 Hand and Stone Spa3.0Greenfield, WI 7
## 30 Elements3.6Mequon, WI 53092 30
## 31 Balance Chiropractic CenterMequon, WI 53092 29
## 32 Indo-Pak Massage TherapyMilwaukee, WI+2 locations 30
## 33 Massage Envy-Mequon, Bluemound Rd & GreenfieldMilwaukee, WI 30
## 34 Hand and Stone Spa3.0Waukesha, WI 53188 7
## 35 Life Time3.6Brookfield, WI 53005 30
## 36 Healing Hands Therapeutic MassageCedarburg, WI 53012 27
## 37 Heaven and Earth AcupunctureBrookfield, WI 53005 26
## 38 Massage Envy3.2Wauwatosa, WI 53226+4 locations 30
## 39 Massage Envy3.2Brookfield, WI 53045 30
## 40 Balance Chiropractic CenterMequon, WI 53092 29
## 41 Indo-Pak Massage TherapyMilwaukee, WI+2 locations 30
## 42 Massage Envy-Mequon, Bluemound Rd & GreenfieldMilwaukee, WI 30
## 43 Life Time3.6Brookfield, WI 53005 30
## 44 Hand & Stone - Greenfield3.0Greenfield, WI 53228+1 location 9
## 45 Hand and Stone3.0Waukesha, WI 53189 30
## 46 Healing Hands Therapeutic MassageCedarburg, WI 53012 27
## 47 Heaven and Earth AcupunctureBrookfield, WI 53005 26
## 48 Massage Envy3.2Wauwatosa, WI 53226+4 locations 30
## 49 Massage Envy3.2Brookfield, WI 53045 30
## 50 Healthcare Recruitment CounselorsBrookfield, WI 30
## 51 Hand & Stone3.0Milwaukee, WI 7
## 52 Elements Massage3.6Whitefish Bay, WI 53217 26
## 53 Elements Massage3.6Milwaukee, WI 30
## 54 Salon & Spa RecruitingMilwaukee, WI 53205 (Triangle area) 18
## 55 EAST TOWN SPA2.5Milwaukee, WI 53202 (Juneau Town area) 8
## 56 Serenity Health Care CenterWaukesha, WI 53186 14
## 57 Knick Salon & SpaMilwaukee, WI (Yankee Hill area) 17
## 58 South Shore Family ChiropracticMilwaukee, WI 6
## 59 Elements3.6Mequon, WI 53092 30
## 60 Hand and Stone Spa3.0Greenfield, WI 7
## 61 Balance Chiropractic CenterMequon, WI 53092 29
## 62 Indo-Pak Massage TherapyMilwaukee, WI+2 locations 30
## 63 Massage Envy-Mequon, Bluemound Rd & GreenfieldMilwaukee, WI 30
## 64 Hand and Stone Spa3.0Waukesha, WI 53188 7
## 65 Life Time3.6Brookfield, WI 53005 30
## 66 Healing Hands Therapeutic MassageCedarburg, WI 53012 27
## 67 Heaven and Earth AcupunctureBrookfield, WI 53005 26
## 68 Massage Envy3.2Wauwatosa, WI 53226+4 locations 30
## 69 Massage Envy3.2Brookfield, WI 53045 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 8 70 30000 90000
## 2 8 70 30000 90000
## 3 8 70 30000 90000
## 4 8 70 30000 90000
## 5 8 70 30000 90000
## 6 8 70 30000 90000
## 7 8 70 30000 90000
## 8 8 70 30000 90000
## 9 8 70 30000 90000
## 10 8 70 30000 90000
## 11 8 70 30000 90000
## 12 8 70 30000 90000
## 13 8 70 30000 90000
## 14 8 70 30000 90000
## 15 8 70 30000 90000
## 16 8 70 30000 90000
## 17 8 70 30000 90000
## 18 8 70 30000 90000
## 19 8 70 30000 90000
## 20 8 70 30000 90000
## 21 8 70 30000 90000
## 22 8 70 30000 90000
## 23 8 70 30000 90000
## 24 8 70 30000 90000
## 25 8 70 30000 90000
## 26 8 70 30000 90000
## 27 8 70 30000 90000
## 28 8 70 30000 90000
## 29 8 70 30000 90000
## 30 8 70 30000 90000
## 31 8 70 30000 90000
## 32 8 70 30000 90000
## 33 8 70 30000 90000
## 34 8 70 30000 90000
## 35 8 70 30000 90000
## 36 8 70 30000 90000
## 37 8 70 30000 90000
## 38 8 70 30000 90000
## 39 8 70 30000 90000
## 40 8 70 30000 90000
## 41 8 70 30000 90000
## 42 8 70 30000 90000
## 43 8 70 30000 90000
## 44 8 70 30000 90000
## 45 8 70 30000 90000
## 46 8 70 30000 90000
## 47 8 70 30000 90000
## 48 8 70 30000 90000
## 49 8 70 30000 90000
## 50 8 70 30000 90000
## 51 8 70 30000 90000
## 52 8 70 30000 90000
## 53 8 70 30000 90000
## 54 8 70 30000 90000
## 55 8 70 30000 90000
## 56 8 70 30000 90000
## 57 8 70 30000 90000
## 58 8 70 30000 90000
## 59 8 70 30000 90000
## 60 8 70 30000 90000
## 61 8 70 30000 90000
## 62 8 70 30000 90000
## 63 8 70 30000 90000
## 64 8 70 30000 90000
## 65 8 70 30000 90000
## 66 8 70 30000 90000
## 67 8 70 30000 90000
## 68 8 70 30000 90000
## 69 8 70 30000 90000
getIndeedJobData5pages('massage therapist', 'Madison','WI')
## Warning in getIndeedJobData5pages("massage therapist", "Madison", "WI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Madison", "WI"): NAs
## introduced by coercion
## Warning in getIndeedJobData5pages("massage therapist", "Madison", "WI"): NAs
## introduced by coercion
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist Madison
## 3 Massage Therapist - Independent Contractor
## 4 Licensed Massage Therapist
## 5 Licensed Massage Therapist
## 6 Licensed Massage Therapist
## 7 Licensed Massage Therapist
## 8 MASSAGE THERAPIST
## 9 Massage Therapist
## 10 Massage Therapist, Licensed
## 11 Massage Therapist
## 12 Massage Therapist
## 13 Massage Therapist Madison West
## 14 Salon Massage Therapist
## 15 Licensed Massage Therapist
## 16 Massage Therapist Madison
## 17 Massage Therapist - Independent Contractor
## 18 Licensed Massage Therapist
## 19 Licensed Massage Therapist
## 20 Licensed Massage Therapist
## 21 Massage Therapist, Licensed
## 22 Licensed Massage Therapist
## 23 Massage Therapist
## 24 MASSAGE THERAPIST
## 25 Massage Therapist
## 26 Massage Therapist
## 27 Massage Therapist Madison West
## 28 Salon Massage Therapist
## 29 Licensed Massage Therapist
## 30 Licensed Massage Thereapist
## 31 Massage Therapist Madison
## 32 Massage Therapist - Independent Contractor
## 33 Licensed Massage Therapist
## 34 Licensed Massage Therapist
## 35 Licensed Massage Therapist
## 36 Massage Therapist
## 37 Massage Therapist, Licensed
## 38 Licensed Massage Therapist
## 39 MASSAGE THERAPIST
## 40 Massage Therapist
## 41 Massage Therapist
## 42 Massage Therapist Madison West
## 43 Salon Massage Therapist
## 44 Licensed Massage Therapist
## 45 Licensed Massage Thereapist
## 46 Massage Therapist Madison
## 47 Massage Therapist - Independent Contractor
## 48 Licensed Massage Therapist
## 49 Licensed Massage Therapist
## 50 Licensed Massage Therapist
## 51 Massage Therapist, Licensed
## 52 Licensed Massage Therapist
## 53 Massage Therapist
## 54 MASSAGE THERAPIST
## 55 Massage Therapist
## 56 Massage Therapist
## 57 Massage Therapist Madison West
## 58 Salon Massage Therapist
## 59 Licensed Massage Therapist
## 60 Licensed Massage Thereapist
## 61 Massage Therapist Madison
## 62 Massage Therapist - Independent Contractor
## 63 Licensed Massage Therapist
## 64 Licensed Massage Therapist
## 65 Licensed Massage Therapist
## 66 Licensed Massage Therapist
## 67 MASSAGE THERAPIST
## 68 Massage Therapist
## 69 Massage Therapist, Licensed
## 70 Massage Therapist
## 71 Massage Therapist
## 72 Massage Therapist Madison West
## 73 Salon Massage Therapist
## 74 Licensed Massage Therapist
## 75 Licensed Massage Thereapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$30,000 - $50,000 a year $30000 - $50000 30000.0 50000.00
## 2 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000.00
## 3 \n$37,988 - $50,000 a year $37988 - $50000 37988.0 50000.00
## 4 \n$20,000 - $60,000 a year $20000 - $60000 20000.0 60000.00
## 5 \n$35,000 a year $35000 35000.0 NA
## 6 \n$8.50 an hour $8.50 8.5 NA
## 7 \n$35,000 - $60,000 a year $35000 - $60000 35000.0 60000.00
## 8 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 9 \nUp to $25 an hour $25 25.0 NA
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000.00
## 11 \n$37,988 - $50,000 a year $37988 - $50000 37988.0 50000.00
## 12 \n$20,000 - $60,000 a year $20000 - $60000 20000.0 60000.00
## 13 \n$35,000 a year $35000 35000.0 NA
## 14 \n$8.50 an hour $8.50 8.5 NA
## 15 \n$35,000 - $60,000 a year $35000 - $60000 35000.0 60000.00
## 16 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 17 \nUp to $25 an hour $25 25.0 NA
## 18 \nUp to $25 an hour $25 25.0 NA
## 19 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000.00
## 20 \n$37,988 - $50,000 a year $37988 - $50000 37988.0 50000.00
## 21 \n$20,000 - $60,000 a year $20000 - $60000 20000.0 60000.00
## 22 \n$35,000 a year $35000 35000.0 NA
## 23 \n$8.50 an hour $8.50 8.5 NA
## 24 \n$35,000 - $60,000 a year $35000 - $60000 35000.0 60000.00
## 25 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 26 \nUp to $25 an hour $25 25.0 NA
## 27 \nUp to $25 an hour $25 25.0 NA
## 28 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000.00
## 29 \n$37,988 - $50,000 a year $37988 - $50000 37988.0 50000.00
## 30 \n$20,000 - $60,000 a year $20000 - $60000 20000.0 60000.00
## 31 \n$35,000 a year $35000 35000.0 NA
## 32 \n$8.50 an hour $8.50 8.5 NA
## 33 \n$35,000 - $60,000 a year $35000 - $60000 35000.0 60000.00
## 34 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 35 \nUp to $25 an hour $25 25.0 NA
## 36 \nUp to $25 an hour $25 25.0 NA
## 37 \n$5,000 - $12,000 a month $5000 - $12000 5000.0 12000.00
## 38 \n$37,988 - $50,000 a year $37988 - $50000 37988.0 50000.00
## 39 \n$20,000 - $60,000 a year $20000 - $60000 20000.0 60000.00
## 40 \n$35,000 a year $35000 35000.0 NA
## 41 \n$8.50 an hour $8.50 8.5 NA
## 42 \n$35,000 - $60,000 a year $35000 - $60000 35000.0 60000.00
## 43 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 44 \nUp to $25 an hour $25 25.0 NA
## 45 \nUp to $25 an hour $25 25.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 5000 20000 15452.83 23319.14 8.5
## 2 5000 20000 15452.83 23319.14 8.5
## 3 5000 20000 15452.83 23319.14 8.5
## 4 5000 20000 15452.83 23319.14 8.5
## 5 5000 20000 15452.83 23319.14 8.5
## 6 5000 20000 15452.83 23319.14 8.5
## 7 5000 20000 15452.83 23319.14 8.5
## 8 5000 20000 15452.83 23319.14 8.5
## 9 5000 20000 15452.83 23319.14 8.5
## 10 5000 20000 15452.83 23319.14 8.5
## 11 5000 20000 15452.83 23319.14 8.5
## 12 5000 20000 15452.83 23319.14 8.5
## 13 5000 20000 15452.83 23319.14 8.5
## 14 5000 20000 15452.83 23319.14 8.5
## 15 5000 20000 15452.83 23319.14 8.5
## 16 5000 20000 15452.83 23319.14 8.5
## 17 5000 20000 15452.83 23319.14 8.5
## 18 5000 20000 15452.83 23319.14 8.5
## 19 5000 20000 15452.83 23319.14 8.5
## 20 5000 20000 15452.83 23319.14 8.5
## 21 5000 20000 15452.83 23319.14 8.5
## 22 5000 20000 15452.83 23319.14 8.5
## 23 5000 20000 15452.83 23319.14 8.5
## 24 5000 20000 15452.83 23319.14 8.5
## 25 5000 20000 15452.83 23319.14 8.5
## 26 5000 20000 15452.83 23319.14 8.5
## 27 5000 20000 15452.83 23319.14 8.5
## 28 5000 20000 15452.83 23319.14 8.5
## 29 5000 20000 15452.83 23319.14 8.5
## 30 5000 20000 15452.83 23319.14 8.5
## 31 5000 20000 15452.83 23319.14 8.5
## 32 5000 20000 15452.83 23319.14 8.5
## 33 5000 20000 15452.83 23319.14 8.5
## 34 5000 20000 15452.83 23319.14 8.5
## 35 5000 20000 15452.83 23319.14 8.5
## 36 5000 20000 15452.83 23319.14 8.5
## 37 5000 20000 15452.83 23319.14 8.5
## 38 5000 20000 15452.83 23319.14 8.5
## 39 5000 20000 15452.83 23319.14 8.5
## 40 5000 20000 15452.83 23319.14 8.5
## 41 5000 20000 15452.83 23319.14 8.5
## 42 5000 20000 15452.83 23319.14 8.5
## 43 5000 20000 15452.83 23319.14 8.5
## 44 5000 20000 15452.83 23319.14 8.5
## 45 5000 20000 15452.83 23319.14 8.5
## maximumMaxSalary
## 1 60000
## 2 60000
## 3 60000
## 4 60000
## 5 60000
## 6 60000
## 7 60000
## 8 60000
## 9 60000
## 10 60000
## 11 60000
## 12 60000
## 13 60000
## 14 60000
## 15 60000
## 16 60000
## 17 60000
## 18 60000
## 19 60000
## 20 60000
## 21 60000
## 22 60000
## 23 60000
## 24 60000
## 25 60000
## 26 60000
## 27 60000
## 28 60000
## 29 60000
## 30 60000
## 31 60000
## 32 60000
## 33 60000
## 34 60000
## 35 60000
## 36 60000
## 37 60000
## 38 60000
## 39 60000
## 40 60000
## 41 60000
## 42 60000
## 43 60000
## 44 60000
## 45 60000
##
## [[3]]
## date_daysAgo
## 1 30
## 2 6
## 3 5
## 4 28
## 5 30
## 6 21
## 7 11
## 8 30
## 9 30
## 10 30
## 11 30
## 12 30
## 13 30
## 14 30
## 15 6
## 16 6
## 17 5
## 18 28
## 19 30
## 20 21
## 21 30
## 22 11
## 23 30
## 24 30
## 25 30
## 26 30
## 27 30
## 28 30
## 29 6
## 30 30
## 31 6
## 32 5
## 33 28
## 34 30
## 35 21
## 36 30
## 37 30
## 38 11
## 39 30
## 40 30
## 41 30
## 42 30
## 43 30
## 44 6
## 45 30
## 46 6
## 47 5
## 48 28
## 49 30
## 50 21
## 51 30
## 52 11
## 53 30
## 54 30
## 55 30
## 56 30
## 57 30
## 58 30
## 59 6
## 60 30
## 61 6
## 62 5
## 63 28
## 64 30
## 65 21
## 66 11
## 67 30
## 68 30
## 69 30
## 70 30
## 71 30
## 72 30
## 73 30
## 74 6
## 75 30
##
## [[4]]
## HiringAgency
## 1 Elements Massage3.6Sun Prairie, WI 53590
## 2 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719
## 3 Indo-Pak Massage TherapyMadison, WI•Remote work available
## 4 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI
## 5 Isthmus WellnessMadison, WI 53717 (Junction Ridge area)
## 6 Studio 262 SalonMiddleton, WI 53562
## 7 Wellness Clinic4.0Madison, WI+1 location
## 8 Kneaded Relief Day SpaFitchburg, WI 53711
## 9 Elements3.6Middleton, WI 53562+1 location
## 10 Edgerton Hospital4.2Edgerton, WI 53534
## 11 The Edgewater3.8Madison, WI 53703 (Capitol area)
## 12 Indulge SpaMadison, WI 53704
## 13 Haven SpaMadison, WI 53719
## 14 JCPenney3.7Madison, WI 53704
## 15 Massage Envy3.2Middleton, WI 53562+1 location
## 16 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719
## 17 Indo-Pak Massage TherapyMadison, WI•Remote work available
## 18 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI
## 19 Isthmus WellnessMadison, WI 53717 (Junction Ridge area)
## 20 Studio 262 SalonMiddleton, WI 53562
## 21 Edgerton Hospital4.2Edgerton, WI 53534
## 22 Wellness Clinic4.0Madison, WI+1 location
## 23 Elements3.6Middleton, WI 53562+1 location
## 24 Kneaded Relief Day SpaFitchburg, WI 53711
## 25 The Edgewater3.8Madison, WI 53703 (Capitol area)
## 26 Indulge SpaMadison, WI 53704
## 27 Haven SpaMadison, WI 53719
## 28 JCPenney3.7Madison, WI 53704
## 29 Massage Envy3.2Middleton, WI 53562+1 location
## 30 Massage Envy3.2Madison, WI 53704
## 31 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719
## 32 Indo-Pak Massage TherapyMadison, WI•Remote work available
## 33 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI
## 34 Isthmus WellnessMadison, WI 53717 (Junction Ridge area)
## 35 Studio 262 SalonMiddleton, WI 53562
## 36 Elements3.6Middleton, WI 53562+1 location
## 37 Edgerton Hospital4.2Edgerton, WI 53534
## 38 Wellness Clinic4.0Madison, WI+1 location
## 39 Kneaded Relief Day SpaFitchburg, WI 53711
## 40 The Edgewater3.8Madison, WI 53703 (Capitol area)
## 41 Indulge SpaMadison, WI 53704
## 42 Haven SpaMadison, WI 53719
## 43 JCPenney3.7Madison, WI 53704
## 44 Massage Envy3.2Middleton, WI 53562+1 location
## 45 Massage Envy3.2Madison, WI 53704
## 46 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719
## 47 Indo-Pak Massage TherapyMadison, WI•Remote work available
## 48 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI
## 49 Isthmus WellnessMadison, WI 53717 (Junction Ridge area)
## 50 Studio 262 SalonMiddleton, WI 53562
## 51 Edgerton Hospital4.2Edgerton, WI 53534
## 52 Wellness Clinic4.0Madison, WI+1 location
## 53 Elements3.6Middleton, WI 53562+1 location
## 54 Kneaded Relief Day SpaFitchburg, WI 53711
## 55 The Edgewater3.8Madison, WI 53703 (Capitol area)
## 56 Indulge SpaMadison, WI 53704
## 57 Haven SpaMadison, WI 53719
## 58 JCPenney3.7Madison, WI 53704
## 59 Massage Envy3.2Middleton, WI 53562+1 location
## 60 Massage Envy3.2Madison, WI 53704
## 61 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719
## 62 Indo-Pak Massage TherapyMadison, WI•Remote work available
## 63 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI
## 64 Isthmus WellnessMadison, WI 53717 (Junction Ridge area)
## 65 Studio 262 SalonMiddleton, WI 53562
## 66 Wellness Clinic4.0Madison, WI+1 location
## 67 Kneaded Relief Day SpaFitchburg, WI 53711
## 68 Elements3.6Middleton, WI 53562+1 location
## 69 Edgerton Hospital4.2Edgerton, WI 53534
## 70 The Edgewater3.8Madison, WI 53703 (Capitol area)
## 71 Indulge SpaMadison, WI 53704
## 72 Haven SpaMadison, WI 53719
## 73 JCPenney3.7Madison, WI 53704
## 74 Massage Envy3.2Middleton, WI 53562+1 location
## 75 Massage Envy3.2Madison, WI 53704
##
## [[5]]
## Salary salary minSalary maxSalary
## 1 \n$30,000 - $50,000 a year $30000 - $50000 30000 50000
## 3 \n$37,988 - $50,000 a year $37988 - $50000 37988 50000
## 4 \n$20,000 - $60,000 a year $20000 - $60000 20000 60000
## 5 \n$35,000 a year $35000 35000 NA
## 7 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 11 \n$37,988 - $50,000 a year $37988 - $50000 37988 50000
## 12 \n$20,000 - $60,000 a year $20000 - $60000 20000 60000
## 13 \n$35,000 a year $35000 35000 NA
## 15 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 20 \n$37,988 - $50,000 a year $37988 - $50000 37988 50000
## 21 \n$20,000 - $60,000 a year $20000 - $60000 20000 60000
## 22 \n$35,000 a year $35000 35000 NA
## 24 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 29 \n$37,988 - $50,000 a year $37988 - $50000 37988 50000
## 30 \n$20,000 - $60,000 a year $20000 - $60000 20000 60000
## 31 \n$35,000 a year $35000 35000 NA
## 33 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## 38 \n$37,988 - $50,000 a year $37988 - $50000 37988 50000
## 39 \n$20,000 - $60,000 a year $20000 - $60000 20000 60000
## 40 \n$35,000 a year $35000 35000 NA
## 42 \n$35,000 - $60,000 a year $35000 - $60000 35000 60000
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 35000 60000 31901.9 56250 20000
## 3 35000 60000 31901.9 56250 20000
## 4 35000 60000 31901.9 56250 20000
## 5 35000 60000 31901.9 56250 20000
## 7 35000 60000 31901.9 56250 20000
## 11 35000 60000 31901.9 56250 20000
## 12 35000 60000 31901.9 56250 20000
## 13 35000 60000 31901.9 56250 20000
## 15 35000 60000 31901.9 56250 20000
## 20 35000 60000 31901.9 56250 20000
## 21 35000 60000 31901.9 56250 20000
## 22 35000 60000 31901.9 56250 20000
## 24 35000 60000 31901.9 56250 20000
## 29 35000 60000 31901.9 56250 20000
## 30 35000 60000 31901.9 56250 20000
## 31 35000 60000 31901.9 56250 20000
## 33 35000 60000 31901.9 56250 20000
## 38 35000 60000 31901.9 56250 20000
## 39 35000 60000 31901.9 56250 20000
## 40 35000 60000 31901.9 56250 20000
## 42 35000 60000 31901.9 56250 20000
## maximumMaxSalary
## 1 60000
## 3 60000
## 4 60000
## 5 60000
## 7 60000
## 11 60000
## 12 60000
## 13 60000
## 15 60000
## 20 60000
## 21 60000
## 22 60000
## 24 60000
## 29 60000
## 30 60000
## 31 60000
## 33 60000
## 38 60000
## 39 60000
## 40 60000
## 42 60000
##
## [[6]]
## Salary salary minSalary maxSalary
## 6 \n$8.50 an hour $8.50 8.5 NA
## 8 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 9 \nUp to $25 an hour $25 25.0 NA
## 14 \n$8.50 an hour $8.50 8.5 NA
## 16 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 17 \nUp to $25 an hour $25 25.0 NA
## 18 \nUp to $25 an hour $25 25.0 NA
## 23 \n$8.50 an hour $8.50 8.5 NA
## 25 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 26 \nUp to $25 an hour $25 25.0 NA
## 27 \nUp to $25 an hour $25 25.0 NA
## 32 \n$8.50 an hour $8.50 8.5 NA
## 34 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 35 \nUp to $25 an hour $25 25.0 NA
## 36 \nUp to $25 an hour $25 25.0 NA
## 41 \n$8.50 an hour $8.50 8.5 NA
## 43 \n$34.00 - $56.25 an hour $34.00 - $56.25 34.0 56.25
## 44 \nUp to $25 an hour $25 25.0 NA
## 45 \nUp to $25 an hour $25 25.0 NA
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 6 25 56.25 23.02632 56.25 8.5
## 8 25 56.25 23.02632 56.25 8.5
## 9 25 56.25 23.02632 56.25 8.5
## 14 25 56.25 23.02632 56.25 8.5
## 16 25 56.25 23.02632 56.25 8.5
## 17 25 56.25 23.02632 56.25 8.5
## 18 25 56.25 23.02632 56.25 8.5
## 23 25 56.25 23.02632 56.25 8.5
## 25 25 56.25 23.02632 56.25 8.5
## 26 25 56.25 23.02632 56.25 8.5
## 27 25 56.25 23.02632 56.25 8.5
## 32 25 56.25 23.02632 56.25 8.5
## 34 25 56.25 23.02632 56.25 8.5
## 35 25 56.25 23.02632 56.25 8.5
## 36 25 56.25 23.02632 56.25 8.5
## 41 25 56.25 23.02632 56.25 8.5
## 43 25 56.25 23.02632 56.25 8.5
## 44 25 56.25 23.02632 56.25 8.5
## 45 25 56.25 23.02632 56.25 8.5
## maximumMaxSalary
## 6 56.25
## 8 56.25
## 9 56.25
## 14 56.25
## 16 56.25
## 17 56.25
## 18 56.25
## 23 56.25
## 25 56.25
## 26 56.25
## 27 56.25
## 32 56.25
## 34 56.25
## 35 56.25
## 36 56.25
## 41 56.25
## 43 56.25
## 44 56.25
## 45 56.25
##
## [[7]]
## city state jobTitle
## 1 Madison WI Massage Therapist
## 2 Madison WI Massage Therapist Madison
## 3 Madison WI Massage Therapist - Independent Contractor
## 4 Madison WI Licensed Massage Therapist
## 5 Madison WI Licensed Massage Therapist
## 6 Madison WI Licensed Massage Therapist
## 7 Madison WI Licensed Massage Therapist
## 8 Madison WI MASSAGE THERAPIST
## 9 Madison WI Massage Therapist
## 10 Madison WI Massage Therapist, Licensed
## 11 Madison WI Massage Therapist
## 12 Madison WI Massage Therapist
## 13 Madison WI Massage Therapist Madison West
## 14 Madison WI Salon Massage Therapist
## 15 Madison WI Licensed Massage Therapist
## 16 Madison WI Massage Therapist Madison
## 17 Madison WI Massage Therapist - Independent Contractor
## 18 Madison WI Licensed Massage Therapist
## 19 Madison WI Licensed Massage Therapist
## 20 Madison WI Licensed Massage Therapist
## 21 Madison WI Massage Therapist, Licensed
## 22 Madison WI Licensed Massage Therapist
## 23 Madison WI Massage Therapist
## 24 Madison WI MASSAGE THERAPIST
## 25 Madison WI Massage Therapist
## 26 Madison WI Massage Therapist
## 27 Madison WI Massage Therapist Madison West
## 28 Madison WI Salon Massage Therapist
## 29 Madison WI Licensed Massage Therapist
## 30 Madison WI Licensed Massage Thereapist
## 31 Madison WI Massage Therapist Madison
## 32 Madison WI Massage Therapist - Independent Contractor
## 33 Madison WI Licensed Massage Therapist
## 34 Madison WI Licensed Massage Therapist
## 35 Madison WI Licensed Massage Therapist
## 36 Madison WI Massage Therapist
## 37 Madison WI Massage Therapist, Licensed
## 38 Madison WI Licensed Massage Therapist
## 39 Madison WI MASSAGE THERAPIST
## 40 Madison WI Massage Therapist
## 41 Madison WI Massage Therapist
## 42 Madison WI Massage Therapist Madison West
## 43 Madison WI Salon Massage Therapist
## 44 Madison WI Licensed Massage Therapist
## 45 Madison WI Licensed Massage Thereapist
## 46 Madison WI Massage Therapist Madison
## 47 Madison WI Massage Therapist - Independent Contractor
## 48 Madison WI Licensed Massage Therapist
## 49 Madison WI Licensed Massage Therapist
## 50 Madison WI Licensed Massage Therapist
## 51 Madison WI Massage Therapist, Licensed
## 52 Madison WI Licensed Massage Therapist
## 53 Madison WI Massage Therapist
## 54 Madison WI MASSAGE THERAPIST
## 55 Madison WI Massage Therapist
## 56 Madison WI Massage Therapist
## 57 Madison WI Massage Therapist Madison West
## 58 Madison WI Salon Massage Therapist
## 59 Madison WI Licensed Massage Therapist
## 60 Madison WI Licensed Massage Thereapist
## 61 Madison WI Massage Therapist Madison
## 62 Madison WI Massage Therapist - Independent Contractor
## 63 Madison WI Licensed Massage Therapist
## 64 Madison WI Licensed Massage Therapist
## 65 Madison WI Licensed Massage Therapist
## 66 Madison WI Licensed Massage Therapist
## 67 Madison WI MASSAGE THERAPIST
## 68 Madison WI Massage Therapist
## 69 Madison WI Massage Therapist, Licensed
## 70 Madison WI Massage Therapist
## 71 Madison WI Massage Therapist
## 72 Madison WI Massage Therapist Madison West
## 73 Madison WI Salon Massage Therapist
## 74 Madison WI Licensed Massage Therapist
## 75 Madison WI Licensed Massage Thereapist
## HiringAgency date_daysAgo
## 1 Elements Massage3.6Sun Prairie, WI 53590 30
## 2 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719 6
## 3 Indo-Pak Massage TherapyMadison, WI•Remote work available 5
## 4 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI 28
## 5 Isthmus WellnessMadison, WI 53717 (Junction Ridge area) 30
## 6 Studio 262 SalonMiddleton, WI 53562 21
## 7 Wellness Clinic4.0Madison, WI+1 location 11
## 8 Kneaded Relief Day SpaFitchburg, WI 53711 30
## 9 Elements3.6Middleton, WI 53562+1 location 30
## 10 Edgerton Hospital4.2Edgerton, WI 53534 30
## 11 The Edgewater3.8Madison, WI 53703 (Capitol area) 30
## 12 Indulge SpaMadison, WI 53704 30
## 13 Haven SpaMadison, WI 53719 30
## 14 JCPenney3.7Madison, WI 53704 30
## 15 Massage Envy3.2Middleton, WI 53562+1 location 6
## 16 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719 6
## 17 Indo-Pak Massage TherapyMadison, WI•Remote work available 5
## 18 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI 28
## 19 Isthmus WellnessMadison, WI 53717 (Junction Ridge area) 30
## 20 Studio 262 SalonMiddleton, WI 53562 21
## 21 Edgerton Hospital4.2Edgerton, WI 53534 30
## 22 Wellness Clinic4.0Madison, WI+1 location 11
## 23 Elements3.6Middleton, WI 53562+1 location 30
## 24 Kneaded Relief Day SpaFitchburg, WI 53711 30
## 25 The Edgewater3.8Madison, WI 53703 (Capitol area) 30
## 26 Indulge SpaMadison, WI 53704 30
## 27 Haven SpaMadison, WI 53719 30
## 28 JCPenney3.7Madison, WI 53704 30
## 29 Massage Envy3.2Middleton, WI 53562+1 location 6
## 30 Massage Envy3.2Madison, WI 53704 30
## 31 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719 6
## 32 Indo-Pak Massage TherapyMadison, WI•Remote work available 5
## 33 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI 28
## 34 Isthmus WellnessMadison, WI 53717 (Junction Ridge area) 30
## 35 Studio 262 SalonMiddleton, WI 53562 21
## 36 Elements3.6Middleton, WI 53562+1 location 30
## 37 Edgerton Hospital4.2Edgerton, WI 53534 30
## 38 Wellness Clinic4.0Madison, WI+1 location 11
## 39 Kneaded Relief Day SpaFitchburg, WI 53711 30
## 40 The Edgewater3.8Madison, WI 53703 (Capitol area) 30
## 41 Indulge SpaMadison, WI 53704 30
## 42 Haven SpaMadison, WI 53719 30
## 43 JCPenney3.7Madison, WI 53704 30
## 44 Massage Envy3.2Middleton, WI 53562+1 location 6
## 45 Massage Envy3.2Madison, WI 53704 30
## 46 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719 6
## 47 Indo-Pak Massage TherapyMadison, WI•Remote work available 5
## 48 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI 28
## 49 Isthmus WellnessMadison, WI 53717 (Junction Ridge area) 30
## 50 Studio 262 SalonMiddleton, WI 53562 21
## 51 Edgerton Hospital4.2Edgerton, WI 53534 30
## 52 Wellness Clinic4.0Madison, WI+1 location 11
## 53 Elements3.6Middleton, WI 53562+1 location 30
## 54 Kneaded Relief Day SpaFitchburg, WI 53711 30
## 55 The Edgewater3.8Madison, WI 53703 (Capitol area) 30
## 56 Indulge SpaMadison, WI 53704 30
## 57 Haven SpaMadison, WI 53719 30
## 58 JCPenney3.7Madison, WI 53704 30
## 59 Massage Envy3.2Middleton, WI 53562+1 location 6
## 60 Massage Envy3.2Madison, WI 53704 30
## 61 Hand & Stone Massage and Facial Spa3.0Madison, WI 53719 6
## 62 Indo-Pak Massage TherapyMadison, WI•Remote work available 5
## 63 BERGAMOT MASSAGE THERAPY AND BODYWORKMadison, WI 28
## 64 Isthmus WellnessMadison, WI 53717 (Junction Ridge area) 30
## 65 Studio 262 SalonMiddleton, WI 53562 21
## 66 Wellness Clinic4.0Madison, WI+1 location 11
## 67 Kneaded Relief Day SpaFitchburg, WI 53711 30
## 68 Elements3.6Middleton, WI 53562+1 location 30
## 69 Edgerton Hospital4.2Edgerton, WI 53534 30
## 70 The Edgewater3.8Madison, WI 53703 (Capitol area) 30
## 71 Indulge SpaMadison, WI 53704 30
## 72 Haven SpaMadison, WI 53719 30
## 73 JCPenney3.7Madison, WI 53704 30
## 74 Massage Envy3.2Middleton, WI 53562+1 location 6
## 75 Massage Envy3.2Madison, WI 53704 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 8.5 56.25 20000 60000
## 2 8.5 56.25 20000 60000
## 3 8.5 56.25 20000 60000
## 4 8.5 56.25 20000 60000
## 5 8.5 56.25 20000 60000
## 6 8.5 56.25 20000 60000
## 7 8.5 56.25 20000 60000
## 8 8.5 56.25 20000 60000
## 9 8.5 56.25 20000 60000
## 10 8.5 56.25 20000 60000
## 11 8.5 56.25 20000 60000
## 12 8.5 56.25 20000 60000
## 13 8.5 56.25 20000 60000
## 14 8.5 56.25 20000 60000
## 15 8.5 56.25 20000 60000
## 16 8.5 56.25 20000 60000
## 17 8.5 56.25 20000 60000
## 18 8.5 56.25 20000 60000
## 19 8.5 56.25 20000 60000
## 20 8.5 56.25 20000 60000
## 21 8.5 56.25 20000 60000
## 22 8.5 56.25 20000 60000
## 23 8.5 56.25 20000 60000
## 24 8.5 56.25 20000 60000
## 25 8.5 56.25 20000 60000
## 26 8.5 56.25 20000 60000
## 27 8.5 56.25 20000 60000
## 28 8.5 56.25 20000 60000
## 29 8.5 56.25 20000 60000
## 30 8.5 56.25 20000 60000
## 31 8.5 56.25 20000 60000
## 32 8.5 56.25 20000 60000
## 33 8.5 56.25 20000 60000
## 34 8.5 56.25 20000 60000
## 35 8.5 56.25 20000 60000
## 36 8.5 56.25 20000 60000
## 37 8.5 56.25 20000 60000
## 38 8.5 56.25 20000 60000
## 39 8.5 56.25 20000 60000
## 40 8.5 56.25 20000 60000
## 41 8.5 56.25 20000 60000
## 42 8.5 56.25 20000 60000
## 43 8.5 56.25 20000 60000
## 44 8.5 56.25 20000 60000
## 45 8.5 56.25 20000 60000
## 46 8.5 56.25 20000 60000
## 47 8.5 56.25 20000 60000
## 48 8.5 56.25 20000 60000
## 49 8.5 56.25 20000 60000
## 50 8.5 56.25 20000 60000
## 51 8.5 56.25 20000 60000
## 52 8.5 56.25 20000 60000
## 53 8.5 56.25 20000 60000
## 54 8.5 56.25 20000 60000
## 55 8.5 56.25 20000 60000
## 56 8.5 56.25 20000 60000
## 57 8.5 56.25 20000 60000
## 58 8.5 56.25 20000 60000
## 59 8.5 56.25 20000 60000
## 60 8.5 56.25 20000 60000
## 61 8.5 56.25 20000 60000
## 62 8.5 56.25 20000 60000
## 63 8.5 56.25 20000 60000
## 64 8.5 56.25 20000 60000
## 65 8.5 56.25 20000 60000
## 66 8.5 56.25 20000 60000
## 67 8.5 56.25 20000 60000
## 68 8.5 56.25 20000 60000
## 69 8.5 56.25 20000 60000
## 70 8.5 56.25 20000 60000
## 71 8.5 56.25 20000 60000
## 72 8.5 56.25 20000 60000
## 73 8.5 56.25 20000 60000
## 74 8.5 56.25 20000 60000
## 75 8.5 56.25 20000 60000
getIndeedJobData5pages('massage therapist', 'Green Bay','WI')
## [[1]]
## jobTitle
## 1 Licensed Massage Therapist (LMT)
## 2 Massage Therapist
## 3 Licensed Massage Therapist or Aesthetician Space Available
## 4 Massage Therapist
## 5 Licensed Massage Therapist (LMT)
## 6 Massage Therapist
## 7 Licensed Massage Therapist or Aesthetician Space Available
## 8 Massage Therapist
## 9 Licensed Massage Therapist (LMT)
## 10 Massage Therapist
## 11 Licensed Massage Therapist or Aesthetician Space Available
## 12 Massage Therapist
## 13 Licensed Massage Therapist (LMT)
## 14 Massage Therapist
## 15 Licensed Massage Therapist or Aesthetician Space Available
## 16 Massage Therapist
## 17 Licensed Massage Therapist (LMT)
## 18 Massage Therapist
## 19 Licensed Massage Therapist or Aesthetician Space Available
## 20 Massage Therapist
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 27
## 2 7
## 3 19
## 4 30
## 5 27
## 6 7
## 7 19
## 8 30
## 9 27
## 10 7
## 11 19
## 12 30
## 13 27
## 14 7
## 15 19
## 16 30
## 17 27
## 18 7
## 19 19
## 20 30
##
## [[4]]
## HiringAgency
## 1 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311
## 2 Elite AestheticsGreen Bay, WI 54311
## 3 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313
## 4 Massage Envy3.2Green Bay, WI 54304
## 5 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311
## 6 Elite AestheticsGreen Bay, WI 54311
## 7 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313
## 8 Massage Envy3.2Green Bay, WI 54304
## 9 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311
## 10 Elite AestheticsGreen Bay, WI 54311
## 11 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313
## 12 Massage Envy3.2Green Bay, WI 54304
## 13 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311
## 14 Elite AestheticsGreen Bay, WI 54311
## 15 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313
## 16 Massage Envy3.2Green Bay, WI 54304
## 17 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311
## 18 Elite AestheticsGreen Bay, WI 54311
## 19 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313
## 20 Massage Envy3.2Green Bay, WI 54304
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle
## 1 Green Bay WI Licensed Massage Therapist (LMT)
## 2 Green Bay WI Massage Therapist
## 3 Green Bay WI Licensed Massage Therapist or Aesthetician Space Available
## 4 Green Bay WI Massage Therapist
## 5 Green Bay WI Licensed Massage Therapist (LMT)
## 6 Green Bay WI Massage Therapist
## 7 Green Bay WI Licensed Massage Therapist or Aesthetician Space Available
## 8 Green Bay WI Massage Therapist
## 9 Green Bay WI Licensed Massage Therapist (LMT)
## 10 Green Bay WI Massage Therapist
## 11 Green Bay WI Licensed Massage Therapist or Aesthetician Space Available
## 12 Green Bay WI Massage Therapist
## 13 Green Bay WI Licensed Massage Therapist (LMT)
## 14 Green Bay WI Massage Therapist
## 15 Green Bay WI Licensed Massage Therapist or Aesthetician Space Available
## 16 Green Bay WI Massage Therapist
## 17 Green Bay WI Licensed Massage Therapist (LMT)
## 18 Green Bay WI Massage Therapist
## 19 Green Bay WI Licensed Massage Therapist or Aesthetician Space Available
## 20 Green Bay WI Massage Therapist
## HiringAgency date_daysAgo
## 1 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311 27
## 2 Elite AestheticsGreen Bay, WI 54311 7
## 3 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313 19
## 4 Massage Envy3.2Green Bay, WI 54304 30
## 5 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311 27
## 6 Elite AestheticsGreen Bay, WI 54311 7
## 7 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313 19
## 8 Massage Envy3.2Green Bay, WI 54304 30
## 9 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311 27
## 10 Elite AestheticsGreen Bay, WI 54311 7
## 11 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313 19
## 12 Massage Envy3.2Green Bay, WI 54304 30
## 13 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311 27
## 14 Elite AestheticsGreen Bay, WI 54311 7
## 15 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313 19
## 16 Massage Envy3.2Green Bay, WI 54304 30
## 17 Lifestyle Chiropractic & WellnessGreen Bay, WI 54311 27
## 18 Elite AestheticsGreen Bay, WI 54311 7
## 19 BodyWorks & Laser Clinic, LLCGreen Bay, WI 54313 19
## 20 Massage Envy3.2Green Bay, WI 54304 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 NA NA NA NA
## 2 NA NA NA NA
## 3 NA NA NA NA
## 4 NA NA NA NA
## 5 NA NA NA NA
## 6 NA NA NA NA
## 7 NA NA NA NA
## 8 NA NA NA NA
## 9 NA NA NA NA
## 10 NA NA NA NA
## 11 NA NA NA NA
## 12 NA NA NA NA
## 13 NA NA NA NA
## 14 NA NA NA NA
## 15 NA NA NA NA
## 16 NA NA NA NA
## 17 NA NA NA NA
## 18 NA NA NA NA
## 19 NA NA NA NA
## 20 NA NA NA NA
Wyoming Cheyenne, Casper, laramie
getIndeedJobData5pages('massage therapist','Cheyenne','WY')
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist - Independent Contractor
## 3 Licensed Massage Therapist
## 4 Mobile Massage Therapist
## 5 Massage Therapist - Independent Contractor
## 6 Licensed Massage Therapist
## 7 Mobile Massage Therapist
## 8 Massage Therapist
## 9 Massage Therapist - Independent Contractor
## 10 Licensed Massage Therapist
## 11 Mobile Massage Therapist
## 12 Massage Therapist - Independent Contractor
## 13 Licensed Massage Therapist
## 14 Mobile Massage Therapist
## 15 Massage Therapist - Independent Contractor
## 16 Licensed Massage Therapist
## 17 Mobile Massage Therapist
##
## [[2]]
## Salary salary minSalary maxSalary
## 1 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 2 \n$20 - $30 an hour $20 - $30 20 30
## 3 \n$45 - $70 an hour $45 - $70 45 70
## 4 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 5 \n$20 - $30 an hour $20 - $30 20 30
## 6 \n$45 - $70 an hour $45 - $70 45 70
## 7 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 8 \n$20 - $30 an hour $20 - $30 20 30
## 9 \n$45 - $70 an hour $45 - $70 45 70
## 10 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 11 \n$20 - $30 an hour $20 - $30 20 30
## 12 \n$45 - $70 an hour $45 - $70 45 70
## 13 \n$5,000 - $12,000 a month $5000 - $12000 5000 12000
## 14 \n$20 - $30 an hour $20 - $30 20 30
## 15 \n$45 - $70 an hour $45 - $70 45 70
## medianMinSalary medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary
## 1 45 57.5 1688.333 2860.833 20
## 2 45 57.5 1688.333 2860.833 20
## 3 45 57.5 1688.333 2860.833 20
## 4 45 57.5 1688.333 2860.833 20
## 5 45 57.5 1688.333 2860.833 20
## 6 45 57.5 1688.333 2860.833 20
## 7 45 57.5 1688.333 2860.833 20
## 8 45 57.5 1688.333 2860.833 20
## 9 45 57.5 1688.333 2860.833 20
## 10 45 57.5 1688.333 2860.833 20
## 11 45 57.5 1688.333 2860.833 20
## 12 45 57.5 1688.333 2860.833 20
## 13 45 57.5 1688.333 2860.833 20
## 14 45 57.5 1688.333 2860.833 20
## 15 45 57.5 1688.333 2860.833 20
## maximumMaxSalary
## 1 12000
## 2 12000
## 3 12000
## 4 12000
## 5 12000
## 6 12000
## 7 12000
## 8 12000
## 9 12000
## 10 12000
## 11 12000
## 12 12000
## 13 12000
## 14 12000
## 15 12000
##
## [[3]]
## date_daysAgo
## 1 12
## 2 5
## 3 30
## 4 30
## 5 5
## 6 30
## 7 30
## 8 12
## 9 5
## 10 30
## 11 30
## 12 5
## 13 30
## 14 30
## 15 5
## 16 30
## 17 30
##
## [[4]]
## HiringAgency
## 1 I Got Your Back Massage TherapyWyoming
## 2 Indo-Pak Massage TherapyCheyenne, WY•Remote work available
## 3 Northview MedicalCheyenne, WY 82009
## 4 Indo-Pak Massage TherapyCheyenne, WY
## 5 Indo-Pak Massage TherapyCheyenne, WY•Remote work available
## 6 Northview MedicalCheyenne, WY 82009
## 7 Indo-Pak Massage TherapyCheyenne, WY
## 8 I Got Your Back Massage TherapyWyoming
## 9 Indo-Pak Massage TherapyCheyenne, WY•Remote work available
## 10 Northview MedicalCheyenne, WY 82009
## 11 Indo-Pak Massage TherapyCheyenne, WY
## 12 Indo-Pak Massage TherapyCheyenne, WY•Remote work available
## 13 Northview MedicalCheyenne, WY 82009
## 14 Indo-Pak Massage TherapyCheyenne, WY
## 15 Indo-Pak Massage TherapyCheyenne, WY•Remote work available
## 16 Northview MedicalCheyenne, WY 82009
## 17 Indo-Pak Massage TherapyCheyenne, WY
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## Salary salary minSalary maxSalary medianMinSalary
## 2 \n$20 - $30 an hour $20 - $30 20 30 32.5
## 3 \n$45 - $70 an hour $45 - $70 45 70 32.5
## 5 \n$20 - $30 an hour $20 - $30 20 30 32.5
## 6 \n$45 - $70 an hour $45 - $70 45 70 32.5
## 8 \n$20 - $30 an hour $20 - $30 20 30 32.5
## 9 \n$45 - $70 an hour $45 - $70 45 70 32.5
## 11 \n$20 - $30 an hour $20 - $30 20 30 32.5
## 12 \n$45 - $70 an hour $45 - $70 45 70 32.5
## 14 \n$20 - $30 an hour $20 - $30 20 30 32.5
## 15 \n$45 - $70 an hour $45 - $70 45 70 32.5
## medianMaxSalary avgMinSalary avgMaxSalary minimumMinSalary maximumMaxSalary
## 2 50 32.5 50 20 70
## 3 50 32.5 50 20 70
## 5 50 32.5 50 20 70
## 6 50 32.5 50 20 70
## 8 50 32.5 50 20 70
## 9 50 32.5 50 20 70
## 11 50 32.5 50 20 70
## 12 50 32.5 50 20 70
## 14 50 32.5 50 20 70
## 15 50 32.5 50 20 70
##
## [[7]]
## city state jobTitle
## 1 Cheyenne WY Massage Therapist
## 2 Cheyenne WY Massage Therapist - Independent Contractor
## 3 Cheyenne WY Licensed Massage Therapist
## 4 Cheyenne WY Mobile Massage Therapist
## 5 Cheyenne WY Massage Therapist - Independent Contractor
## 6 Cheyenne WY Licensed Massage Therapist
## 7 Cheyenne WY Mobile Massage Therapist
## 8 Cheyenne WY Massage Therapist
## 9 Cheyenne WY Massage Therapist - Independent Contractor
## 10 Cheyenne WY Licensed Massage Therapist
## 11 Cheyenne WY Mobile Massage Therapist
## 12 Cheyenne WY Massage Therapist - Independent Contractor
## 13 Cheyenne WY Licensed Massage Therapist
## 14 Cheyenne WY Mobile Massage Therapist
## 15 Cheyenne WY Massage Therapist - Independent Contractor
## 16 Cheyenne WY Licensed Massage Therapist
## 17 Cheyenne WY Mobile Massage Therapist
## HiringAgency date_daysAgo
## 1 I Got Your Back Massage TherapyWyoming 12
## 2 Indo-Pak Massage TherapyCheyenne, WY•Remote work available 5
## 3 Northview MedicalCheyenne, WY 82009 30
## 4 Indo-Pak Massage TherapyCheyenne, WY 30
## 5 Indo-Pak Massage TherapyCheyenne, WY•Remote work available 5
## 6 Northview MedicalCheyenne, WY 82009 30
## 7 Indo-Pak Massage TherapyCheyenne, WY 30
## 8 I Got Your Back Massage TherapyWyoming 12
## 9 Indo-Pak Massage TherapyCheyenne, WY•Remote work available 5
## 10 Northview MedicalCheyenne, WY 82009 30
## 11 Indo-Pak Massage TherapyCheyenne, WY 30
## 12 Indo-Pak Massage TherapyCheyenne, WY•Remote work available 5
## 13 Northview MedicalCheyenne, WY 82009 30
## 14 Indo-Pak Massage TherapyCheyenne, WY 30
## 15 Indo-Pak Massage TherapyCheyenne, WY•Remote work available 5
## 16 Northview MedicalCheyenne, WY 82009 30
## 17 Indo-Pak Massage TherapyCheyenne, WY 30
## MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 20 70 NA NA
## 2 20 70 NA NA
## 3 20 70 NA NA
## 4 20 70 NA NA
## 5 20 70 NA NA
## 6 20 70 NA NA
## 7 20 70 NA NA
## 8 20 70 NA NA
## 9 20 70 NA NA
## 10 20 70 NA NA
## 11 20 70 NA NA
## 12 20 70 NA NA
## 13 20 70 NA NA
## 14 20 70 NA NA
## 15 20 70 NA NA
## 16 20 70 NA NA
## 17 20 70 NA NA
getIndeedJobData5pages('massage therapist','Casper','WY')
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 12
## 2 12
## 3 12
## 4 12
## 5 12
##
## [[4]]
## HiringAgency
## 1 I Got Your Back Massage TherapyWyoming
## 2 I Got Your Back Massage TherapyWyoming
## 3 I Got Your Back Massage TherapyWyoming
## 4 I Got Your Back Massage TherapyWyoming
## 5 I Got Your Back Massage TherapyWyoming
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle HiringAgency
## 1 Casper WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 2 Casper WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 3 Casper WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 4 Casper WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 5 Casper WY Massage Therapist I Got Your Back Massage TherapyWyoming
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 12 NA NA NA NA
## 2 12 NA NA NA NA
## 3 12 NA NA NA NA
## 4 12 NA NA NA NA
## 5 12 NA NA NA NA
getIndeedJobData5pages('massage therapist','Laramie','WY')
## [[1]]
## jobTitle
## 1 Massage Therapist
## 2 Massage Therapist
## 3 Massage Therapist
## 4 Massage Therapist
## 5 Massage Therapist
##
## [[2]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[3]]
## date_daysAgo
## 1 12
## 2 12
## 3 12
## 4 12
## 5 12
##
## [[4]]
## HiringAgency
## 1 I Got Your Back Massage TherapyWyoming
## 2 I Got Your Back Massage TherapyWyoming
## 3 I Got Your Back Massage TherapyWyoming
## 4 I Got Your Back Massage TherapyWyoming
## 5 I Got Your Back Massage TherapyWyoming
##
## [[5]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[6]]
## [1] Salary salary
## <0 rows> (or 0-length row.names)
##
## [[7]]
## city state jobTitle HiringAgency
## 1 Laramie WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 2 Laramie WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 3 Laramie WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 4 Laramie WY Massage Therapist I Got Your Back Massage TherapyWyoming
## 5 Laramie WY Massage Therapist I Got Your Back Massage TherapyWyoming
## date_daysAgo MinHourlySalary MaxHourlySalary MinAnnualSalary MaxAnnualSalary
## 1 12 NA NA NA NA
## 2 12 NA NA NA NA
## 3 12 NA NA NA NA
## 4 12 NA NA NA NA
## 5 12 NA NA NA NA